aboutsummaryrefslogtreecommitdiff
path: root/src/Text/Pandoc
diff options
context:
space:
mode:
authorJohn MacFarlane <jgm@berkeley.edu>2019-03-27 11:38:24 -0700
committerJohn MacFarlane <jgm@berkeley.edu>2019-03-27 11:38:24 -0700
commit3ecc8d154b8c00263e1eff45450836087a7d0b80 (patch)
tree0d018a00971161c0f7cf0012458420bd5fd582e1 /src/Text/Pandoc
parenta43c0bf54b80b8043a4205b46edc220eb7d2725e (diff)
downloadpandoc-3ecc8d154b8c00263e1eff45450836087a7d0b80.tar.gz
Drop support for ghc < 8.
Diffstat (limited to 'src/Text/Pandoc')
-rw-r--r--src/Text/Pandoc/Class.hs8
-rw-r--r--src/Text/Pandoc/PDF.hs4
-rw-r--r--src/Text/Pandoc/Readers/Docx.hs3
3 files changed, 0 insertions, 15 deletions
diff --git a/src/Text/Pandoc/Class.hs b/src/Text/Pandoc/Class.hs
index 9a3f2aa65..1a2b00b26 100644
--- a/src/Text/Pandoc/Class.hs
+++ b/src/Text/Pandoc/Class.hs
@@ -9,10 +9,6 @@
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE UndecidableInstances #-}
{-# LANGUAGE ScopedTypeVariables #-}
-#if MIN_VERSION_base(4,8,0)
-#else
-{-# LANGUAGE OverlappingInstances #-}
-#endif
{- |
Module : Text.Pandoc.Class
Copyright : Copyright (C) 2016-17 Jesse Rosenthal, John MacFarlane
@@ -1041,11 +1037,7 @@ instance (MonadTrans t, PandocMonad m, Functor (t m),
putCommonState = lift . putCommonState
logOutput = lift . logOutput
-#if MIN_VERSION_base(4,8,0)
instance {-# OVERLAPS #-} PandocMonad m => PandocMonad (ParsecT s st m) where
-#else
-instance PandocMonad m => PandocMonad (ParsecT s st m) where
-#endif
lookupEnv = lift . lookupEnv
getCurrentTime = lift getCurrentTime
getCurrentTimeZone = lift getCurrentTimeZone
diff --git a/src/Text/Pandoc/PDF.hs b/src/Text/Pandoc/PDF.hs
index 9f5bc7a8d..a8c50c3ae 100644
--- a/src/Text/Pandoc/PDF.hs
+++ b/src/Text/Pandoc/PDF.hs
@@ -34,11 +34,7 @@ import System.FilePath
import System.IO (stdout)
import System.IO.Temp (withSystemTempDirectory, withTempDirectory,
withTempFile)
-#if MIN_VERSION_base(4,8,3)
import System.IO.Error (IOError, isDoesNotExistError)
-#else
-import System.IO.Error (isDoesNotExistError)
-#endif
import Text.Pandoc.Definition
import Text.Pandoc.Error (PandocError (PandocPDFProgramNotFoundError))
import Text.Pandoc.MIME (getMimeType)
diff --git a/src/Text/Pandoc/Readers/Docx.hs b/src/Text/Pandoc/Readers/Docx.hs
index d04e8575f..c74380cb8 100644
--- a/src/Text/Pandoc/Readers/Docx.hs
+++ b/src/Text/Pandoc/Readers/Docx.hs
@@ -79,9 +79,6 @@ import Text.Pandoc.Readers.Docx.Parse
import Text.Pandoc.Shared
import Text.Pandoc.Walk
import Text.TeXMath (writeTeX)
-#if !(MIN_VERSION_base(4,8,0))
-import Data.Traversable (traverse)
-#endif
import Control.Monad.Except (throwError)
import Text.Pandoc.Class (PandocMonad)
import qualified Text.Pandoc.Class as P