{-# LANGUAGE RecordWildCards #-} module Report(writeReport) where import Idea import Control.Arrow import Data.List import Data.Maybe import Data.Version import System.FilePath import HSE.All import Paths_hlint import Language.Haskell.HsColour.CSS writeTemplate :: FilePath -> [(String,[String])] -> FilePath -> IO () writeTemplate dataDir content to = do src <- readFile $ dataDir "report_template.html" writeFile to $ unlines $ concatMap f $ lines src where f ('$':xs) = fromMaybe ['$':xs] $ lookup xs content f x = [x] writeReport :: FilePath -> FilePath -> [Idea] -> IO () writeReport dataDir file ideas = writeTemplate dataDir inner file where generateIds :: [String] -> [(String,Int)] -- sorted by name generateIds = map (head &&& length) . group . sort files = generateIds $ map (srcFilename . loc) ideas hints = generateIds $ map hintName ideas hintName x = show (severity x) ++ ": " ++ hint x inner = [("VERSION",['v' : showVersion version]),("CONTENT",content), ("HINTS",list "hint" hints),("FILES",list "file" files)] content = concatMap (\i -> writeIdea (getClass i) i) ideas getClass i = "hint" ++ f hints (hintName i) ++ " file" ++ f files (srcFilename $ loc i) where f xs x = show $ fromJust $ findIndex ((==) x . fst) xs list mode xs = zipWith f [0..] xs where f i (name,n) = "
  • " ++ escapeHTML name ++ " (" ++ show n ++ ")
  • " where id = mode ++ show i code = hscolour False writeIdea :: String -> Idea -> [String] writeIdea cls Idea{..} = ["
    " ,escapeHTML (showSrcLoc loc ++ ": " ++ show severity ++ ": " ++ hint) ++ "
    " ,"Found
    " ,code from ,"Why not" ++ (if to == "" then " remove it." else "") ++ "
    " ,code to ,let n = showNotes note in if n /= "" then "Note: " ++ n ++ "" else "" ,"
    " ,""] writeIdea cls ParseError{..} = ["
    " ,escapeHTML (showSrcLoc loc ++ ": " ++ show severity ++ ": " ++ hint) ++ "
    " ,"Error message
    " ,"
    " ++ escapeHTML msg ++ "
    " ,"Code
    " ,code from ,"
    " ,""] escapeHTML :: String -> String escapeHTML = concatMap f where f '>' = ">" f '<' = "<" f '&' = "&" f x = [x]