aboutsummaryrefslogtreecommitdiff
path: root/Text/Pandoc/ASCIIMathML.hs
diff options
context:
space:
mode:
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