maam-0.3.0.0: Monadic Abstracting Abstract Machines (MAAM) built on Galois Transformers

Safe HaskellNone
LanguageHaskell2010

FP.Pretty.Pretty

Documentation

data Format Source

Constructors

FG Color 
BG Color 
UL 
BD 

data Layout Source

Constructors

Flat 
Break 

data Chunk Source

Constructors

Text 𝕊 
Newline 

newtype Doc Source

Constructors

Doc 

Fields

runDoc :: PrettyM ()
 

class Pretty a where Source

Methods

pretty :: a -> Doc Source

Instances

Pretty => Pretty Loc Source 
Pretty Loc => Pretty LocRange Source 
(Pretty (𝒫 𝕊), Pretty ((⇰) 𝕊 SourceErrorTrace)) => Pretty SourceErrorTrace Source 
(Pretty Doc, Pretty SourceErrorTrace) => Pretty SourceErrorInfo Source 
Pretty Op Source 
Pretty SourceExp Source 
Pretty Exp Source 
Pretty Name Source 
Pretty [Exp] => Pretty Moment Source 
Pretty Moment => Pretty Time Source 
(Pretty Name, Pretty Time) => Pretty VarAddr Source 
(Pretty Exp, Pretty Time) => Pretty ExpAddr Source 
(Pretty Exp, Pretty Name, Pretty Env, Pretty Moment) => Pretty Closure Source 
(Pretty , Pretty VarAddr, Pretty Closure, Pretty Op, Pretty AtomVal) => Pretty AtomVal Source 
(Pretty Exp, Pretty Env, Pretty Moment, Pretty Name, Pretty Op, Pretty AtomVal) => Pretty Frame Source 
(Pretty , Pretty Closure, Pretty (Frame, Maybe ExpAddr)) => Pretty ConcreteVal Source 
(Pretty , Pretty Closure, Pretty (Frame, Maybe ExpAddr)) => Pretty AbstractVal Source 
Pretty n => Functorial * Pretty (PreExp n) Source 
(Pretty t0, Pretty LocRange, Pretty Doc) => Pretty (SourceToken t) Source 
(Pretty (Stream (SourceToken t0)), Pretty Loc) => Pretty (SourceInput t) Source 
(Pretty (SourceInput t0), Pretty ((⇰) (AddBot LocRange, Doc) SourceErrorInfo)) => Pretty (SourceError t) Source 
Pretty t => Pretty (SourceErrorMaybe t) Source 
Pretty (SourceContext t) Source 
(Pretty 𝔹, Pretty (SourceErrorMaybe t0)) => Pretty (ParserOut t) Source 
(Pretty (SourceInput t0), Pretty (SourceContextPrefix * t0)) => Pretty (ParserState t) Source 
(Pretty Env, Pretty (Maybe ExpAddr), Pretty Time, Pretty (Store val0), Pretty (KStore val0)) => Pretty (LamIfState val) Source 
(Pretty (Store val0), Pretty (KStore val0)) => Pretty (LamIfStores val) Source 
Pretty (SourceContextPrefix k t) Source 
(Pretty [Format], Pretty ([𝕊], 𝕊), Pretty , Pretty 𝔹) => Pretty (ParserEnv k t) Source 
Pretty (ς0 (𝒫ᵇ a0)) => Pretty (NondetJoinΠ ς a) Source 
(Pretty , Pretty n0, Pretty e0) => Pretty (PreAtom n e) Source 
(Pretty (PreAtom n0 e0), Pretty e0, Pretty n0, Pretty Op) => Pretty (PreExp n e) Source 
(Pretty Env, Pretty (Maybe ExpAddr), Pretty Time) => Pretty (LamIfContext k val) Source 
(Pretty val, Pretty a) => Pretty (PathSensitiveΣ val a) Source 
(Pretty val, Pretty a) => Pretty (FlowInsensitiveΣ val a) Source 
(Pretty val, Pretty a) => Pretty (FlowSensitiveΣ val a) Source 
Pretty (ς0 (a0, s0)) => Pretty (StateΠ s ς a) Source 
Pretty (ς0 (a0, s0)) => Pretty (PolyStateΠ s ς a) Source 
Pretty (ς0 ((⇰♭⊔) a0 s0)) => Pretty (FlowJoinΠ s ς a) Source 

ppUT :: -> Color -> Doc -> Doc Source

ppInf :: -> Doc -> Doc -> Doc -> Doc Source

ppInfl :: -> Doc -> Doc -> Doc -> Doc Source

ppInfr :: -> Doc -> Doc -> Doc -> Doc Source

ppPre :: -> Doc -> Doc -> Doc Source

ppPost :: -> Doc -> Doc -> Doc Source

ppApp :: Doc -> [Doc] -> Doc Source

ppRecord :: 𝕊 -> [(Doc, Doc)] -> Doc Source

ppString :: Pretty a => a -> 𝕊 Source