Safe Haskell | None |
---|---|
Language | Haskell2010 |
Control.Monad.Stack.Cont
Documentation
class Monad m => ContStack (m :: Type -> Type) where Source #
Instances
ContStack m => ContStack (MaybeT m) Source # | |
(ContStack m, Monoid w) => ContStack (AccumT w m) Source # | |
ContStack m => ContStack (ExceptT e m) Source # | |
ContStack m => ContStack (IdentityT m) Source # | |
ContStack m => ContStack (ReaderT r m) Source # | |
ContStack m => ContStack (SelectT r m) Source # | |
ContStack m => ContStack (StateT s m) Source # | |
ContStack m => ContStack (StateT s m) Source # | |
(ContStack m, Monoid w) => ContStack (WriterT w m) Source # | |
(ContStack m, Monoid w) => ContStack (WriterT w m) Source # | |
(ContStack m, Monoid w) => ContStack (WriterT w m) Source # | |
Monad m => ContStack (ContT r m) Source # | |
(ContStack m, Monoid w) => ContStack (RWST r w s m) Source # | |
(ContStack m, Monoid w) => ContStack (RWST r w s m) Source # | |
(ContStack m, Monoid w) => ContStack (RWST r w s m) Source # | |
type ContConstraints (n :: Nat) (m :: Type -> Type) = (KnownNat n, StackConstraints n ContTag ContStack m) Source #
type MonadContDepth (n :: Nat) (m :: Type -> Type) = (ContConstraints n m, MonadCont (ContDepth n m)) Source #