aboutsummaryrefslogtreecommitdiff
path: root/src/hsmarkdown.hs
diff options
context:
space:
mode:
Diffstat (limited to 'src/hsmarkdown.hs')
-rw-r--r--src/hsmarkdown.hs5
1 files changed, 5 insertions, 0 deletions
diff --git a/src/hsmarkdown.hs b/src/hsmarkdown.hs
index ed4695193..3f689d4ec 100644
--- a/src/hsmarkdown.hs
+++ b/src/hsmarkdown.hs
@@ -29,8 +29,13 @@ Wrapper around pandoc that emulates Markdown.pl as closely as possible.
module Main where
import System.Process
import System.Environment ( getArgs )
+-- Note: ghc >= 6.12 (base >=4.2) supports unicode through iconv
+-- So we use System.IO.UTF8 only if we have an earlier version
+#if MIN_VERSION_base(4,2,0)
+#else
import Prelude hiding ( putStr, putStrLn, writeFile, readFile, getContents )
import System.IO.UTF8
+#endif
import Control.Monad (forM_)
main :: IO ()