hxt-8.2.0: A collection of tools for processing XML with Haskell.Source codeContentsIndex
Text.XML.HXT.XSLT.CompiledStylesheet
Portabilityportable
Stabilityexperimental
MaintainerUwe Schmidt (uwe\@fh-wedel.de)
Description

Version : $Id: CompiledStylesheet.hs,v 1.3 20070502 06:41:05 hxml Exp $

Types for compiled stylesheets

Documentation
data CompiledStylesheet Source
Constructors
CompStylesheet [MatchRule] (Map ExName NamedRule) (Map ExName Variable) (Map ExName [AttributeSet]) [Strips] NSAliasing
show/hide Instances
getMatchRules :: CompiledStylesheet -> [MatchRule]Source
getNamedRules :: CompiledStylesheet -> Map ExName NamedRuleSource
getVariables :: CompiledStylesheet -> Map ExName VariableSource
getAttributeSets :: CompiledStylesheet -> Map ExName [AttributeSet]Source
getStrips :: CompiledStylesheet -> [Strips]Source
getAliases :: CompiledStylesheet -> NSAliasingSource
data MatchRule Source
Constructors
MatRule MatchExpr Float (Maybe ExName) [MatchRule] [Variable] Template
show/hide Instances
getRulePrio :: MatchRule -> FloatSource
getRuleMode :: MatchRule -> Maybe ExNameSource
getRuleImports :: MatchRule -> [MatchRule]Source
data NamedRule Source
Constructors
NamRule ExName [Variable] Template
show/hide Instances
getRuleName :: NamedRule -> ExNameSource
data Variable Source
Constructors
MkVar Bool ExName (Either Expr Template)
show/hide Instances
getVarName :: Variable -> ExNameSource
isParam :: Variable -> BoolSource
newtype UsedAttribSets Source
Constructors
UsedAttribSets [ExName]
show/hide Instances
data AttributeSet Source
Constructors
AttribSet ExName UsedAttribSets Template
show/hide Instances
type NTest = ExNameSource
parseNTest :: UriMapping -> String -> NTestSource
type Strips = Map NTest BoolSource
lookupStrip :: ExName -> [Strips] -> BoolSource
lookupStrip1 :: ExName -> Strips -> Maybe BoolSource
feedSpaces :: Bool -> [NTest] -> Strips -> StripsSource
feedPreserves :: [NTest] -> Strips -> StripsSource
feedStrips :: [NTest] -> Strips -> StripsSource
stripDocument :: [Strips] -> XmlTree -> XmlTreeSource
stripStylesheet :: XmlTree -> XmlTreeSource
stripSpaces :: (Bool -> XNode -> Bool) -> Bool -> XmlTree -> XmlTreeSource
type NSAliasing = Map String StringSource
addAlias :: UriMapping -> String -> String -> NSAliasing -> NSAliasingSource
lookupAlias :: NSAliasing -> QName -> QNameSource
aliasUriMapping :: NSAliasing -> UriMapping -> UriMappingSource
data Template Source
Constructors
TemplComposite [Template]
TemplForEach SelectExpr [SortKey] Template
TemplChoose [When]
TemplMessage Bool Template
TemplElement ComputedQName UriMapping UsedAttribSets Template
TemplAttribute ComputedQName Template
TemplText String
TemplValueOf StringExpr
TemplComment Template
TemplProcInstr StringExpr Template
TemplApply (Maybe SelectExpr) (Maybe ExName) (Map ExName Variable) [SortKey]
TemplApplyImports
TemplVariable Variable
TemplCall ExName (Map ExName Variable)
TemplCopy UsedAttribSets Template
TemplCopyOf Expr
show/hide Instances
data SortKey Source
Constructors
SortK StringExpr StringExpr StringExpr
show/hide Instances
data When Source
Constructors
WhenPart TestExpr Template
show/hide Instances
data ComputedQName Source
Constructors
LiteralQName QName
CompQName UriMapping StringExpr StringExpr
show/hide Instances
newtype SelectExpr Source
Constructors
SelectExpr Expr
show/hide Instances
newtype TestExpr Source
Constructors
TestExpr Expr
show/hide Instances
newtype StringExpr Source
Constructors
StringExpr Expr
show/hide Instances
newtype MatchExpr Source
Constructors
MatchExpr Expr
show/hide Instances
Produced by Haddock version 2.4.2