hxt-7.3: A collection of tools for processing XML with Haskell.ContentsIndex
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 Control.Arrow
module Text.XML.HXT.Arrow.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)
mapTreeCtx :: Tree t => (c -> a -> (c, b)) -> c -> t a -> t b
filterTreeCtx :: Tree t => (c -> a -> (c, Bool)) -> c -> t a -> Maybe (t a)
zipTreeWith :: Tree t => (a -> b -> c) -> t a -> t b -> t c
zipTree :: Tree t => t a -> t b -> t (a, b)
unzipTree :: Functor t => t (a, b) -> (t a, t b)
showTrees :: [XmlTree] -> String
isElemType :: XmlNode n => QName -> n -> Bool
isAttrType :: XmlNode n => QName -> n -> Bool
isWhitespaceNode :: XmlNode n => n -> Bool
collectTextnodes :: [XmlTree] -> String
tryFetchAttribute :: XmlNode n => n -> QName -> Maybe String
fetchAttributeWDefault :: XmlNode n => n -> QName -> String -> String
fetchAttribute :: XmlNode n => n -> QName -> String
hasAttribute :: XmlNode n => n -> QName -> Bool
setAttribute :: XmlNode n => QName -> String -> n -> n
mkQName :: String -> String -> String -> QName
data ExName
Constructors
ExName String String
show/hide Instances
mkExName :: QName -> ExName
exLocal :: ExName -> String
exUri :: ExName -> String
parseExName :: UriMapping -> String -> ExName
type UriMapping = Map String String
getUriMap :: XmlNode n => n -> UriMapping
setUriMap :: XmlNode n => UriMapping -> n -> n
uriMap2Attrs :: UriMapping -> [XmlTree]
expandNSDecls :: XmlTree -> XmlTree
lookupPrefix :: UriMapping -> String -> String
isNsAttr :: XmlTree -> Bool
mkLiteralExpr :: String -> Expr
mkStringExpr :: Expr -> Expr
mkBoolExpr :: Expr -> Expr
mkTrueExpr :: Expr
concatExpr :: [Expr] -> Expr
splitExpr :: Expr -> [Expr]
unionExpr :: [Expr] -> Expr
splitMatchByPrio :: Expr -> [(Float, Expr)]
computePriority :: Expr -> Float
computeNTestPriority :: NodeTest -> Float
isMatchExpr :: Expr -> Bool
fromJustErr :: String -> Maybe a -> a
readWDefault :: Read a => a -> String -> a
Produced by Haddock version 0.8