press-0.1.2: Text template library targeted at the web / HTML generationSource codeContentsIndex
Text.Press.Types
Documentation
data RenderState Source
Constructors
RenderState
renderStateParser :: Parser
renderStateTemplate :: Template
renderStateValues :: [JSValue]
data PressError Source
Constructors
PressError String
ParseError ParseError
RenderError String
show/hide Instances
type RenderT a = WriterT [String] (StateT RenderState (ErrorT PressError IO)) aSource
type RenderT_ = RenderT ()Source
getRenderState :: RenderT RenderStateSource
setRenderState :: RenderState -> RenderT ()Source
data TagFunc Source
Constructors
TagFunc RenderT_
show/hide Instances
data Node Source
Constructors
Var String
Tag TagName TagFunc
Text String
show/hide Instances
type TemplatePath = StringSource
data Template Source
Constructors
Template
tmplExtends :: Maybe TemplatePath
tmplBlocks :: Map String [Node]
tmplNodes :: [Node]
tmplFilename :: String
show/hide Instances
type TagName = StringSource
type TemplateParser a = Parsec [(Token, SourcePos)] ParserState aSource
type NodeParser = TemplateParser (Maybe Node)Source
data TagType Source
Constructors
TagType (TagName -> String -> NodeParser)
show/hide Instances
data Expr Source
Constructors
ExprStr String
ExprVar String
ExprNum Double
show/hide Instances
type ParserState = (Parser, Template)Source
data Token Source
Constructors
PText String
PTag TagName String
PVar String
show/hide Instances
data Parser Source
Constructors
Parser
parserTagTypes :: Map TagName TagType
parserSearchPaths :: [String]
parserTemplateCache :: Map TemplatePath Template
show/hide Instances
class Render a whereSource
Methods
render :: a -> RenderT_Source
show/hide Instances
Produced by Haddock version 2.6.1