xml-conduit-1.9.1.4: Pure-Haskell utilities for dealing with XML with the conduit package.
Safe HaskellNone
LanguageHaskell2010

Text.XML

Description

DOM-based parsing and rendering.

This module requires that all entities be resolved at parsing. If you need to interact with unresolved entities, please use Text.XML.Unresolved. This is the recommended module for most uses cases.

While many of the datatypes in this module are simply re-exported from Data.XML.Types, Document, Node and Element are all redefined here to disallow the possibility of unresolved entities. Conversion functions are provided to switch between the two sets of datatypes.

For simpler, bidirectional traversal of the DOM tree, see the Text.XML.Cursor module.

Synopsis

Data types

data Document Source #

Instances

Instances details
ToMarkup Document Source # 
Instance details

Defined in Text.XML

Methods

toMarkup :: Document -> Markup

preEscapedToMarkup :: Document -> Markup

NFData Document Source # 
Instance details

Defined in Text.XML

Methods

rnf :: Document -> ()

Data Document Source # 
Instance details

Defined in Text.XML

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Document -> c Document

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Document

toConstr :: Document -> Constr

dataTypeOf :: Document -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Document)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Document)

gmapT :: (forall b. Data b => b -> b) -> Document -> Document

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Document -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Document -> r

gmapQ :: (forall d. Data d => d -> u) -> Document -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Document -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Document -> m Document

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Document -> m Document

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Document -> m Document

Show Document Source # 
Instance details

Defined in Text.XML

Methods

showsPrec :: Int -> Document -> ShowS

show :: Document -> String

showList :: [Document] -> ShowS

Eq Document Source # 
Instance details

Defined in Text.XML

Methods

(==) :: Document -> Document -> Bool

(/=) :: Document -> Document -> Bool

data Prologue #

Instances

Instances details
NFData Prologue 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Prologue -> ()

Data Prologue 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Prologue -> c Prologue

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Prologue

toConstr :: Prologue -> Constr

dataTypeOf :: Prologue -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Prologue)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Prologue)

gmapT :: (forall b. Data b => b -> b) -> Prologue -> Prologue

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Prologue -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Prologue -> r

gmapQ :: (forall d. Data d => d -> u) -> Prologue -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Prologue -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Prologue -> m Prologue

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Prologue -> m Prologue

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Prologue -> m Prologue

Generic Prologue 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Prologue 
Instance details

Defined in Data.XML.Types

type Rep Prologue = D1 ('MetaData "Prologue" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "Prologue" 'PrefixI 'True) (S1 ('MetaSel ('Just "prologueBefore") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Miscellaneous]) :*: (S1 ('MetaSel ('Just "prologueDoctype") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Doctype)) :*: S1 ('MetaSel ('Just "prologueAfter") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Miscellaneous]))))

Methods

from :: Prologue -> Rep Prologue x

to :: Rep Prologue x -> Prologue

Show Prologue 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Prologue -> ShowS

show :: Prologue -> String

showList :: [Prologue] -> ShowS

Eq Prologue 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Prologue -> Prologue -> Bool

(/=) :: Prologue -> Prologue -> Bool

Ord Prologue 
Instance details

Defined in Data.XML.Types

Methods

compare :: Prologue -> Prologue -> Ordering

(<) :: Prologue -> Prologue -> Bool

(<=) :: Prologue -> Prologue -> Bool

(>) :: Prologue -> Prologue -> Bool

(>=) :: Prologue -> Prologue -> Bool

max :: Prologue -> Prologue -> Prologue

min :: Prologue -> Prologue -> Prologue

type Rep Prologue 
Instance details

Defined in Data.XML.Types

type Rep Prologue = D1 ('MetaData "Prologue" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "Prologue" 'PrefixI 'True) (S1 ('MetaSel ('Just "prologueBefore") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Miscellaneous]) :*: (S1 ('MetaSel ('Just "prologueDoctype") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Doctype)) :*: S1 ('MetaSel ('Just "prologueAfter") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Miscellaneous]))))

data Instruction #

Constructors

Instruction 

Fields

Instances

Instances details
NFData Instruction 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Instruction -> ()

Data Instruction 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Instruction -> c Instruction

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Instruction

toConstr :: Instruction -> Constr

dataTypeOf :: Instruction -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Instruction)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Instruction)

gmapT :: (forall b. Data b => b -> b) -> Instruction -> Instruction

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Instruction -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Instruction -> r

gmapQ :: (forall d. Data d => d -> u) -> Instruction -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Instruction -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Instruction -> m Instruction

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Instruction -> m Instruction

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Instruction -> m Instruction

Generic Instruction 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Instruction 
Instance details

Defined in Data.XML.Types

type Rep Instruction = D1 ('MetaData "Instruction" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "Instruction" 'PrefixI 'True) (S1 ('MetaSel ('Just "instructionTarget") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "instructionData") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

Methods

from :: Instruction -> Rep Instruction x

to :: Rep Instruction x -> Instruction

Show Instruction 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Instruction -> ShowS

show :: Instruction -> String

showList :: [Instruction] -> ShowS

Eq Instruction 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Instruction -> Instruction -> Bool

(/=) :: Instruction -> Instruction -> Bool

Ord Instruction 
Instance details

Defined in Data.XML.Types

type Rep Instruction 
Instance details

Defined in Data.XML.Types

type Rep Instruction = D1 ('MetaData "Instruction" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "Instruction" 'PrefixI 'True) (S1 ('MetaSel ('Just "instructionTarget") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "instructionData") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Miscellaneous #

Instances

Instances details
NFData Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Miscellaneous -> ()

Data Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Miscellaneous -> c Miscellaneous

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Miscellaneous

toConstr :: Miscellaneous -> Constr

dataTypeOf :: Miscellaneous -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Miscellaneous)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Miscellaneous)

gmapT :: (forall b. Data b => b -> b) -> Miscellaneous -> Miscellaneous

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Miscellaneous -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Miscellaneous -> r

gmapQ :: (forall d. Data d => d -> u) -> Miscellaneous -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Miscellaneous -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Miscellaneous -> m Miscellaneous

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Miscellaneous -> m Miscellaneous

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Miscellaneous -> m Miscellaneous

Generic Miscellaneous 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Miscellaneous 
Instance details

Defined in Data.XML.Types

type Rep Miscellaneous = D1 ('MetaData "Miscellaneous" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "MiscInstruction" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Instruction)) :+: C1 ('MetaCons "MiscComment" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
Show Miscellaneous 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Miscellaneous -> ShowS

show :: Miscellaneous -> String

showList :: [Miscellaneous] -> ShowS

Eq Miscellaneous 
Instance details

Defined in Data.XML.Types

Ord Miscellaneous 
Instance details

Defined in Data.XML.Types

type Rep Miscellaneous 
Instance details

Defined in Data.XML.Types

type Rep Miscellaneous = D1 ('MetaData "Miscellaneous" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "MiscInstruction" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Instruction)) :+: C1 ('MetaCons "MiscComment" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Node Source #

Instances

Instances details
ToMarkup Node Source # 
Instance details

Defined in Text.XML

Methods

toMarkup :: Node -> Markup

preEscapedToMarkup :: Node -> Markup

NFData Node Source # 
Instance details

Defined in Text.XML

Methods

rnf :: Node -> ()

Data Node Source # 
Instance details

Defined in Text.XML

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Node -> c Node

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Node

toConstr :: Node -> Constr

dataTypeOf :: Node -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Node)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Node)

gmapT :: (forall b. Data b => b -> b) -> Node -> Node

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Node -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Node -> r

gmapQ :: (forall d. Data d => d -> u) -> Node -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Node -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Node -> m Node

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Node -> m Node

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Node -> m Node

Show Node Source # 
Instance details

Defined in Text.XML

Methods

showsPrec :: Int -> Node -> ShowS

show :: Node -> String

showList :: [Node] -> ShowS

Eq Node Source # 
Instance details

Defined in Text.XML

Methods

(==) :: Node -> Node -> Bool

(/=) :: Node -> Node -> Bool

Ord Node Source # 
Instance details

Defined in Text.XML

Methods

compare :: Node -> Node -> Ordering

(<) :: Node -> Node -> Bool

(<=) :: Node -> Node -> Bool

(>) :: Node -> Node -> Bool

(>=) :: Node -> Node -> Bool

max :: Node -> Node -> Node

min :: Node -> Node -> Node

data Element Source #

Constructors

Element 

Fields

Instances

Instances details
ToMarkup Element Source #

Note that the special element name {http:/www.snoyman.comxml2html}ie-cond with the single attribute cond is used to indicate an IE conditional comment.

Instance details

Defined in Text.XML

Methods

toMarkup :: Element -> Markup

preEscapedToMarkup :: Element -> Markup

NFData Element Source # 
Instance details

Defined in Text.XML

Methods

rnf :: Element -> ()

Data Element Source # 
Instance details

Defined in Text.XML

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Element -> c Element

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Element

toConstr :: Element -> Constr

dataTypeOf :: Element -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Element)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Element)

gmapT :: (forall b. Data b => b -> b) -> Element -> Element

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Element -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Element -> r

gmapQ :: (forall d. Data d => d -> u) -> Element -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Element -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Element -> m Element

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Element -> m Element

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Element -> m Element

Show Element Source # 
Instance details

Defined in Text.XML

Methods

showsPrec :: Int -> Element -> ShowS

show :: Element -> String

showList :: [Element] -> ShowS

Eq Element Source # 
Instance details

Defined in Text.XML

Methods

(==) :: Element -> Element -> Bool

(/=) :: Element -> Element -> Bool

Ord Element Source # 
Instance details

Defined in Text.XML

Methods

compare :: Element -> Element -> Ordering

(<) :: Element -> Element -> Bool

(<=) :: Element -> Element -> Bool

(>) :: Element -> Element -> Bool

(>=) :: Element -> Element -> Bool

max :: Element -> Element -> Element

min :: Element -> Element -> Element

data Name #

Constructors

Name 

Fields

Instances

Instances details
NFData Name 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Name -> ()

Data Name 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Name -> c Name

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Name

toConstr :: Name -> Constr

dataTypeOf :: Name -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Name)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Name)

gmapT :: (forall b. Data b => b -> b) -> Name -> Name

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Name -> r

gmapQ :: (forall d. Data d => d -> u) -> Name -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Name -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Name -> m Name

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Name -> m Name

IsString Name 
Instance details

Defined in Data.XML.Types

Methods

fromString :: String -> Name

Generic Name 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Name 
Instance details

Defined in Data.XML.Types

type Rep Name = D1 ('MetaData "Name" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "Name" 'PrefixI 'True) (S1 ('MetaSel ('Just "nameLocalName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "nameNamespace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "namePrefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))))

Methods

from :: Name -> Rep Name x

to :: Rep Name x -> Name

Show Name 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Name -> ShowS

show :: Name -> String

showList :: [Name] -> ShowS

Eq Name 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Name -> Name -> Bool

(/=) :: Name -> Name -> Bool

Ord Name 
Instance details

Defined in Data.XML.Types

Methods

compare :: Name -> Name -> Ordering

(<) :: Name -> Name -> Bool

(<=) :: Name -> Name -> Bool

(>) :: Name -> Name -> Bool

(>=) :: Name -> Name -> Bool

max :: Name -> Name -> Name

min :: Name -> Name -> Name

type Rep Name 
Instance details

Defined in Data.XML.Types

type Rep Name = D1 ('MetaData "Name" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "Name" 'PrefixI 'True) (S1 ('MetaSel ('Just "nameLocalName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: (S1 ('MetaSel ('Just "nameNamespace") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)) :*: S1 ('MetaSel ('Just "namePrefix") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Text)))))

data Doctype #

Constructors

Doctype 

Fields

Instances

Instances details
NFData Doctype 
Instance details

Defined in Data.XML.Types

Methods

rnf :: Doctype -> ()

Data Doctype 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Doctype -> c Doctype

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Doctype

toConstr :: Doctype -> Constr

dataTypeOf :: Doctype -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Doctype)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Doctype)

gmapT :: (forall b. Data b => b -> b) -> Doctype -> Doctype

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Doctype -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Doctype -> r

gmapQ :: (forall d. Data d => d -> u) -> Doctype -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> Doctype -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Doctype -> m Doctype

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Doctype -> m Doctype

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Doctype -> m Doctype

Generic Doctype 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep Doctype 
Instance details

Defined in Data.XML.Types

type Rep Doctype = D1 ('MetaData "Doctype" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "Doctype" 'PrefixI 'True) (S1 ('MetaSel ('Just "doctypeName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "doctypeID") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ExternalID))))

Methods

from :: Doctype -> Rep Doctype x

to :: Rep Doctype x -> Doctype

Show Doctype 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> Doctype -> ShowS

show :: Doctype -> String

showList :: [Doctype] -> ShowS

Eq Doctype 
Instance details

Defined in Data.XML.Types

Methods

(==) :: Doctype -> Doctype -> Bool

(/=) :: Doctype -> Doctype -> Bool

Ord Doctype 
Instance details

Defined in Data.XML.Types

Methods

compare :: Doctype -> Doctype -> Ordering

(<) :: Doctype -> Doctype -> Bool

(<=) :: Doctype -> Doctype -> Bool

(>) :: Doctype -> Doctype -> Bool

(>=) :: Doctype -> Doctype -> Bool

max :: Doctype -> Doctype -> Doctype

min :: Doctype -> Doctype -> Doctype

type Rep Doctype 
Instance details

Defined in Data.XML.Types

type Rep Doctype = D1 ('MetaData "Doctype" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "Doctype" 'PrefixI 'True) (S1 ('MetaSel ('Just "doctypeName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "doctypeID") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ExternalID))))

data ExternalID #

Constructors

SystemID Text 
PublicID Text Text 

Instances

Instances details
NFData ExternalID 
Instance details

Defined in Data.XML.Types

Methods

rnf :: ExternalID -> ()

Data ExternalID 
Instance details

Defined in Data.XML.Types

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExternalID -> c ExternalID

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExternalID

toConstr :: ExternalID -> Constr

dataTypeOf :: ExternalID -> DataType

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExternalID)

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExternalID)

gmapT :: (forall b. Data b => b -> b) -> ExternalID -> ExternalID

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExternalID -> r

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExternalID -> r

gmapQ :: (forall d. Data d => d -> u) -> ExternalID -> [u]

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExternalID -> u

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExternalID -> m ExternalID

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExternalID -> m ExternalID

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExternalID -> m ExternalID

Generic ExternalID 
Instance details

Defined in Data.XML.Types

Associated Types

type Rep ExternalID 
Instance details

Defined in Data.XML.Types

type Rep ExternalID = D1 ('MetaData "ExternalID" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "SystemID" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: C1 ('MetaCons "PublicID" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

Methods

from :: ExternalID -> Rep ExternalID x

to :: Rep ExternalID x -> ExternalID

Show ExternalID 
Instance details

Defined in Data.XML.Types

Methods

showsPrec :: Int -> ExternalID -> ShowS

show :: ExternalID -> String

showList :: [ExternalID] -> ShowS

Eq ExternalID 
Instance details

Defined in Data.XML.Types

Methods

(==) :: ExternalID -> ExternalID -> Bool

(/=) :: ExternalID -> ExternalID -> Bool

Ord ExternalID 
Instance details

Defined in Data.XML.Types

type Rep ExternalID 
Instance details

Defined in Data.XML.Types

type Rep ExternalID = D1 ('MetaData "ExternalID" "Data.XML.Types" "xml-types-0.3.8-JkkFvqNv8dT2JETmKHzkKZ" 'False) (C1 ('MetaCons "SystemID" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: C1 ('MetaCons "PublicID" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

Parsing

Files

readFile :: ParseSettings -> FilePath -> IO Document Source #

Bytes

parseLBS :: ParseSettings -> ByteString -> Either SomeException Document Source #

sinkDoc :: forall (m :: Type -> Type) o. MonadThrow m => ParseSettings -> ConduitT ByteString o m Document Source #

Text

parseText :: ParseSettings -> Text -> Either SomeException Document Source #

sinkTextDoc :: forall (m :: Type -> Type) o. MonadThrow m => ParseSettings -> ConduitT Text o m Document Source #

Other

fromEvents :: forall (m :: Type -> Type) o. MonadThrow m => ConduitT EventPos o m Document Source #

data UnresolvedEntityException Source #

Constructors

UnresolvedEntityException (Set Text) 

Instances

Instances details
Exception UnresolvedEntityException Source # 
Instance details

Defined in Text.XML

Show UnresolvedEntityException Source # 
Instance details

Defined in Text.XML

data XMLException Source #

Constructors

InvalidXMLFile FilePath SomeException 

Instances

Instances details
Exception XMLException Source # 
Instance details

Defined in Text.XML

Methods

toException :: XMLException -> SomeException

fromException :: SomeException -> Maybe XMLException

displayException :: XMLException -> String

backtraceDesired :: XMLException -> Bool

Show XMLException Source # 
Instance details

Defined in Text.XML

Methods

showsPrec :: Int -> XMLException -> ShowS

show :: XMLException -> String

showList :: [XMLException] -> ShowS

Rendering

writeFile :: RenderSettings -> FilePath -> Document -> IO () Source #

renderBytes :: forall (m :: Type -> Type) i. PrimMonad m => RenderSettings -> Document -> ConduitT i ByteString m () Source #

Settings

def :: Default a => a #

Parsing

data ParseSettings Source #

Instances

Instances details
Default ParseSettings Source # 
Instance details

Defined in Text.XML.Stream.Parse

Methods

def :: ParseSettings #

psRetainNamespaces :: ParseSettings -> Bool Source #

Whether the original xmlns attributes should be retained in the parsed values. For more information on motivation, see:

https://github.com/snoyberg/xml/issues/38

Default: False

Since 1.2.1

Entity decoding

decodeXmlEntities :: DecodeEntities Source #

Default implementation of DecodeEntities, which leaves the entity as-is. Numeric character references and the five standard entities (lt, gt, amp, quot, pos) are handled internally by the parser.

decodeHtmlEntities :: DecodeEntities Source #

HTML4-compliant entity decoder. Handles the additional 248 entities defined by HTML 4 and XHTML 1.

Note that HTML 5 introduces a drastically larger number of entities, and this code does not recognize most of them.

Rendering

data RenderSettings Source #

Instances

Instances details
Default RenderSettings Source # 
Instance details

Defined in Text.XML.Stream.Render

Methods

def :: RenderSettings #

rsPretty :: RenderSettings -> Bool Source #

Deprecated: Will be removed in future versions of `xml-conduit`. See https://github.com/snoyberg/xml/issues/196.

rsNamespaces :: RenderSettings -> [(Text, Text)] Source #

Defines some top level namespace definitions to be used, in the form of (prefix, namespace). This has absolutely no impact on the meaning of your documents, but can increase readability by moving commonly used namespace declarations to the top level.

rsAttrOrder :: RenderSettings -> Name -> Map Name Text -> [(Name, Text)] Source #

Specify how to turn the unordered attributes used by the Text.XML module into an ordered list.

rsUseCDATA :: RenderSettings -> Content -> Bool Source #

Determines if for a given text content the renderer should use a CDATA node.

Default: False

Since: 1.3.3

rsXMLDeclaration :: RenderSettings -> Bool Source #

Determines whether the XML declaration will be output.

Default: True

Since: 1.5.1

orderAttrs :: [(Name, [Name])] -> Name -> Map Name Text -> [(Name, Text)] Source #

Convenience function to create an ordering function suitable for use as the value of rsAttrOrder. The ordering function is created from an explicit ordering of the attributes, specified as a list of tuples, as follows: In each tuple, the first component is the Name of an element, and the second component is a list of attributes names. When the given element is rendered, the attributes listed, when present, appear first in the given order, followed by any other attributes in arbitrary order. If an element does not appear, all of its attributes are rendered in arbitrary order.

Conversion

fromXMLDocument :: Document -> Either (Set Text) Document Source #

toXMLNode :: Node -> Node Source #

fromXMLNode :: Node -> Either (Set Text) Node Source #

fromXMLElement :: Element -> Either (Set Text) Element Source #