transformers-lift-0.2.0.2: Ad-hoc type classes for lifting

Safe HaskellSafe
LanguageHaskell2010

Control.Monad.Trans.Lift.StT

Description

The StT type family.

Synopsis
  • type family StT (t :: (* -> *) -> * -> *) (a :: *) :: *

Documentation

type family StT (t :: (* -> *) -> * -> *) (a :: *) :: * Source #

Internal state of a monad transformer. Same as StT from the monad-control package.

Instances
type StT MaybeT a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT MaybeT a = Maybe a
type StT ListT a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT ListT a = [a]
type StT (WriterT w) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (WriterT w) a = (a, w)
type StT (AccumT w) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (AccumT w) a = (a, w)
type StT (WriterT w) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (WriterT w) a = (a, w)
type StT (StateT s) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (StateT s) a = (a, s)
type StT (StateT s) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (StateT s) a = (a, s)
type StT (IdentityT :: (Type -> Type) -> Type -> Type) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (IdentityT :: (Type -> Type) -> Type -> Type) a = a
type StT (ExceptT e) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (ExceptT e) a = Either e a
type StT (WriterT w) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (WriterT w) a = (a, w)
type StT (ReaderT r :: (Type -> Type) -> Type -> Type) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (ReaderT r :: (Type -> Type) -> Type -> Type) a = a
type StT (RWST r w s) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (RWST r w s) a = (a, s, w)
type StT (RWST r w s) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (RWST r w s) a = (a, s, w)
type StT (RWST r w s) a Source # 
Instance details

Defined in Control.Monad.Trans.Lift.StT

type StT (RWST r w s) a = (a, s, w)