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

Pandora.Paradigm.Primary.Functor.Predicate

Documentation

newtype Predicate a Source #

Constructors

Predicate (a -> Boolean) 

Instances

Instances details
Interpreted Predicate Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Functor.Predicate

Associated Types

type Primary Predicate a Source #

Methods

run :: Predicate a -> Primary Predicate a Source #

unite :: Primary Predicate a -> Predicate a Source #

(||=) :: Interpreted u => (Primary Predicate a -> Primary u b) -> Predicate a -> u b Source #

(=||) :: Interpreted u => (Predicate a -> u b) -> Primary Predicate a -> Primary u b Source #

(<$||=) :: (Covariant (->) (->) j, Interpreted u) => (Primary Predicate a -> Primary u b) -> (j := Predicate a) -> j := u b Source #

(<$$||=) :: (Covariant (->) (->) j, Covariant (->) (->) k, Interpreted u) => (Primary Predicate a -> Primary u b) -> ((j :. k) := Predicate a) -> (j :. k) := u b Source #

(<$$$||=) :: (Covariant (->) (->) j, Covariant (->) (->) k, Covariant (->) (->) l, Interpreted u) => (Primary Predicate a -> Primary u b) -> ((j :. (k :. l)) := Predicate a) -> (j :. (k :. l)) := u b Source #

(<$$$$||=) :: (Covariant (->) (->) j, Covariant (->) (->) k, Covariant (->) (->) l, Covariant (->) (->) m, Interpreted u) => (Primary Predicate a -> Primary u b) -> ((j :. (k :. (l :. m))) := Predicate a) -> (j :. (k :. (l :. m))) := u b Source #

(=||$>) :: (Covariant (->) (->) j, Interpreted u) => (Predicate a -> u b) -> (j := Primary Predicate a) -> j := Primary u b Source #

(=||$$>) :: (Covariant (->) (->) j, Covariant (->) (->) k, Interpreted u) => (Predicate a -> u b) -> ((j :. k) := Primary Predicate a) -> (j :. k) := Primary u b Source #

(=||$$$>) :: (Covariant (->) (->) j, Covariant (->) (->) k, Covariant (->) (->) l, Interpreted u) => (Predicate a -> u b) -> ((j :. (k :. l)) := Primary Predicate a) -> (j :. (k :. l)) := Primary u b Source #

(=||$$$$>) :: (Covariant (->) (->) j, Covariant (->) (->) k, Covariant (->) (->) l, Covariant (->) (->) m, Interpreted u) => (Predicate a -> u b) -> ((j :. (k :. (l :. m))) := Primary Predicate a) -> (j :. (k :. (l :. m))) := Primary u b Source #

Contravariant ((->) :: Type -> Type -> Type) ((->) :: Type -> Type -> Type) Predicate Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Functor.Predicate

Methods

(->$<-) :: (a -> b) -> Predicate b -> Predicate a Source #

type Primary Predicate a Source # 
Instance details

Defined in Pandora.Paradigm.Primary.Functor.Predicate

type Primary Predicate a = a -> Boolean