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

Pandora.Paradigm.Primary.Algebraic.Exponential

Documentation

(-.#..-) :: (Covariant (v a) (->) target, Semigroupoid v) => v c d -> target (v a (v b c)) (v a (v b d)) infixr 7 Source #

(!.) :: a -> b -> a infixr 2 Source #

(!..) :: a -> b -> c -> a Source #

(!...) :: a -> b -> c -> d -> a Source #

(%) :: (a -> b -> c) -> b -> a -> c infixr 9 Source #

(&) :: a -> (a -> b) -> b infixl 1 Source #

fix :: (a -> a) -> a Source #

Orphan instances

Semigroup r => Semigroup (e -> r) Source # 
Instance details

Methods

(+) :: (e -> r) -> (e -> r) -> e -> r Source #

Ringoid r => Ringoid (e -> r) Source # 
Instance details

Methods

(*) :: (e -> r) -> (e -> r) -> e -> r Source #

Semigroupoid ((->) :: Type -> Type -> Type) Source # 
Instance details

Methods

(.) :: (b -> c) -> (a -> b) -> a -> c Source #

Category ((->) :: Type -> Type -> Type) Source # 
Instance details

Methods

identity :: a -> a Source #

($) :: (a -> b) -> (a -> b) Source #

(#) :: (a -> b) -> (a -> b) Source #

Contravariant (Flip ((->) :: Type -> Type -> Type) a) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Methods

(->$<-) :: (a0 -> b) -> Flip (->) a b -> Flip (->) a a0 Source #

Divariant ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Methods

(>->) :: (a -> b) -> (c -> d) -> (b -> c) -> (a -> d) Source #

Representable ((->) e :: Type -> Type) Source # 
Instance details

Associated Types

type Representation ((->) e) Source #

Methods

(<#>) :: Representation ((->) e) -> a <:= (->) e Source #

tabulate :: (Representation ((->) e) -> a) -> e -> a Source #

index :: (e -> a) -> Representation ((->) e) -> a Source #

Pointable ((->) e :: Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Methods

point :: a -> (e -> a) Source #

Bindable ((->) e :: Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Methods

(=<<) :: (a -> (e -> b)) -> (e -> a) -> (e -> b) Source #

Covariant ((->) a :: Type -> Type) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Methods

(-<$>-) :: (a0 -> b) -> (a -> a0) -> (a -> b) Source #

Distributive ((->) e :: Type -> Type) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Methods

(-<<) :: Covariant u (->) (->) => (a -> (e -> b)) -> u a -> (e -> u b) Source #