symantic-lib-0.0.4.20180831: Symantics for common types.

Safe HaskellNone
LanguageHaskell2010

Language.Symantic.Lib.Int

Contents

Description

Symantic for Int.

Synopsis

Class Sym_Int

class Sym_Int term where Source #

Methods

int :: Int -> term Int Source #

int :: Sym_Int (UnT term) => Trans term => Int -> term Int Source #

Instances
Sym_Int View Source # 
Instance details

Defined in Language.Symantic.Lib.Int

Methods

int :: Int -> View Int Source #

Sym_Int Eval Source # 
Instance details

Defined in Language.Symantic.Lib.Int

Methods

int :: Int -> Eval Int Source #

(Sym_Int term, Sym_Lambda term) => Sym_Int (BetaT term) Source # 
Instance details

Defined in Language.Symantic.Lib.Int

Methods

int :: Int -> BetaT term Int Source #

(Sym_Int r1, Sym_Int r2) => Sym_Int (Dup r1 r2) Source # 
Instance details

Defined in Language.Symantic.Lib.Int

Methods

int :: Int -> Dup r1 r2 Int Source #

Types

tyInt :: Source src => LenInj vs => Type src vs Int Source #

Terms

teInt :: Source src => SymInj ss Int => Int -> Term src ss ts '[] (() #> Int) Source #

Orphan instances

ClassInstancesFor Int Source # 
Instance details

Methods

proveConstraintFor :: Source src => proxy Int -> Type src vs q -> Maybe (Qual q) #

TypeInstancesFor Int Source # 
Instance details

Methods

expandFamFor :: Source src => proxy Int -> Len vs -> Const src fam -> Types src vs ts -> Maybe (Type src vs (Fam fam ts)) #

NameTyOf Int Source # 
Instance details

Methods

nameTyOf :: proxy Int -> Mod NameTy #

isNameTyOp :: proxy Int -> Bool #

ModuleFor src ss Int Source # 
Instance details

Methods

moduleFor :: (PathMod, Module src ss) #

Gram_Term_AtomsFor src ss g Int Source # 
Instance details

Methods

g_term_atomsFor :: [CF g (AST_Term src ss)] #