module Pandora.Pattern.Functor.Contravariant where
import Pandora.Pattern.Category (Category)
infixl 4 >-|-, >!<
class (Category source, Category target) => Contravariant source target t where
(>-|-) :: source a b -> target (t b) (t a)
(>!<) :: Contravariant source target t => source a b -> target (t b) (t a)
>!< :: source a b -> target (t b) (t a)
(>!<) = source a b -> target (t b) (t a)
forall (source :: * -> * -> *) (target :: * -> * -> *)
(t :: * -> *) a b.
Contravariant source target t =>
source a b -> target (t b) (t a)
(>-|-)