aboutsummaryrefslogtreecommitdiff
path: root/Text/Pandoc/ASCIIMathML.hs
diff options
context:
space:
mode:
authorfiddlosopher <fiddlosopher@788f1e2b-df1e-0410-8736-df70ead52e1b>2008-08-01 23:29:55 +0000
committerfiddlosopher <fiddlosopher@788f1e2b-df1e-0410-8736-df70ead52e1b>2008-08-01 23:29:55 +0000
commite371db97d7de5188b89b9f77749b47c20ef958de (patch)
tree630b3c96d5bb766a154ff474de52118b57847b54 /Text/Pandoc/ASCIIMathML.hs
parent5c1c786d6590b105dc2802a16eb9c599ec06912c (diff)
downloadpandoc-e371db97d7de5188b89b9f77749b47c20ef958de.tar.gz
Fixes to make haddock work with template haskell:
+ Added CPP, TemplateHaskell, FlexibleInstances to cabal file "Extensions" field + Added #ifndef __HADDOCK__ cpp declarations in the files using template haskell. git-svn-id: https://pandoc.googlecode.com/svn/trunk@1366 788f1e2b-df1e-0410-8736-df70ead52e1b
Diffstat (limited to 'Text/Pandoc/ASCIIMathML.hs')
-rw-r--r--Text/Pandoc/ASCIIMathML.hs4
1 files changed, 3 insertions, 1 deletions
diff --git a/Text/Pandoc/ASCIIMathML.hs b/Text/Pandoc/ASCIIMathML.hs
index 72a1f0e19..829779e41 100644
--- a/Text/Pandoc/ASCIIMathML.hs
+++ b/Text/Pandoc/ASCIIMathML.hs
@@ -1,4 +1,4 @@
-{-# LANGUAGE TemplateHaskell #-}
+{-# LANGUAGE CPP, TemplateHaskell #-}
-- | Definitions for use of ASCIIMathML in HTML.
-- (See <http://www1.chapman.edu/~jipsen/mathml/asciimath.html>.)
module Text.Pandoc.ASCIIMathML ( asciiMathMLScript ) where
@@ -7,6 +7,8 @@ import System.FilePath ( (</>) )
-- | String containing ASCIIMathML javascript.
asciiMathMLScript :: String
+#ifndef __HADDOCK__
asciiMathMLScript = "<script type=\"text/javascript\">\n" ++
$(contentsOf $ "data" </> "ASCIIMathML.js.comment") ++
$(contentsOf $ "data" </> "ASCIIMathML.js.packed") ++ "</script>\n"
+#endif