module Language.Haskell.HsColour.HTML
( hscolour
, top'n'tail
, renderAnchors, renderComment, renderNewLinesAnchors, escape
) where
import Language.Haskell.HsColour.Anchors
import Language.Haskell.HsColour.Classify as Classify
import Language.Haskell.HsColour.Colourise
import Data.Char(isAlphaNum)
import Text.Printf
hscolour :: ColourPrefs
-> Bool
-> Int
-> String
-> String
hscolour pref anchor n =
pre
. (if anchor then renderNewLinesAnchors n
. concatMap (renderAnchors (renderToken pref))
. insertAnchors
else concatMap (renderToken pref))
. tokenise
top'n'tail :: String -> String -> String
top'n'tail title = (htmlHeader title ++) . (++htmlClose)
pre :: String -> String
pre = ("<pre>"++) . (++"</pre>")
renderToken :: ColourPrefs -> (TokenType,String) -> String
renderToken pref (t,s) = fontify (colourise pref t)
(if t == Comment then renderComment s else escape s)
renderAnchors :: (a -> String) -> Either String a -> String
renderAnchors _ (Left v) = "<a name=\""++v++"\"></a>"
renderAnchors render (Right r) = render r
renderComment :: String -> String
renderComment xs@('h':'t':'t':'p':':':'/':'/':_) =
renderLink a ++ renderComment b
where
isUrlChar x = isAlphaNum x || x `elem` ":/?#[]@!$&'()*+,;=-._~%"
(a,b) = span isUrlChar xs
renderLink link = "<a href=\"" ++ link ++ "\">" ++ escape link ++ "</a>"
renderComment (x:xs) = escape [x] ++ renderComment xs
renderComment [] = []
renderNewLinesAnchors :: Int -> String -> String
renderNewLinesAnchors n = unlines . map render . zip [n..] . lines
where render (line, s) = "<a name=\"line-" ++ show line ++ "\"></a>" ++ s
fontify :: [Highlight] -> String -> String
fontify [] s = s
fontify (h:hs) s = font h (fontify hs s)
font :: Highlight -> String -> String
font Normal s = s
font Bold s = "<b>"++s++"</b>"
font Dim s = "<em>"++s++"</em>"
font Underscore s = "<u>"++s++"</u>"
font Blink s = "<blink>"++s++"</blink>"
font ReverseVideo s = s
font Concealed s = s
font (Foreground (Rgb r g b)) s = printf "<font color=\"#%02x%02x%02x\">%s</font>" r g b s
font (Background (Rgb r g b)) s = printf "<font bgcolor=\"#%02x%02x%02x\">%s</font>" r g b s
font (Foreground c) s = "<font color="++show c++">"++s++"</font>"
font (Background c) s = "<font bgcolor="++show c++">"++s++"</font>"
font Italic s = "<i>"++s++"</i>"
escape :: String -> String
escape ('<':cs) = "<"++escape cs
escape ('>':cs) = ">"++escape cs
escape ('&':cs) = "&"++escape cs
escape (c:cs) = c: escape cs
escape [] = []
htmlHeader :: String -> String
htmlHeader title = unlines
[ "<!DOCTYPE HTML PUBLIC \"-//W3C//DTD HTML 3.2 Final//EN\">"
, "<html>"
, "<head>"
,"<!-- Generated by HsColour, http://code.haskell.org/~malcolm/hscolour/ -->"
, "<title>"++title++"</title>"
, "</head>"
, "<body>"
]
htmlClose :: String
htmlClose = "\n</body>\n</html>"