module Text.XML.HaXml.Escape(
xmlEscape,
xmlUnEscape,
xmlEscapeContent,
xmlUnEscapeContent,
XmlEscaper,
stdXmlEscaper,
mkXmlEscaper,
) where
import Data.Char
import Text.XML.HaXml.Types
#if __GLASGOW_HASKELL__ >= 604 || __NHC__ >= 118 || defined(__HUGS__)
import qualified Data.Map as Map
type FiniteMap a b = Map.Map a b
listToFM :: Ord a => [(a,b)] -> FiniteMap a b
listToFM :: [(a, b)] -> FiniteMap a b
listToFM = [(a, b)] -> FiniteMap a b
forall k a. Ord k => [(k, a)] -> Map k a
Map.fromList
lookupFM :: Ord a => FiniteMap a b -> a -> Maybe b
lookupFM :: FiniteMap a b -> a -> Maybe b
lookupFM = (a -> FiniteMap a b -> Maybe b) -> FiniteMap a b -> a -> Maybe b
forall a b c. (a -> b -> c) -> b -> a -> c
flip a -> FiniteMap a b -> Maybe b
forall k a. Ord k => k -> Map k a -> Maybe a
Map.lookup
#elif __GLASGOW_HASKELL__ >= 504 || __NHC__ > 114
import Data.FiniteMap
#else
type FiniteMap a b = [(a,b)]
listToFM :: Eq a => [(a,b)] -> FiniteMap a b
listToFM = id
lookupFM :: Eq a => FiniteMap a b -> a -> Maybe b
lookupFM fm k = lookup k fm
#endif
data XmlEscaper = XmlEscaper {
XmlEscaper -> FiniteMap Char String
toEscape :: FiniteMap Char String,
XmlEscaper -> FiniteMap String Char
fromEscape :: FiniteMap String Char,
XmlEscaper -> Char -> Bool
isEscape :: Char -> Bool
}
xmlEscape :: XmlEscaper -> Element i -> Element i
xmlEscape :: XmlEscaper -> Element i -> Element i
xmlEscape XmlEscaper
xmlEscaper Element i
element =
Element i -> Element i
forall i. Element i -> Element i
compressElement (XmlEscaper -> Element i -> Element i
forall i. XmlEscaper -> Element i -> Element i
escapeElement XmlEscaper
xmlEscaper Element i
element)
xmlEscapeContent :: XmlEscaper -> [Content i] -> [Content i]
xmlEscapeContent :: XmlEscaper -> [Content i] -> [Content i]
xmlEscapeContent XmlEscaper
xmlEscaper [Content i]
cs =
[Content i] -> [Content i]
forall i. [Content i] -> [Content i]
compressContent (XmlEscaper -> [Content i] -> [Content i]
forall i. XmlEscaper -> [Content i] -> [Content i]
escapeContent XmlEscaper
xmlEscaper [Content i]
cs)
escapeElement :: XmlEscaper -> Element i -> Element i
escapeElement :: XmlEscaper -> Element i -> Element i
escapeElement XmlEscaper
xmlEscaper (Elem QName
name [Attribute]
attributes [Content i]
content) =
QName -> [Attribute] -> [Content i] -> Element i
forall i. QName -> [Attribute] -> [Content i] -> Element i
Elem QName
name (XmlEscaper -> [Attribute] -> [Attribute]
escapeAttributes XmlEscaper
xmlEscaper [Attribute]
attributes)
(XmlEscaper -> [Content i] -> [Content i]
forall i. XmlEscaper -> [Content i] -> [Content i]
escapeContent XmlEscaper
xmlEscaper [Content i]
content)
escapeAttributes :: XmlEscaper -> [Attribute] -> [Attribute]
escapeAttributes :: XmlEscaper -> [Attribute] -> [Attribute]
escapeAttributes XmlEscaper
xmlEscaper [Attribute]
atts =
(Attribute -> Attribute) -> [Attribute] -> [Attribute]
forall a b. (a -> b) -> [a] -> [b]
map
(\ (QName
name,AttValue
av) -> (QName
name,XmlEscaper -> AttValue -> AttValue
escapeAttValue XmlEscaper
xmlEscaper AttValue
av))
[Attribute]
atts
escapeAttValue :: XmlEscaper -> AttValue -> AttValue
escapeAttValue :: XmlEscaper -> AttValue -> AttValue
escapeAttValue XmlEscaper
xmlEscaper (AttValue [Either String Reference]
attValList) =
[Either String Reference] -> AttValue
AttValue (
[[Either String Reference]] -> [Either String Reference]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat (
(Either String Reference -> [Either String Reference])
-> [Either String Reference] -> [[Either String Reference]]
forall a b. (a -> b) -> [a] -> [b]
map
(\ Either String Reference
av -> case Either String Reference
av of
Right Reference
_ -> [Either String Reference
av]
Left String
s ->
(Char -> Either String Reference)
-> String -> [Either String Reference]
forall a b. (a -> b) -> [a] -> [b]
map
(\ Char
c -> if XmlEscaper -> Char -> Bool
isEscape XmlEscaper
xmlEscaper Char
c
then
Reference -> Either String Reference
forall a b. b -> Either a b
Right (XmlEscaper -> Char -> Reference
mkEscape XmlEscaper
xmlEscaper Char
c)
else
String -> Either String Reference
forall a b. a -> Either a b
Left [Char
c]
)
String
s
)
[Either String Reference]
attValList
)
)
escapeContent :: XmlEscaper -> [Content i] -> [Content i]
escapeContent :: XmlEscaper -> [Content i] -> [Content i]
escapeContent XmlEscaper
xmlEscaper [Content i]
contents =
[[Content i]] -> [Content i]
forall (t :: * -> *) a. Foldable t => t [a] -> [a]
concat
((Content i -> [Content i]) -> [Content i] -> [[Content i]]
forall a b. (a -> b) -> [a] -> [b]
map
(\ Content i
content -> case Content i
content of
(CString Bool
b String
str i
i) ->
(Char -> Content i) -> String -> [Content i]
forall a b. (a -> b) -> [a] -> [b]
map
(\ Char
c -> if XmlEscaper -> Char -> Bool
isEscape XmlEscaper
xmlEscaper Char
c
then
Reference -> i -> Content i
forall i. Reference -> i -> Content i
CRef (XmlEscaper -> Char -> Reference
mkEscape XmlEscaper
xmlEscaper Char
c) i
i
else
Bool -> String -> i -> Content i
forall i. Bool -> String -> i -> Content i
CString Bool
b [Char
c] i
i
)
String
str
(CElem Element i
element i
i) -> [Element i -> i -> Content i
forall i. Element i -> i -> Content i
CElem (XmlEscaper -> Element i -> Element i
forall i. XmlEscaper -> Element i -> Element i
escapeElement XmlEscaper
xmlEscaper Element i
element) i
i]
Content i
_ -> [Content i
content]
)
[Content i]
contents
)
mkEscape :: XmlEscaper -> Char -> Reference
mkEscape :: XmlEscaper -> Char -> Reference
mkEscape (XmlEscaper {toEscape :: XmlEscaper -> FiniteMap Char String
toEscape = FiniteMap Char String
toescape}) Char
ch =
case FiniteMap Char String -> Char -> Maybe String
forall a b. Ord a => FiniteMap a b -> a -> Maybe b
lookupFM FiniteMap Char String
toescape Char
ch of
Maybe String
Nothing -> CharRef -> Reference
RefChar (Char -> CharRef
ord Char
ch)
Just String
str -> String -> Reference
RefEntity String
str
xmlUnEscape :: XmlEscaper -> Element i -> Element i
xmlUnEscape :: XmlEscaper -> Element i -> Element i
xmlUnEscape XmlEscaper
xmlEscaper Element i
element =
Element i -> Element i
forall i. Element i -> Element i
compressElement (XmlEscaper -> Element i -> Element i
forall i. XmlEscaper -> Element i -> Element i
unEscapeElement XmlEscaper
xmlEscaper Element i
element)
xmlUnEscapeContent :: XmlEscaper -> [Content i] -> [Content i]
xmlUnEscapeContent :: XmlEscaper -> [Content i] -> [Content i]
xmlUnEscapeContent XmlEscaper
xmlEscaper [Content i]
cs =
[Content i] -> [Content i]
forall i. [Content i] -> [Content i]
compressContent (XmlEscaper -> [Content i] -> [Content i]
forall i. XmlEscaper -> [Content i] -> [Content i]
unEscapeContent XmlEscaper
xmlEscaper [Content i]
cs)
unEscapeElement :: XmlEscaper -> Element i -> Element i
unEscapeElement :: XmlEscaper -> Element i -> Element i
unEscapeElement XmlEscaper
xmlEscaper (Elem QName
name [Attribute]
attributes [Content i]
content) =
QName -> [Attribute] -> [Content i] -> Element i
forall i. QName -> [Attribute] -> [Content i] -> Element i
Elem QName
name (XmlEscaper -> [Attribute] -> [Attribute]
unEscapeAttributes XmlEscaper
xmlEscaper [Attribute]
attributes)
(XmlEscaper -> [Content i] -> [Content i]
forall i. XmlEscaper -> [Content i] -> [Content i]
unEscapeContent XmlEscaper
xmlEscaper [Content i]
content)
unEscapeAttributes :: XmlEscaper -> [Attribute] -> [Attribute]
unEscapeAttributes :: XmlEscaper -> [Attribute] -> [Attribute]
unEscapeAttributes XmlEscaper
xmlEscaper [Attribute]
atts =
(Attribute -> Attribute) -> [Attribute] -> [Attribute]
forall a b. (a -> b) -> [a] -> [b]
map
(\ (QName
name,AttValue
av) -> (QName
name,XmlEscaper -> AttValue -> AttValue
unEscapeAttValue XmlEscaper
xmlEscaper AttValue
av))
[Attribute]
atts
unEscapeAttValue :: XmlEscaper -> AttValue -> AttValue
unEscapeAttValue :: XmlEscaper -> AttValue -> AttValue
unEscapeAttValue XmlEscaper
xmlEscaper (AttValue [Either String Reference]
attValList) =
[Either String Reference] -> AttValue
AttValue (
(Either String Reference -> Either String Reference)
-> [Either String Reference] -> [Either String Reference]
forall a b. (a -> b) -> [a] -> [b]
map
(\ Either String Reference
av -> case Either String Reference
av of
Left String
_ -> Either String Reference
av
Right Reference
ref -> case XmlEscaper -> Reference -> Maybe Char
unEscapeChar XmlEscaper
xmlEscaper Reference
ref of
Just Char
c -> String -> Either String Reference
forall a b. a -> Either a b
Left [Char
c]
Maybe Char
Nothing -> Either String Reference
av
)
[Either String Reference]
attValList
)
unEscapeContent :: XmlEscaper -> [Content i] -> [Content i]
unEscapeContent :: XmlEscaper -> [Content i] -> [Content i]
unEscapeContent XmlEscaper
xmlEscaper [Content i]
content =
(Content i -> Content i) -> [Content i] -> [Content i]
forall a b. (a -> b) -> [a] -> [b]
map
(\ Content i
cntnt -> case Content i
cntnt of
CRef Reference
ref i
i -> case XmlEscaper -> Reference -> Maybe Char
unEscapeChar XmlEscaper
xmlEscaper Reference
ref of
Just Char
c -> Bool -> String -> i -> Content i
forall i. Bool -> String -> i -> Content i
CString Bool
False [Char
c] i
i
Maybe Char
Nothing -> Content i
cntnt
CElem Element i
element i
i -> Element i -> i -> Content i
forall i. Element i -> i -> Content i
CElem (XmlEscaper -> Element i -> Element i
forall i. XmlEscaper -> Element i -> Element i
unEscapeElement XmlEscaper
xmlEscaper Element i
element) i
i
Content i
_ -> Content i
cntnt
)
[Content i]
content
unEscapeChar :: XmlEscaper -> Reference -> Maybe Char
unEscapeChar :: XmlEscaper -> Reference -> Maybe Char
unEscapeChar XmlEscaper
xmlEscaper Reference
ref =
case Reference
ref of
RefChar CharRef
i -> Char -> Maybe Char
forall a. a -> Maybe a
Just (CharRef -> Char
chr CharRef
i)
RefEntity String
name -> FiniteMap String Char -> String -> Maybe Char
forall a b. Ord a => FiniteMap a b -> a -> Maybe b
lookupFM (XmlEscaper -> FiniteMap String Char
fromEscape XmlEscaper
xmlEscaper) String
name
compressElement :: Element i -> Element i
compressElement :: Element i -> Element i
compressElement (Elem QName
name [Attribute]
attributes [Content i]
content) =
QName -> [Attribute] -> [Content i] -> Element i
forall i. QName -> [Attribute] -> [Content i] -> Element i
Elem QName
name ([Attribute] -> [Attribute]
compressAttributes [Attribute]
attributes) ([Content i] -> [Content i]
forall i. [Content i] -> [Content i]
compressContent [Content i]
content)
compressAttributes :: [(QName,AttValue)] -> [(QName,AttValue)]
compressAttributes :: [Attribute] -> [Attribute]
compressAttributes [Attribute]
atts =
(Attribute -> Attribute) -> [Attribute] -> [Attribute]
forall a b. (a -> b) -> [a] -> [b]
map
(\ (QName
name,AttValue
av) -> (QName
name,AttValue -> AttValue
compressAttValue AttValue
av))
[Attribute]
atts
compressAttValue :: AttValue -> AttValue
compressAttValue :: AttValue -> AttValue
compressAttValue (AttValue [Either String Reference]
l) = [Either String Reference] -> AttValue
AttValue ([Either String Reference] -> [Either String Reference]
compress [Either String Reference]
l)
where
compress :: [Either String Reference] -> [Either String Reference]
compress :: [Either String Reference] -> [Either String Reference]
compress [] = []
compress (Right Reference
ref : [Either String Reference]
es) = Reference -> Either String Reference
forall a b. b -> Either a b
Right Reference
ref Either String Reference
-> [Either String Reference] -> [Either String Reference]
forall a. a -> [a] -> [a]
: ([Either String Reference] -> [Either String Reference]
compress [Either String Reference]
es)
compress ( (ls :: Either String Reference
ls@(Left String
s1)) : [Either String Reference]
es) =
case [Either String Reference] -> [Either String Reference]
compress [Either String Reference]
es of
(Left String
s2 : [Either String Reference]
es2) -> String -> Either String Reference
forall a b. a -> Either a b
Left (String
s1 String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
s2) Either String Reference
-> [Either String Reference] -> [Either String Reference]
forall a. a -> [a] -> [a]
: [Either String Reference]
es2
[Either String Reference]
es2 -> Either String Reference
ls Either String Reference
-> [Either String Reference] -> [Either String Reference]
forall a. a -> [a] -> [a]
: [Either String Reference]
es2
compressContent :: [Content i] -> [Content i]
compressContent :: [Content i] -> [Content i]
compressContent [] = []
compressContent ((csb :: Content i
csb@(CString Bool
b1 String
s1 i
i1)) : [Content i]
cs) =
case [Content i] -> [Content i]
forall i. [Content i] -> [Content i]
compressContent [Content i]
cs of
(CString Bool
b2 String
s2 i
_) : [Content i]
cs2
| Bool
b1 Bool -> Bool -> Bool
forall a. Eq a => a -> a -> Bool
== Bool
b2
-> Bool -> String -> i -> Content i
forall i. Bool -> String -> i -> Content i
CString Bool
b1 (String
s1 String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
s2) i
i1Content i -> [Content i] -> [Content i]
forall a. a -> [a] -> [a]
: [Content i]
cs2
[Content i]
cs2 -> Content i
csb Content i -> [Content i] -> [Content i]
forall a. a -> [a] -> [a]
: [Content i]
cs2
compressContent (CElem Element i
element i
i : [Content i]
cs) =
Element i -> i -> Content i
forall i. Element i -> i -> Content i
CElem (Element i -> Element i
forall i. Element i -> Element i
compressElement Element i
element) i
i Content i -> [Content i] -> [Content i]
forall a. a -> [a] -> [a]
: [Content i] -> [Content i]
forall i. [Content i] -> [Content i]
compressContent [Content i]
cs
compressContent (Content i
c : [Content i]
cs) = Content i
c Content i -> [Content i] -> [Content i]
forall a. a -> [a] -> [a]
: [Content i] -> [Content i]
forall i. [Content i] -> [Content i]
compressContent [Content i]
cs
stdXmlEscaper :: XmlEscaper
stdXmlEscaper :: XmlEscaper
stdXmlEscaper = [(Char, String)] -> (Char -> Bool) -> XmlEscaper
mkXmlEscaper
[(Char
'\60',String
"lt"),(Char
'\62',String
"gt"),(Char
'\38',String
"amp"),(Char
'\39',String
"apos"),(Char
'\34',String
"quot")]
(\ Char
ch ->
let
i :: CharRef
i = Char -> CharRef
ord Char
ch
in
CharRef
i CharRef -> CharRef -> Bool
forall a. Ord a => a -> a -> Bool
< CharRef
10 Bool -> Bool -> Bool
|| (CharRef
10CharRef -> CharRef -> Bool
forall a. Ord a => a -> a -> Bool
<CharRef
i Bool -> Bool -> Bool
&& CharRef
iCharRef -> CharRef -> Bool
forall a. Ord a => a -> a -> Bool
<CharRef
32) Bool -> Bool -> Bool
|| CharRef
i CharRef -> CharRef -> Bool
forall a. Ord a => a -> a -> Bool
>= CharRef
127 Bool -> Bool -> Bool
||
case Char
ch of
Char
'\'' -> Bool
True
Char
'\"' -> Bool
True
Char
'&' -> Bool
True
Char
'<' -> Bool
True
Char
'>' -> Bool
True
Char
_ -> Bool
False
)
mkXmlEscaper :: [(Char,String)] -> (Char -> Bool) -> XmlEscaper
mkXmlEscaper :: [(Char, String)] -> (Char -> Bool) -> XmlEscaper
mkXmlEscaper [(Char, String)]
escapes Char -> Bool
isescape =
XmlEscaper :: FiniteMap Char String
-> FiniteMap String Char -> (Char -> Bool) -> XmlEscaper
XmlEscaper {
toEscape :: FiniteMap Char String
toEscape = [(Char, String)] -> FiniteMap Char String
forall k a. Ord k => [(k, a)] -> Map k a
listToFM [(Char, String)]
escapes,
fromEscape :: FiniteMap String Char
fromEscape = [(String, Char)] -> FiniteMap String Char
forall k a. Ord k => [(k, a)] -> Map k a
listToFM (((Char, String) -> (String, Char))
-> [(Char, String)] -> [(String, Char)]
forall a b. (a -> b) -> [a] -> [b]
map (\ (Char
c,String
str) -> (String
str,Char
c)) [(Char, String)]
escapes),
isEscape :: Char -> Bool
isEscape = Char -> Bool
isescape
}