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

Minimal complete definition

Nothing

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

Defined in Language.Symantic.Lib.Show

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

Defined in Language.Symantic.Lib.Show

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 term, Sym_Lambda term) => Sym_Show (BetaT term) Source # 
Instance details

Defined in Language.Symantic.Lib.Show

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

Defined in Language.Symantic.Lib.Show

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

Methods

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

TypeInstancesFor Show Source # 
Instance details

Methods

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

NameTyOf Show Source # 
Instance details

Methods

nameTyOf :: proxy Show -> Mod NameTy #

isNameTyOp :: proxy Show -> Bool #

FixityOf Show Source # 
Instance details

Methods

fixityOf :: proxy Show -> Maybe Fixity #

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

Methods

moduleFor :: (PathMod, Module src ss) #

Gram_Term_AtomsFor src ss g Show Source # 
Instance details

Methods

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