Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Documentation
Notes: Const2
'()' is the indiscrete category.
Instances
(Semigroup a, Monoid a) => Category (Const2 a :: k -> k -> Type) Source # | |
(Semigroup a, Group a) => Groupoid (Const2 a :: k -> k -> Type) Source # | |
Functor ((->) :: Type -> Type -> Type) (NT (NT ((->) :: Type -> Type -> Type) :: (k2 -> Type) -> (k2 -> Type) -> Type) :: (k1 -> k2 -> Type) -> (k1 -> k2 -> Type) -> Type) (Const2 :: Type -> k1 -> k2 -> Type) Source # | |
Monad ((->) :: Type -> Type -> Type) m => Functor (Kleisli ((->) :: Type -> Type -> Type) m :: Type -> Type -> Type) (NT (NT (Kleisli ((->) :: Type -> Type -> Type) m) :: (k2 -> Type) -> (k2 -> Type) -> Type) :: (k1 -> k2 -> Type) -> (k1 -> k2 -> Type) -> Type) (Const2 :: Type -> k1 -> k2 -> Type) Source # | |
Semigroup a => Semigroup (Const2 a b c) Source # | |
Monoid a => Monoid (Const2 a b c) Source # | |
Preord a => Preord (Const2 a b c) Source # | |
PartialEq a => PartialEq (Const2 a b c) Source # | |
(Preord a, PartialEq a) => Eq (Const2 a b c) Source # | |
Defined in Control.Category.Const2 | |
PartialOrd a => PartialOrd (Const2 a b c) Source # | |
Defined in Control.Category.Const2 | |
Ord a => Ord (Const2 a b c) Source # | |
Group a => Group (Const2 a b c) Source # | |
Defined in Control.Category.Const2 |