| Portability | portable | 
|---|---|
| Stability | experimental | 
| Maintainer | Uwe Schmidt (uwe@fh-wedel.de) | 
| Safe Haskell | None | 
Text.XML.HXT.DTDValidation.TypeDefs
Description
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.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 -> StringSource
dtd_default :: Attributes -> StringSource
dtd_modifier :: Attributes -> StringSource
dtd_kind :: Attributes -> StringSource
dtd_type :: Attributes -> StringSource
dtd_value :: Attributes -> StringSource
isUnparsedEntity :: ArrowDTD a => a XmlTree XmlTreeSource
hasDTDAttrValue :: ArrowDTD a => String -> (String -> Bool) -> a XmlTree XmlTreeSource
isRequiredAttrKind :: ArrowDTD a => a XmlTree XmlTreeSource
isDefaultAttrKind :: ArrowDTD a => a XmlTree XmlTreeSource
isFixedAttrKind :: ArrowDTD a => a XmlTree XmlTreeSource
isMixedContentElement :: ArrowDTD a => a XmlTree XmlTreeSource
isEmptyElement :: ArrowDTD a => a XmlTree XmlTreeSource
isEnumAttrType :: ArrowDTD a => a XmlTree XmlTreeSource
isIdAttrType :: ArrowDTD a => a XmlTree XmlTreeSource
isIdRefAttrType :: ArrowDTD a => a XmlTree XmlTreeSource
isNotationAttrType :: ArrowDTD a => a XmlTree XmlTreeSource
isAttlistOfElement :: ArrowDTD a => String -> a XmlTree XmlTreeSource
valueOfDTD :: String -> XmlTree -> StringSource
isDTDDoctypeNode :: XmlTree -> BoolSource
isDTDElementNode :: XmlTree -> BoolSource
isDTDAttlistNode :: XmlTree -> BoolSource
isDTDContentNode :: XmlTree -> BoolSource
isDTDNameNode :: XmlTree -> BoolSource
isElemNode :: XmlTree -> BoolSource
nameOfAttr :: XmlTree -> StringSource
nameOfElem :: XmlTree -> StringSource
($$) :: XmlArrow -> XmlTrees -> XmlTreesSource
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.ArrowList
module Control.Arrow.ArrowIf
module Control.Arrow.ArrowState
module Control.Arrow.ArrowTree
module Control.Arrow.ListArrow
module Control.Arrow.StateListArrow