Safe Haskell | None |
---|---|
Language | Haskell2010 |
XML back and forth!
xmlbf
provides high-level tools for encoding and decoding XML.
xmlbf
provides tools like dfpos
and dfposM
for finding a fixpoint
of an XML fragment.
xmlbf
provides FromXml
and ToXml
typeclasses intended to be used as the
familiar FromJSON
and ToXml
from the aeson
package.
xmlbf
doesn't do any parsing of raw XML on its own. Instead, one should
use xmlbf
together with libraries like
xmlbf-xeno or
xmlbf-xmlhtml for
this.
Synopsis
- runParser :: Parser a -> [Node] -> Either String a
- data Parser a
- pElement :: Text -> Parser a -> Parser a
- pAnyElement :: Parser a -> Parser a
- pName :: Parser Text
- pAttr :: Text -> Parser Text
- pAttrs :: Parser (HashMap Text Text)
- pChildren :: Parser [Node]
- pText :: Parser Text
- pEndOfInput :: Parser ()
- encode :: [Node] -> Builder
- data Node
- node :: (Text -> HashMap Text Text -> [Node] -> a) -> (Text -> a) -> Node -> a
- pattern Element :: Text -> HashMap Text Text -> [Node] -> Node
- element :: Text -> HashMap Text Text -> [Node] -> [Node]
- element' :: Text -> HashMap Text Text -> [Node] -> Either String Node
- pattern Text :: Text -> Node
- text :: Text -> [Node]
- text' :: Text -> Either String Node
- dfpos :: ((Node -> [Node]) -> Node -> [Node]) -> Node -> [Node]
- dfposM :: Monad m => ((Node -> m [Node]) -> Node -> m [Node]) -> Node -> m [Node]
- dfpre :: ((Node -> [Node]) -> Node -> [Node]) -> Node -> [Node]
- dfpreM :: Monad m => ((Node -> m [Node]) -> Node -> m [Node]) -> Node -> m [Node]
- class FromXml a where
- class ToXml a where
Parsing
:: Parser a | Parser to run. |
-> [Node] | XML fragment body to parse. That is, top-level XML |
-> Either String a | If parsing fails, a |
Run a Parser
on an XML fragment body.
Notice that this function doesn't enforce that all input is consumed. If you
want that behavior, then please use pEndOfInput
in the given Parser
.
XML parser for a value of type a
.
You can build a Parser
using pElement
, pAnyElement
, pName
,
pAttr
, pAttrs
, pChildren
, pText
, pEndOfInput
, any of the
Applicative
, Alternative
, Monad
or related combinators.
Instances
Monad Parser Source # | |
Functor Parser Source # | |
MonadFix Parser Source # | |
MonadFail Parser Source # | |
Applicative Parser Source # | |
MonadZip Parser Source # | |
Alternative Parser Source # |
|
MonadPlus Parser Source # |
|
Selective Parser Source # | |
Semigroup a => Semigroup (Parser a) Source # | |
Monoid a => Monoid (Parser a) Source # | |
Parsers
runs a 'Parser pElement
"foo" pp
inside a Element
node named
"foo"
. This parser fails if such element does not exist at the current
position.
Leading whitespace is ignored. If you need to preserve that whitespace for
some reason, capture it using pText
before using pElement
.
Consumes the matched element from the parser state.
runs a pAnyElement
pParser
p
inside the Element
node at the
current position, if any. Otherwise, if no such element exists, this parser
fails.
You can recover the name of the matched element using pName
inside the
given Parser
. However, if you already know beforehand the name of the
element that you want to match, it's better to use pElement
rather than
pAnyElement
.
Leading whitespace is ignored. If you need to preserve that whitespace for
some reason, capture it using pText
before using pAnyElement
.
Consumes the matched element from the parser state.
Returns the name of the currently selected Element
.
This parser fails if there's no currently selected Element
(see
pElement
, pAnyElement
).
Doesn't modify the parser state.
Return the value of the requested attribute, if defined. Returns an
empty
Text
in case the attribute is defined but no value was given to
it.
This parser fails if there's no currently selected Element
(see
pElement
, pAnyElement
).
Consumes the matched attribute from the parser state.
Returns all of the available element attributes.
Returns empty
Text
as values in case an attribute is defined but no
value was given to it.
This parser fails if there's no currently selected Element
(see
pElement
, pAnyElement
).
Consumes all the attributes for this element from the parser state.
Returns the contents of a Text
node.
Surrounidng whitespace is not removed, as it is considered to be part of the text node.
If there is no text node at the current position, then this parser fails.
This implies that pText
never returns an empty Text
, since there is
no such thing as a text node without text.
Please note that consecutive text nodes are always concatenated and returned together.
runParser
pText
(text
"Ha" <>text
"sk" <>text
"ell") ==Right
(text
"Haskell")
Consumes the text from the parser state. This implies that if you
perform two consecutive pText
calls, the second will always fail.
runParser
(pText
>>pText
) (text
"Ha" <>text
"sk" <>text
"ell") ==Left
"Missing text node"
pEndOfInput :: Parser () Source #
Succeeds if all of the elements, attributes and text nodes have been consumed.
Rendering
encode :: [Node] -> Builder Source #
Encodes a list of XML Node
s, representing an XML fragment body, to an
UTF8-encoded and XML-escaped bytestring.
This function doesn't render self-closing elements. Instead, all elements have a corresponding closing tag.
Also, it doesn't render CDATA sections. Instead, all text is escaped as necessary.
Nodes
:: (Text -> HashMap Text Text -> [Node] -> a) | Transform an |
-> (Text -> a) | Transform a |
-> Node | |
-> a |
Case analysis for a Node
.
:: Text | Element' name as a strict |
-> HashMap Text Text | Attributes as strict |
-> [Node] | Children. |
-> [Node] |
Construct a XML fragment body containing a single Element
Node
, if
possible.
This function will return empty list if it is not possible to construct the
Element
with the given input. To learn more about why it was not possible
to construct it, use element
instead.
Using element'
rather than element
is recommended, so that you are forced
to acknowledge a failing situation in case it happens. However, element
is
at times more convenient to use, whenever you know the input is valid.
Construct a XML fragment body containing a single Text
Node
, if
possible.
This function will return empty list if it is not possible to construct the
Text
with the given input. To learn more about why it was not possible to
construct it, use text'
instead.
Using text'
rather than text
is recommended, so that you are forced to
acknowledge a failing situation in case it happens. However, text
is at
times more convenient to use. For example, when you know statically the input
is valid.
Fixpoints
dfpos :: ((Node -> [Node]) -> Node -> [Node]) -> Node -> [Node] Source #
Post-order depth-first replacement of Node
and all of its children.
This function works like fix
, but the given function is
trying to find a fixpoint for the individual children nodes, not for the root
node.
For example, the following function renames every node named "w"
to "y"
,
and every node named "y"
to "z"
. It accomplishes this by first renaming
"w"
nodes to "x"
, and then, by using k
recursively to further rename
all "x"
nodes (including the ones that were just created) to "y"
in a
post-order depth-first manner. After renaming an "x"
node to "y"
, the
recursion stops (i.e., k
is not used), so our new "y"
nodes won't be
further renamed to "z"
. However, nodes that were named "y"
initially will
be renamed to "z"
.
In our example we only replace one node with another, but a node can be replaced with zero or more nodes, depending on the length of the resulting list.
foo ::Node
-> [Node
] foo =dfpos
$ \k -> \caseElement
"w" as cs ->element
"x" as cs >>= kElement
"x" as cs ->element
"y" as csElement
"y" as cs ->element
"z" as cs >>= k
See dfpre
for pre-orderd depth-first replacement.
WARNING If you call k
in every branch, then dfpos
will never terminate.
Make sure the recursion stops at some point by simply returning a list of
nodes instead of calling k
.
dfposM :: Monad m => ((Node -> m [Node]) -> Node -> m [Node]) -> Node -> m [Node] Source #
Monadic version of dfpos
.
dfpreM :: Monad m => ((Node -> m [Node]) -> Node -> m [Node]) -> Node -> m [Node] Source #
Monadic version of dfpre
.