symantic-lib-0.0.2.20170703: Symantics for common types.

Safe HaskellNone
LanguageHaskell2010

Language.Symantic.Lib.Char

Contents

Description

Symantic for Char.

Synopsis

Class Sym_Char

class Sym_Char term where Source #

Methods

char :: Char -> term Char Source #

char_toUpper :: term Char -> term Char Source #

char_toLower :: term Char -> term Char Source #

char :: Sym_Char (UnT term) => Trans term => Char -> term Char Source #

char_toUpper :: Sym_Char (UnT term) => Trans term => term Char -> term Char Source #

char_toLower :: Sym_Char (UnT term) => Trans term => term Char -> term Char Source #

Types

tyChar :: Source src => LenInj vs => Type src vs Char Source #

tyString :: Source src => LenInj vs => Type src vs String Source #

Terms

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

Orphan instances

ClassInstancesFor * Char Source # 

Methods

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

TypeInstancesFor * Char 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 * Char Source # 

Methods

nameTyOf :: proxy c -> Mod NameTy #

isNameTyOp :: proxy c -> Bool #

(Source src, SymInj * ss Char) => ModuleFor * src ss Char Source # 

Methods

moduleFor :: (PathMod, Module ss Char) #

(Gram_Source src g, Gram_Alt g, Gram_Rule g, Gram_Comment g, SymInj * ss Char) => Gram_Term_AtomsFor * src ss g Char Source # 

Methods

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