classy-prelude-0.6.0.1: A typeclass-based Prelude.

Safe HaskellNone

ClassyPrelude.Classes

Documentation

class IsSequence a => IOData a whereSource

Methods

readFile :: MonadIO m => FilePath -> m aSource

writeFile :: MonadIO m => FilePath -> a -> m ()Source

getLine :: MonadIO m => m aSource

hGetContents :: MonadIO m => Handle -> m aSource

hGetLine :: MonadIO m => Handle -> m aSource

hPut :: MonadIO m => Handle -> a -> m ()Source

hPutStrLn :: MonadIO m => Handle -> a -> m ()Source

hGetChunk :: MonadIO m => Handle -> m aSource

class CanZip c1 c2 withRes t | c1 -> c2 withRes t, c2 -> c1 whereSource

Methods

zip :: c1 -> c2 -> t (Element c1, Element c2)Source

unzip :: t (Element c1, Element c2) -> (c1, c2)Source

zipWith :: (Element c1 -> Element c2 -> Element withRes) -> c1 -> c2 -> withResSource

class CanZip3 t a b c d | t -> a b c d whereSource

Methods

zip3 :: t a -> t b -> t c -> t (a, b, c)Source

unzip3 :: t (a, b, c) -> (t a, t b, t c)Source

zipWith3 :: (a -> b -> c -> d) -> t a -> t b -> t c -> t dSource

Instances

CanZip3 [] a b c d 
(Unbox a, Unbox b, Unbox c, Unbox d) => CanZip3 UVector a b c d 
CanZip3 Vector a b c d 
CanZip3 Seq a b c d 

class CanZip4 t a b c d e | t -> a b c d e whereSource

Methods

zip4 :: t a -> t b -> t c -> t d -> t (a, b, c, d)Source

unzip4 :: t (a, b, c, d) -> (t a, t b, t c, t d)Source

zipWith4 :: (a -> b -> c -> d -> e) -> t a -> t b -> t c -> t d -> t eSource

Instances

CanZip4 [] a b c d e 
(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e) => CanZip4 UVector a b c d e 
CanZip4 Vector a b c d e 
CanZip4 Seq a b c d e 

class CanZip5 t a b c d e f | t -> a b c d e f whereSource

Methods

zip5 :: t a -> t b -> t c -> t d -> t e -> t (a, b, c, d, e)Source

unzip5 :: t (a, b, c, d, e) -> (t a, t b, t c, t d, t e)Source

zipWith5 :: (a -> b -> c -> d -> e -> f) -> t a -> t b -> t c -> t d -> t e -> t fSource

Instances

CanZip5 [] a b c d e f 
(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e, Unbox f) => CanZip5 UVector a b c d e f 
CanZip5 Vector a b c d e f 

class CanZip6 t a b c d e f g | t -> a b c d e f g whereSource

Methods

zip6 :: t a -> t b -> t c -> t d -> t e -> t f -> t (a, b, c, d, e, f)Source

unzip6 :: t (a, b, c, d, e, f) -> (t a, t b, t c, t d, t e, t f)Source

zipWith6 :: (a -> b -> c -> d -> e -> f -> g) -> t a -> t b -> t c -> t d -> t e -> t f -> t gSource

Instances

CanZip6 [] a b c d e f g 
(Unbox a, Unbox b, Unbox c, Unbox d, Unbox e, Unbox f, Unbox g) => CanZip6 UVector a b c d e f g 
CanZip6 Vector a b c d e f g 

class CanZip7 t a b c d e f g h | t -> a b c d e f g h whereSource

Methods

zip7 :: t a -> t b -> t c -> t d -> t e -> t f -> t g -> t (a, b, c, d, e, f, g)Source

unzip7 :: t (a, b, c, d, e, f, g) -> (t a, t b, t c, t d, t e, t f, t g)Source

zipWith7 :: (a -> b -> c -> d -> e -> f -> g -> h) -> t a -> t b -> t c -> t d -> t e -> t f -> t g -> t hSource

Instances

CanZip7 [] a b c d e f g h