template-toolkit-0.1.1.0: Template Toolkit implementation for Haskell

Safe HaskellSafe
LanguageHaskell2010

Text.TemplateToolkitAST

Documentation

type StmtId = (Int, Int, Int) Source #

data IString Source #

Constructors

IString Text 
IVar Var 
Instances
Show IString Source # 
Instance details

Defined in Text.TemplateToolkitAST

Generic IString Source # 
Instance details

Defined in Text.TemplateToolkitAST

Associated Types

type Rep IString :: Type -> Type #

Methods

from :: IString -> Rep IString x #

to :: Rep IString x -> IString #

Binary IString Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

put :: IString -> Put #

get :: Get IString #

putList :: [IString] -> Put #

type Rep IString Source # 
Instance details

Defined in Text.TemplateToolkitAST

type Rep IString = D1 (MetaData "IString" "Text.TemplateToolkitAST" "template-toolkit-0.1.1.0-B7i8p7wEmSL9kCkTZXDz11" False) (C1 (MetaCons "IString" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Text)) :+: C1 (MetaCons "IVar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Var)))

data Val Source #

Instances
Eq Val Source # 
Instance details

Defined in Text.TemplateToolkit

Methods

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

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

Fractional Val Source # 
Instance details

Defined in Text.TemplateToolkit

Methods

(/) :: Val -> Val -> Val #

recip :: Val -> Val #

fromRational :: Rational -> Val #

Num Val Source # 
Instance details

Defined in Text.TemplateToolkit

Methods

(+) :: Val -> Val -> Val #

(-) :: Val -> Val -> Val #

(*) :: Val -> Val -> Val #

negate :: Val -> Val #

abs :: Val -> Val #

signum :: Val -> Val #

fromInteger :: Integer -> Val #

Ord Val Source # 
Instance details

Defined in Text.TemplateToolkit

Methods

compare :: Val -> Val -> Ordering #

(<) :: Val -> Val -> Bool #

(<=) :: Val -> Val -> Bool #

(>) :: Val -> Val -> Bool #

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

max :: Val -> Val -> Val #

min :: Val -> Val -> Val #

Show Val Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

showsPrec :: Int -> Val -> ShowS #

show :: Val -> String #

showList :: [Val] -> ShowS #

Generic Val Source # 
Instance details

Defined in Text.TemplateToolkitAST

Associated Types

type Rep Val :: Type -> Type #

Methods

from :: Val -> Rep Val x #

to :: Rep Val x -> Val #

Binary Val Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

put :: Val -> Put #

get :: Get Val #

putList :: [Val] -> Put #

type Rep Val Source # 
Instance details

Defined in Text.TemplateToolkitAST

type Rep Val

data VarNode Source #

data Var Source #

Constructors

Var [VarNode] 
Instances
Show Var Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

showsPrec :: Int -> Var -> ShowS #

show :: Var -> String #

showList :: [Var] -> ShowS #

Generic Var Source # 
Instance details

Defined in Text.TemplateToolkitAST

Associated Types

type Rep Var :: Type -> Type #

Methods

from :: Var -> Rep Var x #

to :: Rep Var x -> Var #

Binary Var Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

put :: Var -> Put #

get :: Get Var #

putList :: [Var] -> Put #

type Rep Var Source # 
Instance details

Defined in Text.TemplateToolkitAST

type Rep Var = D1 (MetaData "Var" "Text.TemplateToolkitAST" "template-toolkit-0.1.1.0-B7i8p7wEmSL9kCkTZXDz11" False) (C1 (MetaCons "Var" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [VarNode])))

data Expr Source #

Instances
Show Expr Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

showsPrec :: Int -> Expr -> ShowS #

show :: Expr -> String #

showList :: [Expr] -> ShowS #

Generic Expr Source # 
Instance details

Defined in Text.TemplateToolkitAST

Associated Types

type Rep Expr :: Type -> Type #

Methods

from :: Expr -> Rep Expr x #

to :: Rep Expr x -> Expr #

Binary Expr Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

put :: Expr -> Put #

get :: Get Expr #

putList :: [Expr] -> Put #

type Rep Expr Source # 
Instance details

Defined in Text.TemplateToolkitAST

type Rep Expr = D1 (MetaData "Expr" "Text.TemplateToolkitAST" "template-toolkit-0.1.1.0-B7i8p7wEmSL9kCkTZXDz11" False) ((C1 (MetaCons "EVal" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Val)) :+: (C1 (MetaCons "EVar" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Var)) :+: C1 (MetaCons "EAssign" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Var) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Expr)))) :+: (C1 (MetaCons "EUnOp" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 UnOp) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Expr)) :+: (C1 (MetaCons "EBinOp" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 BinOp) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Expr) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Expr))) :+: C1 (MetaCons "ETerOp" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Expr) :*: (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Expr) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Expr))))))

data UnOp Source #

Constructors

Pos 
Neg 
Not 
Instances
Show UnOp Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

showsPrec :: Int -> UnOp -> ShowS #

show :: UnOp -> String #

showList :: [UnOp] -> ShowS #

Generic UnOp Source # 
Instance details

Defined in Text.TemplateToolkitAST

Associated Types

type Rep UnOp :: Type -> Type #

Methods

from :: UnOp -> Rep UnOp x #

to :: Rep UnOp x -> UnOp #

Binary UnOp Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

put :: UnOp -> Put #

get :: Get UnOp #

putList :: [UnOp] -> Put #

type Rep UnOp Source # 
Instance details

Defined in Text.TemplateToolkitAST

type Rep UnOp = D1 (MetaData "UnOp" "Text.TemplateToolkitAST" "template-toolkit-0.1.1.0-B7i8p7wEmSL9kCkTZXDz11" False) (C1 (MetaCons "Pos" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Neg" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Not" PrefixI False) (U1 :: Type -> Type)))

data BinOp Source #

Constructors

Add 
Sub 
Mul 
Div 
Mod 
Con 
Gt 
Ge 
Lt 
Le 
Eq 
Ne 
And 
Or 
Instances
Show BinOp Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

showsPrec :: Int -> BinOp -> ShowS #

show :: BinOp -> String #

showList :: [BinOp] -> ShowS #

Generic BinOp Source # 
Instance details

Defined in Text.TemplateToolkitAST

Associated Types

type Rep BinOp :: Type -> Type #

Methods

from :: BinOp -> Rep BinOp x #

to :: Rep BinOp x -> BinOp #

Binary BinOp Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

put :: BinOp -> Put #

get :: Get BinOp #

putList :: [BinOp] -> Put #

type Rep BinOp Source # 
Instance details

Defined in Text.TemplateToolkitAST

type Rep BinOp = D1 (MetaData "BinOp" "Text.TemplateToolkitAST" "template-toolkit-0.1.1.0-B7i8p7wEmSL9kCkTZXDz11" False) (((C1 (MetaCons "Add" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Sub" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Mul" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Div" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Mod" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Con" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Gt" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "Ge" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Lt" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Le" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Eq" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Ne" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "And" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Or" PrefixI False) (U1 :: Type -> Type)))))

data Else Source #

Constructors

Else Stmt 
Elsif Expr Stmt (Maybe Else) 
Instances
Show Else Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

showsPrec :: Int -> Else -> ShowS #

show :: Else -> String #

showList :: [Else] -> ShowS #

Generic Else Source # 
Instance details

Defined in Text.TemplateToolkitAST

Associated Types

type Rep Else :: Type -> Type #

Methods

from :: Else -> Rep Else x #

to :: Rep Else x -> Else #

Binary Else Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

put :: Else -> Put #

get :: Get Else #

putList :: [Else] -> Put #

type Rep Else Source # 
Instance details

Defined in Text.TemplateToolkitAST

data Stmt Source #

Constructors

Seq 

Fields

SComment 

Fields

SText 

Fields

SIf 

Fields

SWhile 

Fields

SForeach 

Fields

SNext 

Fields

SLast 

Fields

SBlock 

Fields

SProcess 

Fields

SWrapper 

Fields

SAssign 

Fields

SExpr 

Fields

SFilter 

Fields

Instances
Show Stmt Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

showsPrec :: Int -> Stmt -> ShowS #

show :: Stmt -> String #

showList :: [Stmt] -> ShowS #

Generic Stmt Source # 
Instance details

Defined in Text.TemplateToolkitAST

Associated Types

type Rep Stmt :: Type -> Type #

Methods

from :: Stmt -> Rep Stmt x #

to :: Rep Stmt x -> Stmt #

Binary Stmt Source # 
Instance details

Defined in Text.TemplateToolkitAST

Methods

put :: Stmt -> Put #

get :: Get Stmt #

putList :: [Stmt] -> Put #

type Rep Stmt Source # 
Instance details

Defined in Text.TemplateToolkitAST

type Rep Stmt