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

Pandora.Paradigm.Primary.Transformer.Day

Documentation

data Day t u a Source #

Constructors

forall b c. Day (t b) (u c) (b -> c -> a) 

Instances

Instances details
Extractable t ((->) :: Type -> Type -> Type) => Lowerable (Day t) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Transformer.Day

Methods

lower :: forall (u :: Type -> Type). Covariant u (->) (->) => Day t u ~> u Source #

Hoistable (Day t :: (Type -> Type) -> Type -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Transformer.Day

Methods

(/|\) :: forall (u :: Type -> Type) (v :: Type -> Type). Covariant u (->) (->) => (u ~> v) -> Day t u ~> Day t v Source #

hoist :: forall (u :: Type -> Type) (v :: Type -> Type). Covariant u (->) (->) => (u ~> v) -> Day t u ~> Day t v Source #

(Pointable t ((->) :: Type -> Type -> Type), Pointable u ((->) :: Type -> Type -> Type)) => Pointable (Day t u) ((->) :: Type -> Type -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Transformer.Day

Methods

point :: a -> Day t u a Source #

(Extractable t ((->) :: Type -> Type -> Type), Extractable u ((->) :: Type -> Type -> Type)) => Extractable (Day t u) ((->) :: Type -> Type -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Transformer.Day

Methods

extract :: Day t u a -> a Source #

(Extendable t ((->) :: Type -> Type -> Type), Extendable u ((->) :: Type -> Type -> Type)) => Extendable (Day t u) ((->) :: Type -> Type -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Transformer.Day

Methods

(<<=) :: (Day t u a -> b) -> Day t u a -> Day t u b Source #

Covariant (Day t u) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Transformer.Day

Methods

(-<$>-) :: (a -> b) -> Day t u a -> Day t u b Source #

data Day_ category source target t u r Source #

Constructors

forall a b. Day_ (target (category (source a b) r) (target (t a) (u b)))