IxBindTrans IxStateT Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
IxMonadTrans IxStateT Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
(Monoid t, Monad f) => Category (IxStateT f t :: Type -> Type -> Type) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
(Semigroup t, Bind f) => Semigroupoid (IxStateT f t :: Type -> Type -> Type) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
MonadError r f => MonadError r (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
MonadReader r f => MonadReader r (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Monad f => MonadState s (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
MonadWriter r f => MonadWriter r (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Alt f => IxAlt (IxStateT f) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
(Alt f, Alternative f) => IxAlternative (IxStateT f) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Monad f => IxApplicative (IxStateT f) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Monad f => IxApply (IxStateT f) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Monad f => IxBind (IxStateT f) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Functor f => IxFunctor (IxStateT f) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Monad f => IxMonad (IxStateT f) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
MonadCont f => IxMonadCont (IxStateT f) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
MonadFix f => IxMonadFix (IxStateT f) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Monad f => IxMonadState (IxStateT f) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
(Monad f, Monoid t) => Arrow (IxStateT f t) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
(Monad f, Monoid t) => ArrowApply (IxStateT f t) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
(Monad f, Monoid t) => ArrowChoice (IxStateT f t) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
(Monoid t, Applicative f) => Choice (IxStateT f t) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Functor f => Strong (IxStateT f t) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Functor f => Profunctor (IxStateT f t) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
MonadFix f => MonadFix (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
MonadIO f => MonadIO (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
(Alternative f, Monad f) => Alternative (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Monad f => Applicative (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Functor f => Functor (IxStateT f t s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Monad f => Monad (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
MonadCont f => MonadCont (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Alt f => Alt (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Monad f => Apply (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Monad f => Bind (IxStateT f s s) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
(Applicative f, Apply f, Monoid a, Monoid t) => Monoid (IxStateT f t s a) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
(Apply f, Semigroup a, Semigroup t) => Semigroup (IxStateT f t s a) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
Wrapped (IxStateT f t s a) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
IxStateT f t s a ~ x => Rewrapped (IxStateT f' t' s' a') x Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |
type Unwrapped (IxStateT f t s a) Source # | |
Instance detailsDefined in Control.Monad.State.Profunctor.IxState |