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

Version : $Id: Common.hs,v 1.5 20070502 06:41:05 hxml Exp $

Common imports and functions for HXSLT

Documentation
module Text.XML.HXT.DOM.XmlNode
module Text.XML.HXT.DOM.XmlKeywords
module Text.XML.HXT.DOM.TypeDefs
module Text.XML.HXT.DOM.FormatXmlTree
module Text.XML.HXT.XPath.XPathDataTypes
module Text.XML.HXT.XPath.XPathParser
module Text.XML.HXT.XPath.XPathEval
module Text.XML.HXT.XPath.XPathFct
module Text.XML.HXT.XPath.XPathToString
module Data.NavTree
module Data.Tree.Class
filterTree :: Tree t => (a -> Bool) -> t a -> Maybe (t a)Source
mapTreeCtx :: Tree t => (c -> a -> (c, b)) -> c -> t a -> t bSource
filterTreeCtx :: Tree t => (c -> a -> (c, Bool)) -> c -> t a -> Maybe (t a)Source
zipTreeWith :: Tree t => (a -> b -> c) -> t a -> t b -> t cSource
zipTree :: Tree t => t a -> t b -> t (a, b)Source
unzipTree :: Functor t => t (a, b) -> (t a, t b)Source
showTrees :: [XmlTree] -> StringSource
isElemType :: XmlNode n => QName -> n -> BoolSource
isAttrType :: XmlNode n => QName -> n -> BoolSource
isWhitespaceNode :: XmlNode n => n -> BoolSource
collectTextnodes :: [XmlTree] -> StringSource
tryFetchAttribute :: XmlNode n => n -> QName -> Maybe StringSource
fetchAttributeWDefault :: XmlNode n => n -> QName -> String -> StringSource
fetchAttribute :: XmlNode n => n -> QName -> StringSource
hasAttribute :: XmlNode n => n -> QName -> BoolSource
setAttribute :: XmlNode n => QName -> String -> n -> nSource
data ExName Source
Constructors
ExName String String
show/hide Instances
Eq ExName
Ord ExName
Show ExName
mkExName :: QName -> ExNameSource
exLocal :: ExName -> StringSource
exUri :: ExName -> StringSource
parseExName :: UriMapping -> String -> ExNameSource
type UriMapping = Map String StringSource
getUriMap :: XmlNode n => n -> UriMappingSource
setUriMap :: XmlNode n => UriMapping -> n -> nSource
uriMap2Attrs :: UriMapping -> [XmlTree]Source
expandNSDecls :: XmlTree -> XmlTreeSource
lookupPrefix :: UriMapping -> String -> StringSource
isNsAttr :: XmlTree -> BoolSource
mkLiteralExpr :: String -> ExprSource
mkStringExpr :: Expr -> ExprSource
mkBoolExpr :: Expr -> ExprSource
mkTrueExpr :: ExprSource
concatExpr :: [Expr] -> ExprSource
splitExpr :: Expr -> [Expr]Source
unionExpr :: [Expr] -> ExprSource
splitMatchByPrio :: Expr -> [(Float, Expr)]Source
computePriority :: Expr -> FloatSource
computeNTestPriority :: NodeTest -> FloatSource
isMatchExpr :: Expr -> BoolSource
fromJustErr :: String -> Maybe a -> aSource
readWDefault :: Read a => a -> String -> aSource
Produced by Haddock version 0.8