symantic-lib-0.0.5.20190614: 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 #

Minimal complete definition

Nothing

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 View Source # 
Instance details

Defined in Language.Symantic.Lib.Bounded

Methods

minBound :: Bounded a => View a Source #

maxBound :: Bounded a => View a Source #

Sym_Bounded Eval Source # 
Instance details

Defined in Language.Symantic.Lib.Bounded

Methods

minBound :: Bounded a => Eval a Source #

maxBound :: Bounded a => Eval a Source #

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

Defined in Language.Symantic.Lib.Bounded

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 # 
Instance details

Defined in Language.Symantic.Lib.Bounded

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 Bounded Source # 
Instance details

Methods

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

TypeInstancesFor Bounded Source # 
Instance details

Methods

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

NameTyOf Bounded Source # 
Instance details

Methods

nameTyOf :: proxy Bounded -> Mod NameTy #

isNameTyOp :: proxy Bounded -> Bool #

FixityOf Bounded Source # 
Instance details

Methods

fixityOf :: proxy Bounded -> Maybe Fixity #

(Source src, SymInj ss Bounded) => ModuleFor src ss Bounded Source # 
Instance details

Methods

moduleFor :: (PathMod, Module src ss) #

Gram_Term_AtomsFor src ss g Bounded Source # 
Instance details

Methods

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