| Safe Haskell | Safe-Inferred |
|---|---|
| Language | Haskell2010 |
Pandora.Pattern.Functor.Bindable
Documentation
class Covariant t source source => Bindable t source where Source #
When providing a new instance, you should ensure it satisfies : * Interchange: t >>= f = join (f <$> t)
Instances
| Bindable Identity ((->) :: Type -> Type -> Type) Source # | |
| Bindable Maybe ((->) :: Type -> Type -> Type) Source # | |
| Bindable (Proxy :: Type -> Type) ((->) :: Type -> Type -> Type) Source # | |
| (Pointable t ((->) :: Type -> Type -> Type), Bindable t ((->) :: Type -> Type -> Type)) => Bindable (Jack t) ((->) :: Type -> Type -> Type) 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 # | |
| Bindable (Conclusion e) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Functor.Conclusion Methods (=<<) :: (a -> Conclusion e b) -> Conclusion e a -> Conclusion e b Source # | |
| (forall a. Semigroup ((t <:.> Construction t) := a), Bindable t ((->) :: Type -> Type -> Type)) => Bindable (Comprehension t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Structure.Modification.Comprehension Methods (=<<) :: (a -> Comprehension t b) -> Comprehension t a -> Comprehension t b Source # | |
| Bindable (State s) ((->) :: Type -> Type -> Type) Source # | |
| Bindable (Environment e) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Inventory.Environment Methods (=<<) :: (a -> Environment e b) -> Environment e a -> Environment e b Source # | |
| Semigroup e => Bindable (Accumulator e) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Inventory.Accumulator Methods (=<<) :: (a -> Accumulator e b) -> Accumulator e a -> Accumulator e b Source # | |
| Bindable (Tagged tag) ((->) :: Type -> Type -> Type) Source # | |
| Bindable (Schematic Monad t u) ((->) :: Type -> Type -> Type) => Bindable (t :> u) ((->) :: Type -> Type -> Type) Source # | |
| Bindable (Schematic Comonad t u) ((->) :: Type -> Type -> Type) => Bindable (t :< u) ((->) :: Type -> Type -> Type) Source # | |
| Bindable ((->) e :: Type -> Type) ((->) :: Type -> Type -> Type) Source # | |
| Covariant t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) => Bindable (Continuation r t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Continuation Methods (=<<) :: (a -> Continuation r t b) -> Continuation r t a -> Continuation r t b Source # | |
| (Traversable t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type), Bindable t ((->) :: Type -> Type -> Type), Semimonoidal u ((->) :: Type -> Type -> Type) (:*:) (:*:), Pointable u ((->) :: Type -> Type -> Type), Bindable u ((->) :: Type -> Type -> Type)) => Bindable (t <.:> u) ((->) :: Type -> Type -> Type) Source # | |
| (Semigroup e, Pointable u ((->) :: Type -> Type -> Type), Bindable u ((->) :: Type -> Type -> Type)) => Bindable ((:*:) e <.:> u) ((->) :: Type -> Type -> Type) Source # | |
| (Bindable t ((->) :: Type -> Type -> Type), Distributive t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type), Covariant u ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type), Bindable u ((->) :: Type -> Type -> Type)) => Bindable (t <:.> u) ((->) :: Type -> Type -> Type) Source # | |