ltext-0.1.3: Parameterized file evaluator

Safe HaskellNone
LanguageHaskell2010

LText.Expr

Contents

Synopsis

Documentation

data Expr Source #

Instances
Eq Expr Source # 
Instance details

Defined in LText.Expr

Methods

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

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

Show Expr Source # 
Instance details

Defined in LText.Expr

Methods

showsPrec :: Int -> Expr -> ShowS #

show :: Expr -> String #

showList :: [Expr] -> ShowS #

Arbitrary Expr Source #

Only considers Abs, App and Var

Instance details

Defined in LText.Expr

Methods

arbitrary :: Gen Expr #

shrink :: Expr -> [Expr] #

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

TODO: pretty print exceptions

data ScopeUse Source #

Constructors

Fresh 
Stale Expr 
Instances
Eq ScopeUse Source # 
Instance details

Defined in LText.Expr

Show ScopeUse Source # 
Instance details

Defined in LText.Expr

data ParseState Source #

Constructors

InsideLambda

..->

Scope ScopeUse

(..)

Instances
Eq ParseState Source # 
Instance details

Defined in LText.Expr

Show ParseState Source # 
Instance details

Defined in LText.Expr

data ParseError Source #

Instances
Eq ParseError Source # 
Instance details

Defined in LText.Expr

Show ParseError Source # 
Instance details

Defined in LText.Expr

Generic ParseError Source # 
Instance details

Defined in LText.Expr

Associated Types

type Rep ParseError :: Type -> Type #

Exception 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
Eq Lexeme Source # 
Instance details

Defined in LText.Expr

Methods

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

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

Show Lexeme Source # 
Instance details

Defined in LText.Expr

lex :: Parser [Lexeme] Source #

Expects to be wrapped in parens