hydrogen-prelude-0.7.1: Hydrogen Prelude

Safe HaskellNone
LanguageHaskell2010

Hydrogen.Prelude

Synopsis

Documentation

module Prelude

module Data.Array

module Data.Bits

module Data.Bool

module Data.Char

module Data.Fixed

module Data.Int

module Data.Ix

module Data.List

module Data.Maybe

module Data.Ord

module Data.Ratio

module Data.Time

module Data.Tuple

module Data.Word

module Numeric

(.&) :: (a -> Bool) -> (a -> Bool) -> a -> Bool Source

(.|) :: (a -> Bool) -> (a -> Bool) -> a -> Bool Source

(=~) :: (RegexMaker Regex CompOption ExecOption source, RegexContext Regex source1 target) => source1 -> source -> target

This is the pure functional matching operator. If the target cannot be produced then some empty result will be returned. If there is an error in processing, then error will be called.

(=~~) :: (RegexMaker Regex CompOption ExecOption source, RegexContext Regex source1 target, Monad m) => source1 -> source -> m target

This is the monadic matching operator. If a single match fails, then fail will be called.

for :: Functor f => f a -> (a -> b) -> f b Source

data UUID :: *

The UUID type. A Random instance is provided which produces version 4 UUIDs as specified in RFC 4122. The Storable and Binary instances are compatible with RFC 4122, storing the fields in network order as 16 bytes.

class Generic a

Representable types of kind *. This class is derivable in GHC with the DeriveGeneric flag on.

Minimal complete definition

from, to

data Map k a :: * -> * -> *

A Map from keys k to values a.

Instances

Functor (Map k) 
Foldable (Map k) 
Traversable (Map k) 
(Eq k, Eq a) => Eq (Map k a) 
(Data k, Data a, Ord k) => Data (Map k a) 
(Ord k, Ord v) => Ord (Map k v) 
(Ord k, Read k, Read e) => Read (Map k e) 
(Show k, Show a) => Show (Map k a) 
Ord k => Monoid (Map k v) 
(Ord k, Serialize k, Serialize e) => Serialize (Map k e) 
(NFData k, NFData a) => NFData (Map k a) 
Typeable (* -> * -> *) Map 

data Set a :: * -> *

A set of values a.

Instances

Foldable Set 
Eq a => Eq (Set a) 
(Data a, Ord a) => Data (Set a) 
Ord a => Ord (Set a) 
(Read a, Ord a) => Read (Set a) 
Show a => Show (Set a) 
Ord a => Monoid (Set a) 
(Ord a, Serialize a) => Serialize (Set a) 
NFData a => NFData (Set a) 
Typeable (* -> *) Set 

data ShowBox Source

Instances