constraints-0.11: Constraint manipulation

Safe HaskellNone
LanguageHaskell2010

Data.Constraint.Lifting

Documentation

class Lifting p f where Source #

Methods

lifting :: p a :- p (f a) Source #

Instances
Lifting Eq [] Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq [a] Source #

Lifting Eq Maybe Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (Maybe a) Source #

Lifting Eq Ratio Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (Ratio a) Source #

Lifting Eq Complex Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (Complex a) Source #

Lifting Eq Identity Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (Identity a) Source #

Lifting Ord [] Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord [a] Source #

Lifting Ord Maybe Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (Maybe a) Source #

Lifting Ord Identity Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (Identity a) Source #

Lifting Read [] Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read [a] Source #

Lifting Read Maybe Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (Maybe a) Source #

Lifting Read Complex Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (Complex a) Source #

Lifting Read Identity Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (Identity a) Source #

Lifting Show [] Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show [a] Source #

Lifting Show Maybe Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (Maybe a) Source #

Lifting Show Complex Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (Complex a) Source #

Lifting Show Identity Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (Identity a) Source #

Lifting Semigroup Maybe Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Monoid Maybe Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monoid a :- Monoid (Maybe a) Source #

Lifting Binary [] Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Binary a :- Binary [a] Source #

Lifting Binary Maybe Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Binary a :- Binary (Maybe a) Source #

Lifting NFData [] Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: NFData a :- NFData [a] Source #

Lifting NFData Maybe Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: NFData a :- NFData (Maybe a) Source #

Lifting Hashable [] Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Hashable Maybe Source # 
Instance details

Defined in Data.Constraint.Lifting

Bounded a => Lifting Bounded ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Bounded a0 :- Bounded (a, a0) Source #

Eq a => Lifting Eq (Either a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a0 :- Eq (Either a a0) Source #

Eq a => Lifting Eq ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a0 :- Eq (a, a0) Source #

Eq1 m => Lifting Eq (ListT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (ListT m a) Source #

Eq1 f => Lifting Eq (Lift f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (Lift f a) Source #

Eq1 m => Lifting Eq (MaybeT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (MaybeT m a) Source #

Ord a => Lifting Ord (Either a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a0 :- Ord (Either a a0) Source #

Ord a => Lifting Ord ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a0 :- Ord (a, a0) Source #

Ord1 m => Lifting Ord (ListT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (ListT m a) Source #

Ord1 f => Lifting Ord (Lift f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (Lift f a) Source #

Ord1 m => Lifting Ord (MaybeT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (MaybeT m a) Source #

Read a => Lifting Read (Either a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a0 :- Read (Either a a0) Source #

Read a => Lifting Read ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a0 :- Read (a, a0) Source #

Read1 m => Lifting Read (ListT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (ListT m a) Source #

Read1 f => Lifting Read (Lift f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (Lift f a) Source #

Read1 m => Lifting Read (MaybeT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (MaybeT m a) Source #

Show a => Lifting Show (Either a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a0 :- Show (Either a a0) Source #

Show a => Lifting Show ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a0 :- Show (a, a0) Source #

Show1 m => Lifting Show (ListT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (ListT m a) Source #

Show1 f => Lifting Show (Lift f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (Lift f a) Source #

Show1 m => Lifting Show (MaybeT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (MaybeT m a) Source #

Ix a => Lifting Ix ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ix a0 :- Ix (a, a0) Source #

Semigroup a => Lifting Semigroup ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Semigroup a0 :- Semigroup (a, a0) Source #

Monoid a => Lifting Monoid ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monoid a0 :- Monoid (a, a0) Source #

Binary a => Lifting Binary (Either a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Binary a0 :- Binary (Either a a0) Source #

Binary a => Lifting Binary ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Binary a0 :- Binary (a, a0) Source #

NFData a => Lifting NFData (Either a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: NFData a0 :- NFData (Either a a0) Source #

NFData a => Lifting NFData ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: NFData a0 :- NFData (a, a0) Source #

Hashable a => Lifting Hashable (Either a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Hashable a0 :- Hashable (Either a a0) Source #

Hashable a => Lifting Hashable ((,) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Hashable a0 :- Hashable (a, a0) Source #

Eq1 m => Lifting Eq (IdentityT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (IdentityT m a) Source #

(Eq e, Eq1 m) => Lifting Eq (ErrorT e m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (ErrorT e m a) Source #

(Eq e, Eq1 m) => Lifting Eq (ExceptT e m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (ExceptT e m a) Source #

(Eq w, Eq1 m) => Lifting Eq (WriterT w m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (WriterT w m a) Source #

(Eq w, Eq1 m) => Lifting Eq (WriterT w m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (WriterT w m a) Source #

Eq1 f => Lifting Eq (Reverse f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (Reverse f a) Source #

Eq1 f => Lifting Eq (Backwards f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (Backwards f a) Source #

Ord1 m => Lifting Ord (IdentityT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (IdentityT m a) Source #

(Ord e, Ord1 m) => Lifting Ord (ErrorT e m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (ErrorT e m a) Source #

(Ord e, Ord1 m) => Lifting Ord (ExceptT e m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (ExceptT e m a) Source #

(Ord w, Ord1 m) => Lifting Ord (WriterT w m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (WriterT w m a) Source #

(Ord w, Ord1 m) => Lifting Ord (WriterT w m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (WriterT w m a) Source #

Ord1 f => Lifting Ord (Reverse f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (Reverse f a) Source #

Ord1 f => Lifting Ord (Backwards f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (Backwards f a) Source #

Read1 m => Lifting Read (IdentityT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (IdentityT m a) Source #

(Read e, Read1 m) => Lifting Read (ErrorT e m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (ErrorT e m a) Source #

(Read e, Read1 m) => Lifting Read (ExceptT e m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (ExceptT e m a) Source #

(Read w, Read1 m) => Lifting Read (WriterT w m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (WriterT w m a) Source #

(Read w, Read1 m) => Lifting Read (WriterT w m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (WriterT w m a) Source #

Read1 f => Lifting Read (Reverse f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (Reverse f a) Source #

Read1 f => Lifting Read (Backwards f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (Backwards f a) Source #

Show1 m => Lifting Show (IdentityT m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (IdentityT m a) Source #

(Show e, Show1 m) => Lifting Show (ErrorT e m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (ErrorT e m a) Source #

(Show e, Show1 m) => Lifting Show (ExceptT e m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (ExceptT e m a) Source #

(Show w, Show1 m) => Lifting Show (WriterT w m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (WriterT w m a) Source #

(Show w, Show1 m) => Lifting Show (WriterT w m :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (WriterT w m a) Source #

Show1 f => Lifting Show (Reverse f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (Reverse f a) Source #

Show1 f => Lifting Show (Backwards f :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (Backwards f a) Source #

(Eq1 f, Eq1 g) => Lifting Eq (Product f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (Product f g a) Source #

(Eq1 f, Eq1 g) => Lifting Eq (Sum f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (Sum f g a) Source #

(Ord1 f, Ord1 g) => Lifting Ord (Product f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (Product f g a) Source #

(Ord1 f, Ord1 g) => Lifting Ord (Sum f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (Sum f g a) Source #

(Read1 f, Read1 g) => Lifting Read (Product f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (Product f g a) Source #

(Read1 f, Read1 g) => Lifting Read (Sum f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (Sum f g a) Source #

(Show1 f, Show1 g) => Lifting Show (Product f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (Product f g a) Source #

(Show1 f, Show1 g) => Lifting Show (Sum f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (Sum f g a) Source #

Lifting Semigroup ((->) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Semigroup a0 :- Semigroup (a -> a0) Source #

Lifting Monoid ((->) a :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monoid a0 :- Monoid (a -> a0) Source #

(Eq1 f, Eq1 g) => Lifting Eq (Compose f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq a :- Eq (Compose f g a) Source #

(Ord1 f, Ord1 g) => Lifting Ord (Compose f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord a :- Ord (Compose f g a) Source #

(Read1 f, Read1 g) => Lifting Read (Compose f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read a :- Read (Compose f g a) Source #

(Show1 f, Show1 g) => Lifting Show (Compose f g :: Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show a :- Show (Compose f g a) Source #

Lifting Monad ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (ListT a) Source #

Lifting Monad MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (MaybeT a) Source #

Lifting Functor ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Functor Lift Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Functor MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Applicative ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Applicative Lift Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Foldable ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Foldable Lift Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Foldable MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Traversable ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Traversable Lift Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Traversable MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Eq1 ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (ListT a) Source #

Lifting Eq1 Lift Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (Lift a) Source #

Lifting Eq1 MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (MaybeT a) Source #

Lifting Ord1 ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (ListT a) Source #

Lifting Ord1 Lift Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (Lift a) Source #

Lifting Ord1 MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (MaybeT a) Source #

Lifting Read1 ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (ListT a) Source #

Lifting Read1 Lift Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (Lift a) Source #

Lifting Read1 MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (MaybeT a) Source #

Lifting Show1 ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (ListT a) Source #

Lifting Show1 Lift Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (Lift a) Source #

Lifting Show1 MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (MaybeT a) Source #

Lifting MonadIO ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadIO MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Alternative ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Alternative Lift Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadPlus ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadPlus MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadCont ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadCont MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Monad (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Error e => Lifting Monad (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (ErrorT e a) Source #

Lifting Monad (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (ExceptT e a) Source #

Lifting Monad (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (StateT s a) Source #

Lifting Monad (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (StateT s a) Source #

Monoid w => Lifting Monad (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (WriterT w a) Source #

Monoid w => Lifting Monad (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (WriterT w a) Source #

Lifting Functor (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Functor (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Functor a :- Functor (ErrorT e a) Source #

Lifting Functor (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Functor (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Functor a :- Functor (StateT s a) Source #

Lifting Functor (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Functor a :- Functor (StateT s a) Source #

Lifting Functor (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Functor (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Functor (Reverse :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Functor (Backwards :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadFix (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Error e => Lifting MonadFix (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadFix (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadFix (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadFix (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting MonadFix (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting MonadFix (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Applicative (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting Applicative (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting Applicative (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Applicative (Reverse :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Applicative (Backwards :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Foldable (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Foldable (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Foldable (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Foldable (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Foldable (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Foldable (Reverse :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Foldable (Backwards :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Traversable (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Traversable (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Traversable (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Traversable (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Traversable (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Traversable (Reverse :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Traversable (Backwards :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Eq1 (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (IdentityT a) Source #

Eq e => Lifting Eq1 (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (ErrorT e a) Source #

Eq e => Lifting Eq1 (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (ExceptT e a) Source #

Eq w => Lifting Eq1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (WriterT w a) Source #

Eq w => Lifting Eq1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (WriterT w a) Source #

Lifting Eq1 (Reverse :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (Reverse a) Source #

Lifting Eq1 (Backwards :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (Backwards a) Source #

Lifting Ord1 (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (IdentityT a) Source #

Ord e => Lifting Ord1 (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (ErrorT e a) Source #

Ord e => Lifting Ord1 (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (ExceptT e a) Source #

Ord w => Lifting Ord1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (WriterT w a) Source #

Ord w => Lifting Ord1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (WriterT w a) Source #

Lifting Ord1 (Reverse :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (Reverse a) Source #

Lifting Ord1 (Backwards :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (Backwards a) Source #

Lifting Read1 (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Read e => Lifting Read1 (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (ErrorT e a) Source #

Read e => Lifting Read1 (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (ExceptT e a) Source #

Read w => Lifting Read1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (WriterT w a) Source #

Read w => Lifting Read1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (WriterT w a) Source #

Lifting Read1 (Reverse :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (Reverse a) Source #

Lifting Read1 (Backwards :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Show1 (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Show e => Lifting Show1 (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (ErrorT e a) Source #

Show e => Lifting Show1 (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (ExceptT e a) Source #

Show w => Lifting Show1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (WriterT w a) Source #

Show w => Lifting Show1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (WriterT w a) Source #

Lifting Show1 (Reverse :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (Reverse a) Source #

Lifting Show1 (Backwards :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadIO (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Error e => Lifting MonadIO (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadIO a :- MonadIO (ErrorT e a) Source #

Lifting MonadIO (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadIO (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadIO a :- MonadIO (StateT s a) Source #

Lifting MonadIO (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadIO a :- MonadIO (StateT s a) Source #

Monoid w => Lifting MonadIO (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting MonadIO (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Alternative (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting Alternative (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting Alternative (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Alternative (Reverse :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Alternative (Backwards :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadPlus (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Error e => Lifting MonadPlus (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid e => Lifting MonadPlus (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadPlus (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadPlus (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting MonadPlus (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting MonadPlus (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadCont (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Error e => Lifting MonadCont (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadCont (ExceptT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadCont (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadCont (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting MonadCont (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting MonadCont (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monad f => Lifting Monad (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (Product f a) Source #

Lifting Monad (ContT r :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (ContT r a) Source #

Lifting Monad (ReaderT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (ReaderT e a) Source #

Functor f => Lifting Functor (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Functor f => Lifting Functor (Sum f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Functor a :- Functor (Sum f a) Source #

Lifting Functor (ContT r :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Functor a :- Functor (ContT r a) Source #

Lifting Functor (ReaderT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

MonadFix f => Lifting MonadFix (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadFix (ReaderT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Applicative f => Lifting Applicative (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Applicative (ContT r :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Applicative (ReaderT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Foldable f => Lifting Foldable (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Foldable f => Lifting Foldable (Sum f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Foldable a :- Foldable (Sum f a) Source #

Traversable f => Lifting Traversable (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Traversable f => Lifting Traversable (Sum f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Eq1 f => Lifting Eq1 (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (Product f a) Source #

Eq1 f => Lifting Eq1 (Sum f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (Sum f a) Source #

Ord1 f => Lifting Ord1 (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (Product f a) Source #

Ord1 f => Lifting Ord1 (Sum f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (Sum f a) Source #

Read1 f => Lifting Read1 (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (Product f a) Source #

Read1 f => Lifting Read1 (Sum f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (Sum f a) Source #

Show1 f => Lifting Show1 (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (Product f a) Source #

Show1 f => Lifting Show1 (Sum f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (Sum f a) Source #

Lifting MonadIO (ContT r :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadIO a :- MonadIO (ContT r a) Source #

Lifting MonadIO (ReaderT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Alternative f => Lifting Alternative (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Alternative (ReaderT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

MonadPlus f => Lifting MonadPlus (Product f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadPlus (ReaderT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting MonadCont (ReaderT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting Monad (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (RWST r w s a) Source #

Monoid w => Lifting Monad (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Monad a :- Monad (RWST r w s a) Source #

Functor f => Lifting Functor (Compose f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting Functor (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Functor a :- Functor (RWST r w s a) Source #

Lifting Functor (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Functor a :- Functor (RWST r w s a) Source #

Monoid w => Lifting MonadFix (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadFix a :- MonadFix (RWST r w s a) Source #

Monoid w => Lifting MonadFix (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadFix a :- MonadFix (RWST r w s a) Source #

Applicative f => Lifting Applicative (Compose f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Foldable f => Lifting Foldable (Compose f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Traversable f => Lifting Traversable (Compose f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Eq1 f => Lifting Eq1 (Compose f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Eq1 a :- Eq1 (Compose f a) Source #

Ord1 f => Lifting Ord1 (Compose f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Ord1 a :- Ord1 (Compose f a) Source #

Read1 f => Lifting Read1 (Compose f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Read1 a :- Read1 (Compose f a) Source #

Show1 f => Lifting Show1 (Compose f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: Show1 a :- Show1 (Compose f a) Source #

Monoid w => Lifting MonadIO (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadIO a :- MonadIO (RWST r w s a) Source #

Monoid w => Lifting MonadIO (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadIO a :- MonadIO (RWST r w s a) Source #

Alternative f => Lifting Alternative (Compose f :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting MonadPlus (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadPlus a :- MonadPlus (RWST r w s a) Source #

Monoid w => Lifting MonadPlus (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadPlus a :- MonadPlus (RWST r w s a) Source #

Monoid w => Lifting MonadCont (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadCont a :- MonadCont (RWST r w s a) Source #

Monoid w => Lifting MonadCont (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadCont a :- MonadCont (RWST r w s a) Source #

Lifting (MonadState s :: (Type -> Type) -> Constraint) ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadState s :: (Type -> Type) -> Constraint) MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadReader r :: (Type -> Type) -> Constraint) ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadReader r :: (Type -> Type) -> Constraint) MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadError e :: (Type -> Type) -> Constraint) ListT Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadError e :: (Type -> Type) -> Constraint) MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Error e => Lifting (MonadState s :: (Type -> Type) -> Constraint) (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadState s a :- MonadState s (ErrorT e a) Source #

Lifting (MonadState s :: (Type -> Type) -> Constraint) (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting (MonadState s :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting (MonadState s :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadState s :: (Type -> Type) -> Constraint) (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Error e => Lifting (MonadReader r :: (Type -> Type) -> Constraint) (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadReader r :: (Type -> Type) -> Constraint) (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadReader r :: (Type -> Type) -> Constraint) (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadReader r :: (Type -> Type) -> Constraint) (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting (MonadReader r :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting (MonadReader r :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadReader r :: (Type -> Type) -> Constraint) (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadError e :: (Type -> Type) -> Constraint) (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadError e a :- MonadError e (StateT s a) Source #

Lifting (MonadError e :: (Type -> Type) -> Constraint) (StateT s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadError e a :- MonadError e (StateT s a) Source #

Monoid w => Lifting (MonadError e :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting (MonadError e :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadError e :: (Type -> Type) -> Constraint) (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadState s :: (Type -> Type) -> Constraint) (ContT r' :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadState s a :- MonadState s (ContT r' a) Source #

Lifting (MonadState s :: (Type -> Type) -> Constraint) (ReaderT r :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting (MonadReader r :: (Type -> Type) -> Constraint) (ContT r' :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadReader r a :- MonadReader r (ContT r' a) Source #

Lifting (MonadError e :: (Type -> Type) -> Constraint) (ReaderT r :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Monoid w => Lifting (MonadError e :: (Type -> Type) -> Constraint) (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadError e a :- MonadError e (RWST r w s a) Source #

Monoid w => Lifting (MonadError e :: (Type -> Type) -> Constraint) (RWST r w s :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadError e a :- MonadError e (RWST r w s a) Source #

Lifting (MonadRWS r w s :: (Type -> Type) -> Constraint) MaybeT Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadRWS r w s a :- MonadRWS r w s (MaybeT a) Source #

Lifting (MonadRWS r w s :: (Type -> Type) -> Constraint) (ExceptT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadRWS r w s a :- MonadRWS r w s (ExceptT e a) Source #

Error e => Lifting (MonadRWS r w s :: (Type -> Type) -> Constraint) (ErrorT e :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadRWS r w s a :- MonadRWS r w s (ErrorT e a) Source #

Lifting (MonadRWS r w s :: (Type -> Type) -> Constraint) (IdentityT :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting :: MonadRWS r w s a :- MonadRWS r w s (IdentityT a) Source #

class Lifting2 p f where Source #

Methods

lifting2 :: p a :- Lifting p (f a) Source #

Instances
Lifting2 Bounded (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Eq Either Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting2 :: Eq a :- Lifting Eq (Either a) Source #

Lifting2 Eq (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting2 :: Eq a :- Lifting Eq ((,) a) Source #

Lifting2 Ord Either Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Ord (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting2 :: Ord a :- Lifting Ord ((,) a) Source #

Lifting2 Read Either Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Read (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Show Either Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Show (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Ix (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting2 :: Ix a :- Lifting Ix ((,) a) Source #

Lifting2 Semigroup (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Monoid (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Binary Either Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Binary (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 NFData Either Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 NFData (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Hashable Either Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Hashable (,) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Monad (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Functor (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Functor (Sum :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 MonadFix (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Applicative (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Foldable (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Foldable (Sum :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Traversable (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Traversable (Sum :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Eq1 (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Eq1 (Sum :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Methods

lifting2 :: Eq1 a :- Lifting Eq1 (Sum a) Source #

Lifting2 Ord1 (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Ord1 (Sum :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Read1 (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Read1 (Sum :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Show1 (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Show1 (Sum :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Alternative (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 MonadPlus (Product :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Functor (Compose :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Applicative (Compose :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Foldable (Compose :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Traversable (Compose :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting

Lifting2 Alternative (Compose :: (Type -> Type) -> (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Data.Constraint.Lifting