| Safe Haskell | Safe-Inferred |
|---|---|
| Language | Haskell2010 |
Pandora.Pattern.Functor.Pointable
Documentation
class Covariant_ t source source => Pointable t source where Source #
Instances
| Pointable Identity ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Functor.Identity | |
| Pointable Maybe ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Functor.Maybe | |
| Pointable (Proxy :: Type -> Type) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Functor.Proxy | |
| Pointable t ((->) :: Type -> Type -> Type) => Pointable (Yoneda t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Yoneda | |
| Covariant_ t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) => Pointable (Jack t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Jack | |
| Pointable (Wedge e) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Functor.Wedge | |
| Pointable (These e) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Functor.These | |
| Pointable (Validation e) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Functor.Validation Methods point :: a -> Validation e a Source # | |
| (forall (u :: Type -> Type). Avoidable u, Covariant_ t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type)) => Pointable (Jet t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Jet | |
| Pointable (Outline t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Outline | |
| 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 # | |
| (Avoidable t, Covariant_ t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type)) => Pointable (Construction t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Construction Methods point :: a -> Construction t a Source # | |
| Pointable (Conclusion e) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Functor.Conclusion Methods point :: a -> Conclusion e a Source # | |
| (Avoidable t, Pointable t ((->) :: Type -> Type -> Type)) => Pointable (Comprehension t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Structure.Modification.Comprehension Methods point :: a -> Comprehension t a Source # | |
| (Avoidable t, Covariant_ t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type)) => Pointable (Tap t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Tap | |
| Pointable (State s) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Inventory.State | |
| Pointable (Environment e) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Inventory.Environment Methods point :: a -> Environment e a Source # | |
| Monoid e => Pointable (Accumulator e) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Inventory.Accumulator Methods point :: a -> Accumulator e a Source # | |
| Pointable (Tagged tag) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Functor.Tagged | |
| Pointable (Schematic Monad t u) ((->) :: Type -> Type -> Type) => Pointable (t :> u) ((->) :: Type -> Type -> Type) Source # | |
| (Pointable t ((->) :: Type -> Type -> Type), Pointable u ((->) :: Type -> Type -> Type)) => Pointable (Day t u) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Day | |
| Pointable t ((->) :: Type -> Type -> Type) => Pointable (Backwards t) ((->) :: Type -> Type -> Type) Source # | |
| Pointable t ((->) :: Type -> Type -> Type) => Pointable (Reverse t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Reverse | |
| Pointable (Schematic Comonad t u) ((->) :: Type -> Type -> Type) => Pointable (t :< u) ((->) :: Type -> Type -> Type) Source # | |
| (Monoid k, Pointable t ((->) :: Type -> Type -> Type)) => Pointable (Prefixed t k) ((->) :: Type -> Type -> Type) Source # | |
| Pointable ((->) e :: Type -> Type) ((->) :: Type -> Type -> Type) Source # | |
| Covariant_ t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) => Pointable (Continuation r t) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Primary.Transformer.Continuation Methods point :: a -> Continuation r t a Source # | |
| (Covariant_ t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type), Covariant_ t' ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type), Pointable u ((->) :: Type -> Type -> Type), Adjoint t' t ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type)) => Pointable ((t <:<.>:> t') := u) ((->) :: Type -> Type -> Type) Source # | |
| (Pointable t ((->) :: Type -> Type -> Type), Pointable u ((->) :: Type -> Type -> Type)) => Pointable (t <.:> u) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Schemes.UT | |
| (Pointable u ((->) :: Type -> Type -> Type), Monoid e) => Pointable ((:*:) e <.:> u) ((->) :: Type -> Type -> Type) Source # | |
| (Pointable t ((->) :: Type -> Type -> Type), Pointable u ((->) :: Type -> Type -> Type)) => Pointable (t <:.> u) ((->) :: Type -> Type -> Type) Source # | |
Defined in Pandora.Paradigm.Schemes.TU | |