Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Pandora.Paradigm.Primary.Transformer.Instruction
Documentation
data Instruction t a Source #
Constructors
Enter a | |
Instruct ((t :. Instruction t) := a) |
Instances
Liftable Instruction Source # | |
(forall (t :: Type -> Type). Bindable t ((->) :: Type -> Type -> Type), forall (t :: Type -> Type). Pointable t ((->) :: Type -> Type -> Type)) => Lowerable Instruction Source # | |
Monad t => Monad (Instruction t) Source # | |
(forall (v :: Type -> Type). Covariant v ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type)) => Hoistable Instruction Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Instruction Methods (/|\) :: forall (u :: Type -> Type) (v :: Type -> Type). Covariant u (->) (->) => (u ~> v) -> Instruction u ~> Instruction v Source # hoist :: forall (u :: Type -> Type) (v :: Type -> Type). Covariant u (->) (->) => (u ~> v) -> Instruction u ~> Instruction v Source # | |
(Covariant t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type), Semimonoidal t ((->) :: Type -> Type -> Type) (:*:) (:*:)) => Semimonoidal (Instruction t :: Type -> Type) ((->) :: Type -> Type -> Type) (:*:) (:*:) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Instruction Methods multiply_ :: forall (a :: k) (b :: k). (Instruction t a :*: Instruction t b) -> Instruction t (a :*: b) Source # | |
Covariant t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) => Pointable (Instruction t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Instruction Methods point :: a -> Instruction t a Source # | |
Covariant t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) => Bindable (Instruction t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Instruction Methods (=<<) :: (a -> Instruction t b) -> Instruction t a -> Instruction t b Source # | |
Covariant t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) => Covariant (Instruction t) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Instruction Methods (-<$>-) :: (a -> b) -> Instruction t a -> Instruction t b Source # | |
Traversable t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) => Traversable (Instruction t) ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Instruction Methods (<<-) :: (Covariant u (->) (->), Pointable u (->), Semimonoidal u (->) (:*:) (:*:)) => (a -> u b) -> Instruction t a -> u (Instruction t b) Source # |