ltext-0.1.5: Parameterized file evaluator
Safe HaskellSafe-Inferred
LanguageHaskell2010

LText.Expr

Contents

Synopsis

Documentation

data Expr Source #

Instances

Instances details
Arbitrary Expr Source #

Only considers Abs, App and Var

Instance details

Defined in LText.Expr

Methods

arbitrary :: Gen Expr #

shrink :: Expr -> [Expr] #

Show Expr Source # 
Instance details

Defined in LText.Expr

Methods

showsPrec :: Int -> Expr -> ShowS #

show :: Expr -> String #

showList :: [Expr] -> ShowS #

Eq Expr Source # 
Instance details

Defined in LText.Expr

Methods

(==) :: Expr -> Expr -> Bool #

(/=) :: Expr -> Expr -> Bool #

ppExpr :: MonadPrettyPrint m => Expr -> m String Source #

TODO: pretty print exceptions

data ScopeUse Source #

Constructors

Fresh 
Stale Expr 

Instances

Instances details
Show ScopeUse Source # 
Instance details

Defined in LText.Expr

Eq ScopeUse Source # 
Instance details

Defined in LText.Expr

data ParseState Source #

Constructors

InsideLambda

..->

Scope ScopeUse

(..)

Instances

Instances details
Show ParseState Source # 
Instance details

Defined in LText.Expr

Eq ParseState Source # 
Instance details

Defined in LText.Expr

data ParseError Source #

Instances

Instances details
Exception ParseError Source # 
Instance details

Defined in LText.Expr

Generic ParseError Source # 
Instance details

Defined in LText.Expr

Associated Types

type Rep ParseError :: Type -> Type #

Show ParseError Source # 
Instance details

Defined in LText.Expr

Eq ParseError Source # 
Instance details

Defined in LText.Expr

type Rep ParseError Source # 
Instance details

Defined in LText.Expr

Lexing

data Lexeme Source #

Constructors

Lambda 
Arrow 
Ident String 
Bracketed 

Fields

Instances

Instances details
Show Lexeme Source # 
Instance details

Defined in LText.Expr

Eq Lexeme Source # 
Instance details

Defined in LText.Expr

Methods

(==) :: Lexeme -> Lexeme -> Bool #

(/=) :: Lexeme -> Lexeme -> Bool #

lex :: Parser [Lexeme] Source #

Expects to be wrapped in parens