symantic-lib-0.0.2.20170703: Symantics for common types.

Safe HaskellNone
LanguageHaskell2010

Language.Symantic.Lib.Show

Contents

Description

Symantic for Show.

Synopsis

Class Sym_Show

class Sym_Show term where Source #

Methods

showsPrec :: Show a => term Int -> term a -> term ShowS Source #

show :: Show a => term a -> term String Source #

showList :: Show a => term [a] -> term ShowS Source #

showsPrec :: Sym_Show (UnT term) => Trans term => Show a => term Int -> term a -> term ShowS Source #

show :: Sym_Show (UnT term) => Trans term => Show a => term a -> term String Source #

showList :: Sym_Show (UnT term) => Trans term => Show a => term [a] -> term ShowS Source #

Instances

Sym_Show Eval Source # 

Methods

showsPrec :: Show a => Eval Int -> Eval a -> Eval ShowS Source #

show :: Show a => Eval a -> Eval String Source #

showList :: Show a => Eval [a] -> Eval ShowS Source #

Sym_Show View Source # 

Methods

showsPrec :: Show a => View Int -> View a -> View ShowS Source #

show :: Show a => View a -> View String Source #

showList :: Show a => View [a] -> View ShowS Source #

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

Methods

showsPrec :: Show a => BetaT term Int -> BetaT term a -> BetaT term ShowS Source #

show :: Show a => BetaT term a -> BetaT term String Source #

showList :: Show a => BetaT term [a] -> BetaT term ShowS Source #

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

Methods

showsPrec :: Show a => Dup r1 r2 Int -> Dup r1 r2 a -> Dup r1 r2 ShowS Source #

show :: Show a => Dup r1 r2 a -> Dup r1 r2 String Source #

showList :: Show a => Dup r1 r2 [a] -> Dup r1 r2 ShowS Source #

Types

tyShow :: Source src => Type src vs a -> Type src vs (Show a) Source #

tyShowS :: Source src => LenInj vs => Type src vs ShowS Source #

Terms

Orphan instances

ClassInstancesFor (* -> Constraint) Show Source # 

Methods

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

TypeInstancesFor (* -> Constraint) Show 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) Show Source # 

Methods

nameTyOf :: proxy c -> Mod NameTy #

isNameTyOp :: proxy c -> Bool #

FixityOf (* -> Constraint) Show Source # 

Methods

fixityOf :: proxy c -> Maybe Fixity #

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

Methods

moduleFor :: (PathMod, Module ss Show) #

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

Methods

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