transformers-compat-0.7.2: A small compatibility shim for the transformers library
Copyright(C) 2012-16 Edward Kmett
LicenseBSD-style (see the file LICENSE)
MaintainerEdward Kmett <ekmett@gmail.com>
Stabilityprovisional
Portabilityportable
Safe HaskellTrustworthy
LanguageHaskell2010

Control.Monad.Trans.Instances

Description

Backports orphan instances which are not provided by other modules in transformers-compat.

Orphan instances

Generic1 (Reverse f :: k -> Type) Source # 
Instance details

Associated Types

type Rep1 (Reverse f) :: k -> Type #

Methods

from1 :: forall (a :: k0). Reverse f a -> Rep1 (Reverse f) a #

to1 :: forall (a :: k0). Rep1 (Reverse f) a -> Reverse f a #

Generic1 (Backwards f :: k -> Type) Source # 
Instance details

Associated Types

type Rep1 (Backwards f) :: k -> Type #

Methods

from1 :: forall (a :: k0). Backwards f a -> Rep1 (Backwards f) a #

to1 :: forall (a :: k0). Rep1 (Backwards f) a -> Backwards f a #

Generic1 (IdentityT f :: k -> Type) Source # 
Instance details

Associated Types

type Rep1 (IdentityT f) :: k -> Type #

Methods

from1 :: forall (a :: k0). IdentityT f a -> Rep1 (IdentityT f) a #

to1 :: forall (a :: k0). Rep1 (IdentityT f) a -> IdentityT f a #

Generic1 (Constant a :: k -> Type) Source # 
Instance details

Associated Types

type Rep1 (Constant a) :: k -> Type #

Methods

from1 :: forall (a0 :: k0). Constant a a0 -> Rep1 (Constant a) a0 #

to1 :: forall (a0 :: k0). Rep1 (Constant a) a0 -> Constant a a0 #

Generic1 (Lift f :: Type -> Type) Source # 
Instance details

Associated Types

type Rep1 (Lift f) :: k -> Type #

Methods

from1 :: forall (a :: k). Lift f a -> Rep1 (Lift f) a #

to1 :: forall (a :: k). Rep1 (Lift f) a -> Lift f a #

Functor m => Generic1 (MaybeT m :: Type -> Type) Source # 
Instance details

Associated Types

type Rep1 (MaybeT m) :: k -> Type #

Methods

from1 :: forall (a :: k). MaybeT m a -> Rep1 (MaybeT m) a #

to1 :: forall (a :: k). Rep1 (MaybeT m) a -> MaybeT m a #

Generic1 (ReaderT r m :: Type -> Type) Source # 
Instance details

Associated Types

type Rep1 (ReaderT r m) :: k -> Type #

Methods

from1 :: forall (a :: k). ReaderT r m a -> Rep1 (ReaderT r m) a #

to1 :: forall (a :: k). Rep1 (ReaderT r m) a -> ReaderT r m a #

Functor m => Generic1 (ExceptT e m :: Type -> Type) Source # 
Instance details

Associated Types

type Rep1 (ExceptT e m) :: k -> Type #

Methods

from1 :: forall (a :: k). ExceptT e m a -> Rep1 (ExceptT e m) a #

to1 :: forall (a :: k). Rep1 (ExceptT e m) a -> ExceptT e m a #

Generic (Lift f a) Source # 
Instance details

Associated Types

type Rep (Lift f a) :: Type -> Type #

Methods

from :: Lift f a -> Rep (Lift f a) x #

to :: Rep (Lift f a) x -> Lift f a #

Generic (MaybeT m a) Source # 
Instance details

Associated Types

type Rep (MaybeT m a) :: Type -> Type #

Methods

from :: MaybeT m a -> Rep (MaybeT m a) x #

to :: Rep (MaybeT m a) x -> MaybeT m a #

(Data a, Data b) => Data (Constant a b) Source # 
Instance details

Methods

gfoldl :: (forall d b0. Data d => c (d -> b0) -> d -> c b0) -> (forall g. g -> c g) -> Constant a b -> c (Constant a b) #

gunfold :: (forall b0 r. Data b0 => c (b0 -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Constant a b) #

toConstr :: Constant a b -> Constr #

dataTypeOf :: Constant a b -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Constant a b)) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Constant a b)) #

gmapT :: (forall b0. Data b0 => b0 -> b0) -> Constant a b -> Constant a b #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Constant a b -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Constant a b -> r #

gmapQ :: (forall d. Data d => d -> u) -> Constant a b -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Constant a b -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Constant a b -> m (Constant a b) #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Constant a b -> m (Constant a b) #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Constant a b -> m (Constant a b) #

Generic (Reverse f a) Source # 
Instance details

Associated Types

type Rep (Reverse f a) :: Type -> Type #

Methods

from :: Reverse f a -> Rep (Reverse f a) x #

to :: Rep (Reverse f a) x -> Reverse f a #

Generic (Constant a b) Source # 
Instance details

Associated Types

type Rep (Constant a b) :: Type -> Type #

Methods

from :: Constant a b -> Rep (Constant a b) x #

to :: Rep (Constant a b) x -> Constant a b #

Generic (WriterT w m a) Source # 
Instance details

Associated Types

type Rep (WriterT w m a) :: Type -> Type #

Methods

from :: WriterT w m a -> Rep (WriterT w m a) x #

to :: Rep (WriterT w m a) x -> WriterT w m a #

Generic (AccumT w m a) Source # 
Instance details

Associated Types

type Rep (AccumT w m a) :: Type -> Type #

Methods

from :: AccumT w m a -> Rep (AccumT w m a) x #

to :: Rep (AccumT w m a) x -> AccumT w m a #

Generic (WriterT w m a) Source # 
Instance details

Associated Types

type Rep (WriterT w m a) :: Type -> Type #

Methods

from :: WriterT w m a -> Rep (WriterT w m a) x #

to :: Rep (WriterT w m a) x -> WriterT w m a #

Generic (StateT s m a) Source # 
Instance details

Associated Types

type Rep (StateT s m a) :: Type -> Type #

Methods

from :: StateT s m a -> Rep (StateT s m a) x #

to :: Rep (StateT s m a) x -> StateT s m a #

Generic (StateT s m a) Source # 
Instance details

Associated Types

type Rep (StateT s m a) :: Type -> Type #

Methods

from :: StateT s m a -> Rep (StateT s m a) x #

to :: Rep (StateT s m a) x -> StateT s m a #

Generic (SelectT w m a) Source # 
Instance details

Associated Types

type Rep (SelectT w m a) :: Type -> Type #

Methods

from :: SelectT w m a -> Rep (SelectT w m a) x #

to :: Rep (SelectT w m a) x -> SelectT w m a #

Generic (ReaderT r m a) Source # 
Instance details

Associated Types

type Rep (ReaderT r m a) :: Type -> Type #

Methods

from :: ReaderT r m a -> Rep (ReaderT r m a) x #

to :: Rep (ReaderT r m a) x -> ReaderT r m a #

Generic (IdentityT f a) Source # 
Instance details

Associated Types

type Rep (IdentityT f a) :: Type -> Type #

Methods

from :: IdentityT f a -> Rep (IdentityT f a) x #

to :: Rep (IdentityT f a) x -> IdentityT f a #

Generic (ExceptT e m a) Source # 
Instance details

Associated Types

type Rep (ExceptT e m a) :: Type -> Type #

Methods

from :: ExceptT e m a -> Rep (ExceptT e m a) x #

to :: Rep (ExceptT e m a) x -> ExceptT e m a #

Generic (Backwards f a) Source # 
Instance details

Associated Types

type Rep (Backwards f a) :: Type -> Type #

Methods

from :: Backwards f a -> Rep (Backwards f a) x #

to :: Rep (Backwards f a) x -> Backwards f a #

Generic (ContT r m a) Source # 
Instance details

Associated Types

type Rep (ContT r m a) :: Type -> Type #

Methods

from :: ContT r m a -> Rep (ContT r m a) x #

to :: Rep (ContT r m a) x -> ContT r m a #

Generic (RWST r w s m a) Source # 
Instance details

Associated Types

type Rep (RWST r w s m a) :: Type -> Type #

Methods

from :: RWST r w s m a -> Rep (RWST r w s m a) x #

to :: Rep (RWST r w s m a) x -> RWST r w s m a #

Generic (RWST r w s m a) Source # 
Instance details

Associated Types

type Rep (RWST r w s m a) :: Type -> Type #

Methods

from :: RWST r w s m a -> Rep (RWST r w s m a) x #

to :: Rep (RWST r w s m a) x -> RWST r w s m a #