module Data.PropertyList.Xml
    ( UnparsedXmlPlistItem(..)
    , unparsedXmlPlistItemToElement
    
    , readXmlPropertyList, readXmlPropertyListFromFile
    
    , readXmlPartialPropertyList, showXmlPropertyList
    , readXmlPartialPropertyListFromFile, writeXmlPropertyListToFile
    
    ) where
import Control.Monad.Trans.Error ()
import Data.PropertyList.Algebra
import Data.PropertyList.Types
import Data.PropertyList.Xml.Algebra
import Text.XML.Light
readXmlPartialPropertyList :: String -> Either String (PartialPropertyList UnparsedXmlPlistItem)
readXmlPartialPropertyList str = case parseXMLDoc str of
    Just e@(Element (QName "plist" _ _) _ content _) ->
        let v = plistVersion e
         in if v == "1.0"
                then case onlyElems content of
                    [root]  -> Right (toPlist root)
                    _       -> Left "plist element must have exactly one child element"
                else Left ("plist version " ++ show v ++ " is not supported")
    Just e  -> Right (toPlist e)
    Nothing -> Left "not an XML document"
    where
        plistVersion = maybe "1.0" id . findAttrBy isVersion
        
        isVersion (QName "version" _ _) = True
        isVersion _ = False
readXmlPropertyList :: String -> Either String PropertyList
readXmlPropertyList str
    =   readXmlPartialPropertyList str 
    >>= completePropertyListByM barf
        where barf unparsed = Left ("Unparseable item found: " ++ show unparsed) :: Either String PropertyList
showXmlPropertyList :: (InitialPList f pl, PListAlgebra f Element) => pl -> String
showXmlPropertyList = ppTopElement . plist1element . fromPlist
    where
        version1attr = Attr (unqual "version") "1.0"
        plist1element :: Element -> Element
        plist1element root = unode "plist" (version1attr, root)
    
readXmlPartialPropertyListFromFile
  :: FilePath -> IO (PartialPropertyList UnparsedXmlPlistItem)
readXmlPartialPropertyListFromFile file = do
    x <- readFile file
    either fail return (readXmlPartialPropertyList x)
readXmlPropertyListFromFile :: FilePath -> IO PropertyList
readXmlPropertyListFromFile file = do
    x <- readFile file
    either fail return (readXmlPropertyList x)
    
writeXmlPropertyListToFile :: FilePath -> PropertyList -> IO ()
writeXmlPropertyListToFile file plist =
    writeFile file (showXmlPropertyList plist)