[Add test for Template Haskell splicing David Waern **20090110182917] { addfile ./tests/tests/TH.hs hunk ./tests/tests/TH.hs 1 +{-# LANGUAGE TemplateHaskell #-} + +module TH where + +import Language.Haskell.TH + +decl :: Q [Dec] +decl = [d| f x = x|] addfile ./tests/tests/TH.html.ref hunk ./tests/tests/TH.html.ref 1 + + +TH
 ContentsIndex
TH
Documentation
decl :: Q [Dec]
Produced by Haddock version 2.4.2
addfile ./tests/tests/TH2.hs hunk ./tests/tests/TH2.hs 1 +{-# LANGUAGE TemplateHaskell #-} + +module TH2 where + +import TH + +-- we can't add a type sig here, so we get no doc +$( decl ) addfile ./tests/tests/TH2.html.ref hunk ./tests/tests/TH2.html.ref 1 + + +TH2
 ContentsIndex
TH2
Produced by Haddock version 2.4.2
}