Lifting Eq [] Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Eq Maybe Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Eq Ratio Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Eq Complex Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Eq Identity Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Ord [] Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Ord Maybe Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Ord Identity Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Read [] Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Read Maybe Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Read Complex Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Read Identity Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Show [] Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Show Maybe Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Show Complex Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Show Identity Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Semigroup Maybe Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Monoid Maybe Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Binary [] Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Binary Maybe Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting NFData [] Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting NFData Maybe Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Hashable [] Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Hashable Maybe Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Bounded a => Lifting Bounded ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq a => Lifting Eq (Either a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq a => Lifting Eq ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq1 m => Lifting Eq (ListT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq1 f => Lifting Eq (Lift f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq1 m => Lifting Eq (MaybeT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord a => Lifting Ord (Either a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord a => Lifting Ord ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord1 m => Lifting Ord (ListT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord1 f => Lifting Ord (Lift f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord1 m => Lifting Ord (MaybeT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read a => Lifting Read (Either a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read a => Lifting Read ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read1 m => Lifting Read (ListT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read1 f => Lifting Read (Lift f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read1 m => Lifting Read (MaybeT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show a => Lifting Show (Either a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show a => Lifting Show ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show1 m => Lifting Show (ListT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show1 f => Lifting Show (Lift f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show1 m => Lifting Show (MaybeT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ix a => Lifting Ix ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Semigroup a => Lifting Semigroup ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid a => Lifting Monoid ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Binary a => Lifting Binary (Either a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Binary a => Lifting Binary ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
NFData a => Lifting NFData (Either a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
NFData a => Lifting NFData ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Hashable a => Lifting Hashable (Either a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Hashable a => Lifting Hashable ((,) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq1 m => Lifting Eq (IdentityT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Eq e, Eq1 m) => Lifting Eq (ErrorT e m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Eq e, Eq1 m) => Lifting Eq (ExceptT e m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Eq w, Eq1 m) => Lifting Eq (WriterT w m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Eq w, Eq1 m) => Lifting Eq (WriterT w m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq1 f => Lifting Eq (Reverse f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq1 f => Lifting Eq (Backwards f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord1 m => Lifting Ord (IdentityT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Ord e, Ord1 m) => Lifting Ord (ErrorT e m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Ord e, Ord1 m) => Lifting Ord (ExceptT e m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Ord w, Ord1 m) => Lifting Ord (WriterT w m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Ord w, Ord1 m) => Lifting Ord (WriterT w m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord1 f => Lifting Ord (Reverse f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord1 f => Lifting Ord (Backwards f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read1 m => Lifting Read (IdentityT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Read e, Read1 m) => Lifting Read (ErrorT e m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Read e, Read1 m) => Lifting Read (ExceptT e m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Read w, Read1 m) => Lifting Read (WriterT w m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Read w, Read1 m) => Lifting Read (WriterT w m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read1 f => Lifting Read (Reverse f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read1 f => Lifting Read (Backwards f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show1 m => Lifting Show (IdentityT m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Show e, Show1 m) => Lifting Show (ErrorT e m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Show e, Show1 m) => Lifting Show (ExceptT e m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Show w, Show1 m) => Lifting Show (WriterT w m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Show w, Show1 m) => Lifting Show (WriterT w m :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show1 f => Lifting Show (Reverse f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show1 f => Lifting Show (Backwards f :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Eq1 f, Eq1 g) => Lifting Eq (Product f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Eq1 f, Eq1 g) => Lifting Eq (Sum f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Ord1 f, Ord1 g) => Lifting Ord (Product f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Ord1 f, Ord1 g) => Lifting Ord (Sum f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Read1 f, Read1 g) => Lifting Read (Product f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Read1 f, Read1 g) => Lifting Read (Sum f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Show1 f, Show1 g) => Lifting Show (Product f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Show1 f, Show1 g) => Lifting Show (Sum f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Semigroup ((->) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Monoid ((->) a :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Eq1 f, Eq1 g) => Lifting Eq (Compose f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Ord1 f, Ord1 g) => Lifting Ord (Compose f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Read1 f, Read1 g) => Lifting Read (Compose f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
(Show1 f, Show1 g) => Lifting Show (Compose f g :: Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Monad ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Monad MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor Lift Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Applicative ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Applicative Lift Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Foldable ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Foldable Lift Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Foldable MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Traversable ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Traversable Lift Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Traversable MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Eq1 ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Eq1 Lift Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Eq1 MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Ord1 ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Ord1 Lift Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Ord1 MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Read1 ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Read1 Lift Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Read1 MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Show1 ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Show1 Lift Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Show1 MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadIO ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadIO MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Alternative ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Alternative Lift Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadPlus ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadPlus MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadCont ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadCont MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Monad (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Error e => Lifting Monad (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Monad (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Monad (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Monad (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting Monad (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting Monad (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (Reverse :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (Backwards :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadFix (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Error e => Lifting MonadFix (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadFix (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadFix (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadFix (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadFix (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadFix (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Applicative (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting Applicative (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting Applicative (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Applicative (Reverse :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Applicative (Backwards :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Foldable (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Foldable (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Foldable (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Foldable (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Foldable (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Foldable (Reverse :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Foldable (Backwards :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Traversable (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Traversable (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Traversable (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Traversable (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Traversable (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Traversable (Reverse :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Traversable (Backwards :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Eq1 (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq e => Lifting Eq1 (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq e => Lifting Eq1 (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq w => Lifting Eq1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq w => Lifting Eq1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Eq1 (Reverse :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Eq1 (Backwards :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Ord1 (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord e => Lifting Ord1 (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord e => Lifting Ord1 (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord w => Lifting Ord1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord w => Lifting Ord1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Ord1 (Reverse :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Ord1 (Backwards :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Read1 (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read e => Lifting Read1 (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read e => Lifting Read1 (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read w => Lifting Read1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read w => Lifting Read1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Read1 (Reverse :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Read1 (Backwards :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Show1 (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show e => Lifting Show1 (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show e => Lifting Show1 (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show w => Lifting Show1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show w => Lifting Show1 (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Show1 (Reverse :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Show1 (Backwards :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadIO (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Error e => Lifting MonadIO (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadIO (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadIO (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadIO (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadIO (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadIO (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Alternative (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting Alternative (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting Alternative (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Alternative (Reverse :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Alternative (Backwards :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadPlus (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Error e => Lifting MonadPlus (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid e => Lifting MonadPlus (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadPlus (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadPlus (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadPlus (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadPlus (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadCont (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Error e => Lifting MonadCont (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadCont (ExceptT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadCont (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadCont (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadCont (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadCont (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monad f => Lifting Monad (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Monad (ContT r :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Monad (ReaderT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Functor f => Lifting Functor (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Functor f => Lifting Functor (Sum f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (ContT r :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (ReaderT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
MonadFix f => Lifting MonadFix (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadFix (ReaderT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Applicative f => Lifting Applicative (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Applicative (ContT r :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Applicative (ReaderT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Foldable f => Lifting Foldable (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Foldable f => Lifting Foldable (Sum f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Traversable f => Lifting Traversable (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Traversable f => Lifting Traversable (Sum f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq1 f => Lifting Eq1 (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq1 f => Lifting Eq1 (Sum f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord1 f => Lifting Ord1 (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord1 f => Lifting Ord1 (Sum f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read1 f => Lifting Read1 (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read1 f => Lifting Read1 (Sum f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show1 f => Lifting Show1 (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show1 f => Lifting Show1 (Sum f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadIO (ContT r :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadIO (ReaderT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Alternative f => Lifting Alternative (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Alternative (ReaderT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
MonadPlus f => Lifting MonadPlus (Product f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadPlus (ReaderT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting MonadCont (ReaderT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting Monad (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting Monad (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Functor f => Lifting Functor (Compose f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting Functor (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadFix (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadFix (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Applicative f => Lifting Applicative (Compose f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Foldable f => Lifting Foldable (Compose f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Traversable f => Lifting Traversable (Compose f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Eq1 f => Lifting Eq1 (Compose f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Ord1 f => Lifting Ord1 (Compose f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Read1 f => Lifting Read1 (Compose f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Show1 f => Lifting Show1 (Compose f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadIO (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadIO (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Alternative f => Lifting Alternative (Compose f :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadPlus (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadPlus (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadCont (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting MonadCont (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadState s :: (Type -> Type) -> Constraint) ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadState s :: (Type -> Type) -> Constraint) MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadReader r :: (Type -> Type) -> Constraint) ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadReader r :: (Type -> Type) -> Constraint) MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadError e :: (Type -> Type) -> Constraint) ListT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadError e :: (Type -> Type) -> Constraint) MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Error e => Lifting (MonadState s :: (Type -> Type) -> Constraint) (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadState s :: (Type -> Type) -> Constraint) (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting (MonadState s :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting (MonadState s :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadState s :: (Type -> Type) -> Constraint) (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Error e => Lifting (MonadReader r :: (Type -> Type) -> Constraint) (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadReader r :: (Type -> Type) -> Constraint) (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadReader r :: (Type -> Type) -> Constraint) (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadReader r :: (Type -> Type) -> Constraint) (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting (MonadReader r :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting (MonadReader r :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadReader r :: (Type -> Type) -> Constraint) (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadError e :: (Type -> Type) -> Constraint) (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadError e :: (Type -> Type) -> Constraint) (StateT s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting (MonadError e :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting (MonadError e :: (Type -> Type) -> Constraint) (WriterT w :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadError e :: (Type -> Type) -> Constraint) (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadState s :: (Type -> Type) -> Constraint) (ContT r' :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadState s :: (Type -> Type) -> Constraint) (ReaderT r :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadReader r :: (Type -> Type) -> Constraint) (ContT r' :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadError e :: (Type -> Type) -> Constraint) (ReaderT r :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting (MonadError e :: (Type -> Type) -> Constraint) (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Monoid w => Lifting (MonadError e :: (Type -> Type) -> Constraint) (RWST r w s :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadRWS r w s :: (Type -> Type) -> Constraint) MaybeT Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadRWS r w s :: (Type -> Type) -> Constraint) (ExceptT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Error e => Lifting (MonadRWS r w s :: (Type -> Type) -> Constraint) (ErrorT e :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |
Lifting (MonadRWS r w s :: (Type -> Type) -> Constraint) (IdentityT :: (Type -> Type) -> Type -> Type) Source # | |
Instance detailsDefined in Data.Constraint.Lifting |