pandora-0.1.8: A box of patterns and paradigms

Safe HaskellSafe
LanguageHaskell2010

Pandora.Pattern.Functor.Pointable

Documentation

class Covariant t => Pointable t where Source #

Methods

point :: a -> t a Source #

Instances
Pointable Maybe Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Maybe

Methods

point :: a -> Maybe a Source #

Pointable Identity Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Identity

Methods

point :: a -> Identity a Source #

Pointable (Environmental e) Source # 
Instance details

Defined in Pandora.Paradigm.Inventory.Environmental

Methods

point :: a -> Environmental e a Source #

Pointable t => Pointable (Yoneda t) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Yoneda

Methods

point :: a -> Yoneda t a Source #

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

Defined in Pandora.Paradigm.Basis.Proxy

Methods

point :: a -> Proxy a Source #

Pointable (Variation e) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Variation

Methods

point :: a -> Variation e a Source #

(forall (t' :: Type -> Type). Avoidable t') => Pointable (Jet t) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Jet

Methods

point :: a -> Jet t a Source #

Covariant t => Pointable (Free t) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Free

Methods

point :: a -> Free t a Source #

Pointable (Validation e) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Validation

Methods

point :: a -> Validation e a Source #

Avoidable t => Pointable (Twister t) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Twister

Methods

point :: a -> Twister t a Source #

Pointable (Stateful s) Source # 
Instance details

Defined in Pandora.Paradigm.Inventory.Stateful

Methods

point :: a -> Stateful s a Source #

Covariant t => Pointable (Jack t) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Jack

Methods

point :: a -> Jack t a Source #

Pointable (Conclusion e) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Conclusion

Methods

point :: a -> Conclusion e a Source #

Pointable (Tagged tag) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Tagged

Methods

point :: a -> Tagged tag a Source #

Covariant t => Pointable (Continuation r t) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Continuation

Methods

point :: a -> Continuation r t a Source #

(Pointable t, Pointable u) => Pointable (TU Co Co t u) Source # 
Instance details

Defined in Pandora.Paradigm.Junction.Schemes.TU

Methods

point :: a -> TU Co Co t u a Source #

(Pointable (t u), Pointable u) => Pointable (UTU Co Co t u) Source # 
Instance details

Defined in Pandora.Paradigm.Junction.Schemes.UTU

Methods

point :: a -> UTU Co Co t u a Source #

Pointable u => Pointable (UT Maybe () Maybe u) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Maybe

Methods

point :: a -> UT Maybe () Maybe u a Source #

Pointable u => Pointable (UT (Conclusion e) () (Conclusion e) u) Source # 
Instance details

Defined in Pandora.Paradigm.Basis.Conclusion

Methods

point :: a -> UT (Conclusion e) () (Conclusion e) u a Source #

(Pointable t, Pointable u) => Pointable (UT Co Co t u) Source # 
Instance details

Defined in Pandora.Paradigm.Junction.Schemes.UT

Methods

point :: a -> UT Co Co t u a Source #

Pointable u => Pointable (TUV Stateful () Stateful ((->) s :: Type -> Type) u ((:*:) s)) Source # 
Instance details

Defined in Pandora.Paradigm.Inventory.Stateful

Methods

point :: a -> TUV Stateful () Stateful ((->) s) u ((:*:) s) a Source #

(Pointable t, Pointable u, Pointable v) => Pointable (TUV Co Co Co t u v) Source # 
Instance details

Defined in Pandora.Paradigm.Junction.Schemes.TUV

Methods

point :: a -> TUV Co Co Co t u v a Source #

(Pointable t, Pointable u, Pointable v, Pointable w) => Pointable (TUVW Co Co Co Co t u v w) Source # 
Instance details

Defined in Pandora.Paradigm.Junction.Schemes.TUVW

Methods

point :: a -> TUVW Co Co Co Co t u v w a Source #