Text.XML.Enumerator.Parse
Description
This module provides both a native Haskell solution for parsing XML documents into a stream of events, and a set of parser combinators for dealing with a stream of events.
The important thing to know about the combinators is that they do not work
on the fully-powered Event
datatype; rather, this module defines an
SEvent
datatype which only deals with tags, attributes and content. For
most uses, this is sufficient. If you need to parse doctypes, instructions
or contents, you will not be able to use the combinators.
As a simple example, if you have the following XML file:
<?xml version="1.0" encoding="utf-8"?> <people> <person age="25">Michael</person> <person age="2">Eliezer</person> </people>
Then this code:
{-# LANGUAGE OverloadedStrings #-} import Text.XML.Enumerator.Parse import Data.Text.Lazy (Text, unpack) data Person = Person { age :: Int, name :: Text } deriving Show parsePerson = tag' "person" (requireAttr "age") $ \age -> do name <- content' return $ Person (read $ unpack age) name parsePeople = tag'' "people" $ many parsePerson main = parseFile_ "people.xml" (const Nothing) $ force "people required" parsePeople
will produce:
[Person {age = 25, name = "Michael"},Person {age = 2, name = "Eliezer"}]
- parseBytes :: Monad m => DecodeEntities -> Enumeratee ByteString Event m a
- parseText :: Monad m => DecodeEntities -> Enumeratee Text Event m a
- detectUtf :: Monad m => Enumeratee ByteString Text m a
- parseFile :: FilePath -> DecodeEntities -> Iteratee Event IO a -> IO (Either SomeException a)
- parseFile_ :: FilePath -> DecodeEntities -> Iteratee Event IO a -> IO a
- parseLBS :: ByteString -> DecodeEntities -> Iteratee Event IO a -> IO (Either SomeException a)
- parseLBS_ :: ByteString -> DecodeEntities -> Iteratee Event IO a -> IO a
- type DecodeEntities = Text -> Content
- decodeEntities :: DecodeEntities
- tag :: Monad m => (Name -> Maybe a) -> (a -> AttrParser b) -> (b -> Iteratee Event m c) -> Iteratee Event m (Maybe c)
- tagName :: Monad m => Name -> AttrParser a -> (a -> Iteratee Event m b) -> Iteratee Event m (Maybe b)
- tagNoAttr :: Monad m => Name -> Iteratee Event m a -> Iteratee Event m (Maybe a)
- content :: Monad m => Iteratee Event m Text
- contentMaybe :: Monad m => Iteratee Event m (Maybe Text)
- ignoreElem :: Monad m => Iteratee Event m (Maybe ())
- ignoreSiblings :: Monad m => Iteratee Event m ()
- data AttrParser a
- requireAttr :: Name -> AttrParser Text
- optionalAttr :: Name -> AttrParser (Maybe Text)
- requireAttrRaw :: String -> ((Name, [Content]) -> Maybe b) -> AttrParser b
- optionalAttrRaw :: ((Name, [Content]) -> Maybe b) -> AttrParser (Maybe b)
- ignoreAttrs :: AttrParser ()
- skipAttrs :: AttrParser a -> AttrParser a
- choose :: Monad m => [Iteratee Event m (Maybe a)] -> Iteratee Event m (Maybe a)
- many :: Monad m => Iteratee Event m (Maybe a) -> Iteratee Event m [a]
- force :: Monad m => String -> Iteratee Event m (Maybe a) -> Iteratee Event m a
- skipTill :: Monad m => Iteratee Event m (Maybe a) -> Iteratee Event m (Maybe a)
- skipSiblings :: Monad m => Iteratee Event m a -> Iteratee Event m a
- data XmlException
- = XmlException { }
- | InvalidEndElement Name
- | InvalidEntity Text
- | UnparsedAttributes [(Name, [Content])]
Parsing XML files
parseBytes :: Monad m => DecodeEntities -> Enumeratee ByteString Event m aSource
Parses a byte stream into Event
s. This function is implemented fully in
Haskell using attoparsec-text for parsing. The produced error messages do
not give line/column information, so you may prefer to stick with the parser
provided by libxml-enumerator. However, this has the advantage of not
relying on any C libraries.
This relies on detectUtf
to determine character encoding, and parseText
to do the actual parsing.
parseText :: Monad m => DecodeEntities -> Enumeratee Text Event m aSource
Parses a character stream into Event
s. This function is implemented
fully in Haskell using attoparsec-text for parsing. The produced error
messages do not give line/column information, so you may prefer to stick
with the parser provided by libxml-enumerator. However, this has the
advantage of not relying on any C libraries.
detectUtf :: Monad m => Enumeratee ByteString Text m aSource
Automatically determine which UTF variant is being used. This function first checks for BOMs, removing them as necessary, and then check for the equivalent of <?xml for each of UTF-8, UTF-16LEBE, and UTF-32LEBE. It defaults to assuming UTF-8.
parseFile :: FilePath -> DecodeEntities -> Iteratee Event IO a -> IO (Either SomeException a)Source
A helper function which reads a file from disk using enumFile
, detects
character encoding using detectUtf
, parses the XML using parseBytes
,
converts to an SEvent
stream using simplify
and then handing off control
to your supplied parser.
parseFile_ :: FilePath -> DecodeEntities -> Iteratee Event IO a -> IO aSource
The same as parseFile
, but throws any exceptions.
parseLBS :: ByteString -> DecodeEntities -> Iteratee Event IO a -> IO (Either SomeException a)Source
parseLBS_ :: ByteString -> DecodeEntities -> Iteratee Event IO a -> IO aSource
Entity decoding
type DecodeEntities = Text -> ContentSource
decodeEntities :: DecodeEntitiesSource
Default implementation of DecodeEntities
: handles numeric entities and
the five standard character entities (lt, gt, amp, quot, apos).
Event parsing
tag :: Monad m => (Name -> Maybe a) -> (a -> AttrParser b) -> (b -> Iteratee Event m c) -> Iteratee Event m (Maybe c)Source
The most generic way to parse a tag. It takes a predicate for checking if
this is the correct tag name, an AttrParser
for handling attributes, and
then a parser for dealing with content.
This function automatically absorbs its balancing closing tag, and will
throw an exception if not all of the attributes or child elements are
consumed. If you want to allow extra attributes, see ignoreAttrs
.
tagName :: Monad m => Name -> AttrParser a -> (a -> Iteratee Event m b) -> Iteratee Event m (Maybe b)Source
tagNoAttr :: Monad m => Name -> Iteratee Event m a -> Iteratee Event m (Maybe a)Source
A further simplified tag parser, which requires that no attributes exist.
content :: Monad m => Iteratee Event m TextSource
Grabs the next piece of content. If none if available, returns empty
.
contentMaybe :: Monad m => Iteratee Event m (Maybe Text)Source
Grabs the next piece of content if available.
Attribute parsing
data AttrParser a Source
A monad for parsing attributes. By default, it requires you to deal with
all attributes present on an element, and will throw an exception if there
are unhandled attributes. Use the requireAttr
, optionalAttr
et al
functions for handling an attribute, and ignoreAttrs
if you would like to
skip the rest of the attributes on an element.
Instances
requireAttr :: Name -> AttrParser TextSource
Require that a certain attribute be present and return its value.
optionalAttr :: Name -> AttrParser (Maybe Text)Source
Return the value for an attribute if present.
requireAttrRaw :: String -> ((Name, [Content]) -> Maybe b) -> AttrParser bSource
optionalAttrRaw :: ((Name, [Content]) -> Maybe b) -> AttrParser (Maybe b)Source
ignoreAttrs :: AttrParser ()Source
Skip the remaining attributes on an element. Since this will clear the
list of attributes, you must call this after any calls to requireAttr
,
optionalAttr
, etc.
skipAttrs :: AttrParser a -> AttrParser aSource
Combinator to skip the attributes.
Combinators
many :: Monad m => Iteratee Event m (Maybe a) -> Iteratee Event m [a]Source
Keep parsing elements as long as the parser returns Just
.
skipTill :: Monad m => Iteratee Event m (Maybe a) -> Iteratee Event m (Maybe a)Source
Skip the siblings elements until iteratee not right.
skipSiblings :: Monad m => Iteratee Event m a -> Iteratee Event m aSource
Combinator to skip the siblings element.
Exceptions
data XmlException Source
Constructors
XmlException | |
Fields | |
InvalidEndElement Name | |
InvalidEntity Text | |
UnparsedAttributes [(Name, [Content])] |