HaXml-1.25.6: Utilities for manipulating XML documents
Safe HaskellNone
LanguageHaskell98

Text.XML.HaXml.XmlContent.Haskell

Description

The class XmlContent is a kind of replacement for Read and Show: it provides conversions between a generic XML tree representation and your own more specialised typeful Haskell data trees.

If you are starting with a set of Haskell datatypes, use DrIFT to derive instances of this class for you: http://repetae.net/john/computer/haskell/DrIFT and use the current module for instances of the standard Haskell datatypes list, Maybe, and so on.

If you are starting with an XML DTD, use HaXml's tool DtdToHaskell to generate both the Haskell types and the corresponding instances, but _do_not_ use the current module for instances: use Text.XML.HaXml.XmlContent instead.

Synopsis

Re-export everything from Text.XML.HaXml.XmlContent.Parser.

Instances (only) for the XmlContent class, for datatypes that

Whole-document conversion functions

toXml :: XmlContent a => Bool -> a -> Document () Source #

Convert a fully-typed XML document to a string (with or without DTD).

fromXml :: XmlContent a => Document Posn -> Either String a Source #

Read a Haskell value from an XML document, ignoring the DTD and using the Haskell result type to determine how to parse it.

readXml :: XmlContent a => String -> Either String a Source #

Read a fully-typed XML document from a string.

showXml :: XmlContent a => Bool -> a -> String Source #

Convert a fully-typed XML document to a string (without DTD).

fpsShowXml :: XmlContent a => Bool -> a -> ByteString Source #

Convert a fully-typed XML document to a ByteString (without DTD).

fReadXml :: XmlContent a => FilePath -> IO a Source #

Read an XML document from a file and convert it to a fully-typed Haskell value.

fWriteXml :: XmlContent a => FilePath -> a -> IO () Source #

Write a fully-typed Haskell value to the given file as an XML document.

fpsWriteXml :: XmlContent a => FilePath -> a -> IO () Source #

Write any Haskell value to the given file as an XML document, using the FastPackedString interface (output will not be prettified).

hGetXml :: XmlContent a => Handle -> IO a Source #

Read a fully-typed XML document from a file handle.

hPutXml :: XmlContent a => Handle -> Bool -> a -> IO () Source #

Write a fully-typed XML document to a file handle.

fpsHPutXml :: XmlContent a => Handle -> Bool -> a -> IO () Source #

Write a fully-typed XML document to a file handle, using the FastPackedString interface (output will not be prettified).

Orphan instances

XmlContent Bool Source # 
Instance details

Methods

parseContents :: XMLParser Bool Source #

toContents :: Bool -> [Content ()] Source #

xToChar :: Bool -> Char Source #

xFromChar :: Char -> Bool Source #

XmlContent Char Source # 
Instance details

Methods

parseContents :: XMLParser Char Source #

toContents :: Char -> [Content ()] Source #

xToChar :: Char -> Char Source #

xFromChar :: Char -> Char Source #

XmlContent Double Source # 
Instance details

XmlContent Float Source # 
Instance details

XmlContent Int Source # 
Instance details

XmlContent Integer Source # 
Instance details

XmlContent () Source # 
Instance details

Methods

parseContents :: XMLParser () Source #

toContents :: () -> [Content ()] Source #

xToChar :: () -> Char Source #

xFromChar :: Char -> () Source #

XmlContent a => XmlContent [a] Source # 
Instance details

Methods

parseContents :: XMLParser [a] Source #

toContents :: [a] -> [Content ()] Source #

xToChar :: [a] -> Char Source #

xFromChar :: Char -> [a] Source #

XmlContent a => XmlContent (Maybe a) Source # 
Instance details

Methods

parseContents :: XMLParser (Maybe a) Source #

toContents :: Maybe a -> [Content ()] Source #

xToChar :: Maybe a -> Char Source #

xFromChar :: Char -> Maybe a Source #

(XmlContent a, XmlContent b) => XmlContent (Either a b) Source # 
Instance details

Methods

parseContents :: XMLParser (Either a b) Source #

toContents :: Either a b -> [Content ()] Source #

xToChar :: Either a b -> Char Source #

xFromChar :: Char -> Either a b Source #