Safe Haskell | None |
---|---|
Language | Haskell2010 |
Symantic for '(->)'.
- class Sym_Function term where
- tyFun :: Source src => Inj_Len vs => Type src vs (->)
- a0 :: Source src => Inj_Len vs => Inj_Kind (K a) => Type src (Proxy a ': vs) a
- b1 :: Source src => Inj_Len vs => Inj_Kind (K b) => Type src (a ': (Proxy b ': vs)) b
- c2 :: Source src => Inj_Len vs => Inj_Kind (K c) => Type src (a ': (b ': (Proxy c ': vs))) c
- teFunction_compose :: TermDef (->) '[Proxy a, Proxy b, Proxy c] (() #> ((b -> c) -> (a -> b) -> a -> c))
- teFunction_const :: TermDef (->) '[Proxy a, Proxy b] (() #> (a -> b -> a))
- teFunction_flip :: TermDef (->) '[Proxy a, Proxy b, Proxy c] (() #> ((a -> b -> c) -> b -> a -> c))
- teFunction_id :: TermDef (->) '[Proxy a] (() #> (a -> a))
Class Sym_Function
class Sym_Function term where Source #
comp :: term (b -> c) -> term (a -> b) -> term (a -> c) infixr 9 Source #
const :: term a -> term b -> term a Source #
flip :: term (a -> b -> c) -> term (b -> a -> c) Source #
id :: term a -> term a Source #
comp :: Sym_Function (UnT term) => Trans term => term (b -> c) -> term (a -> b) -> term (a -> c) infixr 9 Source #
const :: Sym_Function (UnT term) => Trans term => term a -> term b -> term a Source #
flip :: Sym_Function (UnT term) => Trans term => term (a -> b -> c) -> term (b -> a -> c) Source #
id :: Sym_Function (UnT term) => Trans term => term a -> term a Source #
Sym_Function Eval Source # | |
Sym_Function View Source # | |
(Sym_Function term, Sym_Lambda term) => Sym_Function (BetaT term) Source # | |
(Sym_Function r1, Sym_Function r2) => Sym_Function (Dup r1 r2) Source # | |
Type
s
c2 :: Source src => Inj_Len vs => Inj_Kind (K c) => Type src (a ': (b ': (Proxy c ': vs))) c Source #
Term
s
teFunction_compose :: TermDef (->) '[Proxy a, Proxy b, Proxy c] (() #> ((b -> c) -> (a -> b) -> a -> c)) Source #
teFunction_flip :: TermDef (->) '[Proxy a, Proxy b, Proxy c] (() #> ((a -> b -> c) -> b -> a -> c)) Source #