Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Documentation
class Category (cat :: k -> k -> *) where #
A class for categories. Instances should satisfy the laws
f.
id
= f -- (right identity)id
.
f = f -- (left identity) f.
(g.
h) = (f.
g).
h -- (associativity)
Instances
Category (:-) | Possible since GHC 7.8, when |
Category (Coercion :: k -> k -> *) | Since: base-4.7.0.0 |
Category ((:~:) :: k -> k -> *) | Since: base-4.7.0.0 |
Category ((:~~:) :: k -> k -> *) | Since: base-4.10.0.0 |
Category k2 => Category (Dual k2 :: k1 -> k1 -> *) | |
Category k2 => Category (WrappedCategory k2 :: k1 -> k1 -> *) | |
Defined in Data.Semigroupoid id :: WrappedCategory k2 a a # (.) :: WrappedCategory k2 b c -> WrappedCategory k2 a b -> WrappedCategory k2 a c # | |
Monoid m => Category (Semi m :: k -> k -> *) | |
(Applicative f, Category p) => Category (Tannen f p :: k -> k -> *) | |
Category Op | |
Category ReifiedGetter | |
Defined in Control.Lens.Reified id :: ReifiedGetter a a # (.) :: ReifiedGetter b c -> ReifiedGetter a b -> ReifiedGetter a c # | |
Category ReifiedFold | |
Defined in Control.Lens.Reified id :: ReifiedFold a a # (.) :: ReifiedFold b c -> ReifiedFold a b -> ReifiedFold a c # | |
Monad m => Category (Kleisli m :: * -> * -> *) | Since: base-3.0 |
(Applicative f, Monad f) => Category (WhenMissing f :: * -> * -> *) | Since: containers-0.5.9 |
Defined in Data.IntMap.Internal id :: WhenMissing f a a # (.) :: WhenMissing f b c -> WhenMissing f a b -> WhenMissing f a c # | |
Category (Indexed i :: * -> * -> *) | |
Category p => Category (TambaraSum p :: * -> * -> *) | |
Defined in Data.Profunctor.Choice id :: TambaraSum p a a # (.) :: TambaraSum p b c -> TambaraSum p a b -> TambaraSum p a c # | |
Category p => Category (Closure p :: * -> * -> *) | |
Category p => Category (Tambara p :: * -> * -> *) | |
Monad f => Category (Star f :: * -> * -> *) | |
Category p => Category (WrappedArrow p :: * -> * -> *) | |
Defined in Data.Profunctor.Types id :: WrappedArrow p a a # (.) :: WrappedArrow p b c -> WrappedArrow p a b -> WrappedArrow p a c # | |
Applicative f => Category (Static f :: * -> * -> *) | |
Category ((->) :: * -> * -> *) | Since: base-3.0 |
Defined in Control.Category | |
Comonad w => Category (Cokleisli w :: * -> * -> *) | |
(Monad f, Applicative f) => Category (WhenMatched f x :: * -> * -> *) | Since: containers-0.5.9 |
Defined in Data.IntMap.Internal id :: WhenMatched f x a a # (.) :: WhenMatched f x b c -> WhenMatched f x a b -> WhenMatched f x a c # | |
(Applicative f, Monad f) => Category (WhenMissing f k :: * -> * -> *) | Since: containers-0.5.9 |
Defined in Data.Map.Internal id :: WhenMissing f k a a # (.) :: WhenMissing f k b c -> WhenMissing f k a b -> WhenMissing f k a c # | |
p ~ q => Category (Rift p q :: * -> * -> *) |
|
(Monad f, Applicative f) => Category (WhenMatched f k x :: * -> * -> *) | Since: containers-0.5.9 |
Defined in Data.Map.Internal id :: WhenMatched f k x a a # (.) :: WhenMatched f k x b c -> WhenMatched f k x a b -> WhenMatched f k x a c # |