Copyright | Copyright (C) 2008 Uwe Schmidt |
---|---|
License | MIT |
Maintainer | Uwe Schmidt (uwe@fh-wedel.de) |
Stability | experimental |
Portability | portable |
Safe Haskell | None |
Language | Haskell98 |
This module provides all datatypes for DTD validation
- type XmlArrow = LA XmlTree XmlTree
- type XmlArrowS = LA XmlTree XmlTrees
- dtd_name :: Attributes -> String
- dtd_default :: Attributes -> String
- dtd_modifier :: Attributes -> String
- dtd_kind :: Attributes -> String
- dtd_type :: Attributes -> String
- dtd_value :: Attributes -> String
- isUnparsedEntity :: ArrowDTD a => a XmlTree XmlTree
- hasDTDAttrValue :: ArrowDTD a => String -> (String -> Bool) -> a XmlTree XmlTree
- isRequiredAttrKind :: ArrowDTD a => a XmlTree XmlTree
- isDefaultAttrKind :: ArrowDTD a => a XmlTree XmlTree
- isFixedAttrKind :: ArrowDTD a => a XmlTree XmlTree
- isMixedContentElement :: ArrowDTD a => a XmlTree XmlTree
- isEmptyElement :: ArrowDTD a => a XmlTree XmlTree
- isEnumAttrType :: ArrowDTD a => a XmlTree XmlTree
- isIdAttrType :: ArrowDTD a => a XmlTree XmlTree
- isIdRefAttrType :: ArrowDTD a => a XmlTree XmlTree
- isNotationAttrType :: ArrowDTD a => a XmlTree XmlTree
- isAttlistOfElement :: ArrowDTD a => String -> a XmlTree XmlTree
- valueOfDTD :: String -> XmlTree -> String
- valueOf :: String -> XmlTree -> String
- getDTDAttributes :: XmlTree -> Attributes
- isDTDDoctypeNode :: XmlTree -> Bool
- isDTDElementNode :: XmlTree -> Bool
- isDTDAttlistNode :: XmlTree -> Bool
- isDTDContentNode :: XmlTree -> Bool
- isDTDNameNode :: XmlTree -> Bool
- isElemNode :: XmlTree -> Bool
- nameOfAttr :: XmlTree -> String
- nameOfElem :: XmlTree -> String
- ($$) :: XmlArrow -> XmlTrees -> XmlTrees
- msgToErr :: (String -> String) -> LA String XmlTree
- module Text.XML.HXT.DOM.Interface
- module Text.XML.HXT.Arrow.XmlArrow
- module Control.Arrow
- module Control.Arrow.ArrowList
- module Control.Arrow.ArrowIf
- module Control.Arrow.ArrowState
- module Control.Arrow.ArrowTree
- module Control.Arrow.ListArrow
- module Control.Arrow.StateListArrow
Documentation
dtd_name :: Attributes -> String Source
dtd_default :: Attributes -> String Source
dtd_modifier :: Attributes -> String Source
dtd_kind :: Attributes -> String Source
dtd_type :: Attributes -> String Source
dtd_value :: Attributes -> String Source
isUnparsedEntity :: ArrowDTD a => a XmlTree XmlTree Source
isRequiredAttrKind :: ArrowDTD a => a XmlTree XmlTree Source
isDefaultAttrKind :: ArrowDTD a => a XmlTree XmlTree Source
isFixedAttrKind :: ArrowDTD a => a XmlTree XmlTree Source
isMixedContentElement :: ArrowDTD a => a XmlTree XmlTree Source
isEmptyElement :: ArrowDTD a => a XmlTree XmlTree Source
isEnumAttrType :: ArrowDTD a => a XmlTree XmlTree Source
isIdAttrType :: ArrowDTD a => a XmlTree XmlTree Source
isIdRefAttrType :: ArrowDTD a => a XmlTree XmlTree Source
isNotationAttrType :: ArrowDTD a => a XmlTree XmlTree Source
valueOfDTD :: String -> XmlTree -> String Source
isDTDDoctypeNode :: XmlTree -> Bool Source
isDTDElementNode :: XmlTree -> Bool Source
isDTDAttlistNode :: XmlTree -> Bool Source
isDTDContentNode :: XmlTree -> Bool Source
isDTDNameNode :: XmlTree -> Bool Source
isElemNode :: XmlTree -> Bool Source
nameOfAttr :: XmlTree -> String Source
nameOfElem :: XmlTree -> String Source
($$) :: XmlArrow -> XmlTrees -> XmlTrees infixr 0 Source
infix operator for applying an arrow to a list of trees
1.parameter f : the arrow
- 2.parameter ts : the list of trees
- returns : list of results
module Text.XML.HXT.DOM.Interface
module Text.XML.HXT.Arrow.XmlArrow
module Control.Arrow
module Control.Arrow.ArrowList
module Control.Arrow.ArrowIf
module Control.Arrow.ArrowState
module Control.Arrow.ArrowTree
module Control.Arrow.ListArrow
module Control.Arrow.StateListArrow