type-settheory-0.1.3.1: Sets and functions-as-relations in the type system

Type.Dummies

Synopsis

Documentation

data Lower a Source

"Kind-cast" (* -> *) to *

Instances

Fact (:∈: (Lower s) fam -> :⊆: (Inters fam) s) 
Fact (:∈: (Lower s) fam -> :⊆: s (Unions fam)) 
Fact (:~~>: dom cod (Lower f) -> :~>: dom cod f) 
Fact (:~>: dom cod f -> :~~>: dom cod (Lower f)) 
Applicative a => Fact (:∈: (Lower a) ApplicativeType) 
MonadPlus a => Fact (:∈: (Lower a) MonadPlusType) 
Monad a => Fact (:∈: (Lower a) MonadType) 
Functor a => Fact (:∈: (Lower a) FunctorType) 

data Lower1 a whereSource

"Kind-cast" ((* -> *) -> *) to (* -> *) . Also lower elements using Lower.

Constructors

LowerElement :: u x -> Lower1 u (Lower x) 

data Lower2 a whereSource

"Kind-cast" (((* -> *) -> *) -> *) to ((* -> *) -> *) . Also lower elements using Lower1.

Constructors

Lower1Element :: u x -> Lower2 u (Lower1 x) 

data Lower3 a whereSource

"Kind-cast" ((((* -> *) -> *) -> *) -> *) to (((* -> *) -> *) -> *) . Also lower elements using Lower2.

Constructors

Lower2Element :: u x -> Lower3 u (Lower2 x) 

data PAIR a b x Source

Pair of types of kind (* -> *)

data PAIR1 a b x Source

Pair of types of kind ((* -> *) -> *)

data PAIR2 a b x Source

Pair of types of kind (((* -> *) -> *) -> *)

data PAIR3 a b x Source

Pair of types of kind ((((* -> *) -> *) -> *) -> *)

data BOOL whereSource

Constructors

Bool0 :: BOOL Bool0 
Bool1 :: BOOL Bool1 

elimBOOL :: BOOL a -> r Bool0 -> r Bool1 -> r aSource

kelimBOOL :: BOOL a -> r -> r -> rSource