Safe Haskell | None |
---|---|
Language | Haskell98 |
- type (:::) a b = (a, b)
- (+:) :: a -> b -> (a, b)
- (*:) :: (Functor f, Functor g) => (a -> f a) -> (b -> g b) -> (a, b) -> Product f g (a, b)
- data HLeft
- data HRight
- data HId
- data HNo
- type family Contains a b where ...
- class Sub i sub sup where
- class (Functor sub, Functor sup) => sub :<: sup where
- class (Monad m, Functor f, Functor g) => PairingM f g m | f -> g where
- interpret :: PairingM f g m => (a -> b -> m r) -> Cofree f a -> FreeT g m b -> m r
- type LByteString = ByteString
- type ByteString = ByteString
- type LText = Text
- type Text = Text
- show :: (Show a, IsString b) => a -> b
- io :: MonadIO m => IO a -> m a
- (<++>) :: Doc -> Doc -> Doc
Free monad utilities
(*:) :: (Functor f, Functor g) => (a -> f a) -> (b -> g b) -> (a, b) -> Product f g (a, b) infixr 0 Source #
class (Functor sub, Functor sup) => sub :<: sup where Source #
A constraint f :<: g
expresses that f
is subsumed by g
,
i.e. f
can be used to construct elements in g
.
class (Monad m, Functor f, Functor g) => PairingM f g m | f -> g where Source #
Functors f
and g
are paired when they can annihilate each other
Monad m => PairingM Identity Identity m Source # | |
Monad m => PairingM (CoLoggerF m) LoggerF m Source # | |
Monad m => PairingM (CoHooksF m) HooksF m Source # | |
Monad m => PairingM (CoHttpClientF m) HttpClientF m Source # | |
Monad m => PairingM (CoXmlParserF m) XmlParserF m Source # | |
Monad m => PairingM (CoDatabaseF t m) (DatabaseF t) m Source # | |
(PairingM f f' m, PairingM g g' m) => PairingM (Sum * f g) (Product * f' g') m Source # | |
(PairingM f f' m, PairingM g g' m) => PairingM (Product * f g) (Sum * f' g') m Source # | |
Shortcuts
type LByteString = ByteString Source #
type ByteString = ByteString Source #