| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Data.Constraint.Lifting
Documentation
class Lifting c d f where Source #
Instances
| Lifting (c :: k2 -> Constraint) (Unconstrained1 :: k1 -> Constraint) (f :: k2 -> k1) Source # | |
Defined in Data.Constraint.Lifting Methods lift :: c a :- Unconstrained1 (f a) Source # | |
| (forall a. Show a => c (f a)) => Lifting Show (c :: k -> Constraint) (f :: Type -> k) Source # | |
| (forall a. Read a => c (f a)) => Lifting Read (c :: k -> Constraint) (f :: Type -> k) Source # | |
| (forall a. Monoid a => c (f a)) => Lifting Monoid (c :: k -> Constraint) (f :: Type -> k) Source # | |
| (forall a. Semigroup a => c (f a)) => Lifting Semigroup (c :: k -> Constraint) (f :: Type -> k) Source # | |
| (forall a. Bounded a => c (f a)) => Lifting Bounded (c :: k -> Constraint) (f :: Type -> k) Source # | |
| (forall a. Ord a => c (f a)) => Lifting Ord (c :: k -> Constraint) (f :: Type -> k) Source # | |
| (forall a. Eq a => c (f a)) => Lifting Eq (c :: k -> Constraint) (f :: Type -> k) Source # | |
| Lifting (Category :: (k -> k -> Type) -> Constraint) (Groupoid :: (k -> k -> Type) -> Constraint) (Iso :: (k -> k -> Type) -> k -> k -> Type) Source # | |
| Lifting (Functor s ((->) :: Type -> Type -> Type) :: (k2 -> Type) -> Constraint) (Functor (NT s :: (k1 -> k2) -> (k1 -> k2) -> Type) (NT ((->) :: Type -> Type -> Type) :: (k1 -> Type) -> (k1 -> Type) -> Type) :: ((k1 -> k2) -> k1 -> Type) -> Constraint) (Compose :: (k2 -> Type) -> (k1 -> k2) -> k1 -> Type) Source # | |
type Endolifting c = Lifting c c Source #