symantic-lib-0.0.5.20190614: Symantics for common types.

Safe HaskellNone
LanguageHaskell2010

Language.Symantic.Lib.Text

Contents

Description

Symantic for Text.

Synopsis

Class Sym_Text

class Sym_Text term where Source #

Minimal complete definition

Nothing

Methods

text :: Text -> term Text Source #

text :: Sym_Text (UnT term) => Trans term => Text -> term Text Source #

Instances
Sym_Text View Source # 
Instance details

Defined in Language.Symantic.Lib.Text

Methods

text :: Text -> View Text Source #

Sym_Text Eval Source # 
Instance details

Defined in Language.Symantic.Lib.Text

Methods

text :: Text -> Eval Text Source #

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

Defined in Language.Symantic.Lib.Text

Methods

text :: Text -> BetaT term Text Source #

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

Defined in Language.Symantic.Lib.Text

Methods

text :: Text -> Dup r1 r2 Text Source #

Types

tyText :: Source src => LenInj vs => Type src vs Text Source #

Terms

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

Orphan instances

ClassInstancesFor Text Source # 
Instance details

Methods

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

TypeInstancesFor Text Source # 
Instance details

Methods

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

NameTyOf Text Source # 
Instance details

Methods

nameTyOf :: proxy Text -> Mod NameTy #

isNameTyOp :: proxy Text -> Bool #

ModuleFor src ss Text Source # 
Instance details

Methods

moduleFor :: (PathMod, Module src ss) #

Gram_Term_AtomsFor src ss g Text Source # 
Instance details

Methods

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