symantic-lib-0.0.2.20170703: Symantics for common types.

Safe HaskellNone
LanguageHaskell2010

Language.Symantic.Lib.Bounded

Contents

Description

Symantic for Bounded.

Synopsis

Class Sym_Bounded

class Sym_Bounded term where Source #

Methods

minBound :: Bounded a => term a Source #

maxBound :: Bounded a => term a Source #

minBound :: Sym_Bounded (UnT term) => Trans term => Bounded a => term a Source #

maxBound :: Sym_Bounded (UnT term) => Trans term => Bounded a => term a Source #

Instances

Sym_Bounded Eval Source # 

Methods

minBound :: Bounded a => Eval a Source #

maxBound :: Bounded a => Eval a Source #

Sym_Bounded View Source # 

Methods

minBound :: Bounded a => View a Source #

maxBound :: Bounded a => View a Source #

(Sym_Lambda term, Sym_Bounded term) => Sym_Bounded (BetaT term) Source # 

Methods

minBound :: Bounded a => BetaT term a Source #

maxBound :: Bounded a => BetaT term a Source #

(Sym_Bounded r1, Sym_Bounded r2) => Sym_Bounded (Dup r1 r2) Source # 

Methods

minBound :: Bounded a => Dup r1 r2 a Source #

maxBound :: Bounded a => Dup r1 r2 a Source #

Types

tyBounded :: Source src => Type src vs a -> Type src vs (Bounded a) Source #

Terms

Orphan instances

ClassInstancesFor (* -> Constraint) Bounded Source # 

Methods

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

TypeInstancesFor (* -> Constraint) Bounded Source # 

Methods

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

NameTyOf (* -> Constraint) Bounded Source # 

Methods

nameTyOf :: proxy c -> Mod NameTy #

isNameTyOp :: proxy c -> Bool #

FixityOf (* -> Constraint) Bounded Source # 

Methods

fixityOf :: proxy c -> Maybe Fixity #

(Source src, SymInj (* -> Constraint) ss Bounded) => ModuleFor (* -> Constraint) src ss Bounded Source # 

Methods

moduleFor :: (PathMod, Module ss Bounded) #

Gram_Term_AtomsFor (* -> Constraint) src ss g Bounded Source # 

Methods

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