pandora-0.4.5: A box of patterns and paradigms
Safe HaskellSafe-Inferred
LanguageHaskell2010

Pandora.Paradigm.Primary.Algebraic

Documentation

($>-) :: Covariant t (->) (->) => t a -> b -> t b Source #

($$>-) :: (Covariant t (->) (->), Covariant u (->) (->)) => t (u a) -> b -> t (u b) Source #

($$$>-) :: (Covariant t (->) (->), Covariant u (->) (->), Covariant v (->) (->)) => t (u (v a)) -> b -> t (u (v b)) Source #

(-<*>-) :: Applicative_ t => t (a -> b) -> t a -> t b infixl 4 Source #

(*>-) :: Applicative_ t => t a -> t b -> t b Source #

forever_ :: Applicative_ t => t a -> t b Source #

(-+-) :: Alternative_ t => t a -> t b -> ((a :+: b) -> r) -> t r Source #

Orphan instances

Semimonoidal ((:+:) e :: Type -> Type) ((->) :: Type -> Type -> Type) (:*:) (:+:) Source # 
Instance details

Methods

multiply_ :: forall (a :: k) (b :: k). ((e :+: a) :*: (e :+: b)) -> (e :+: (a :+: b)) Source #

Traversable ((:*:) s) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Methods

(<<-) :: (Covariant u (->) (->), Pointable u (->), Semimonoidal u (->) (:*:) (:*:)) => (a -> u b) -> (s :*: a) -> u (s :*: b) Source #

Semimonoidal ((->) e :: Type -> Type) ((->) :: Type -> Type -> Type) (:*:) (:*:) Source # 
Instance details

Methods

multiply_ :: forall (a :: k) (b :: k). ((e -> a) :*: (e -> b)) -> (e -> (a :*: b)) Source #

Adjoint ((:*:) s) ((->) s :: Type -> Type) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Methods

(-|) :: ((s :*: a) -> b) -> a -> (s -> b) Source #

(|-) :: (a -> (s -> b)) -> (s :*: a) -> b Source #