pandoc/prelude/Prelude.hs
John MacFarlane e21b57991e Added custom prelude.
We need this again because of Monoid/Semigroup.
2018-03-16 10:21:54 -07:00

22 lines
368 B
Haskell

{-# LANGUAGE PackageImports #-}
{-# LANGUAGE CPP #-}
module Prelude
(
module P
, Monoid(..)
, Semigroup(..)
, Applicative(..)
#if MIN_VERSION_base(4,9,0)
-- <> is exported in Semigroup
#else
, (<>)
#endif
)
where
import "base" Prelude as P
import Data.Semigroup (Semigroup(..)) -- includes (<>)
#if MIN_VERSION_base(4,11,0)
import Data.Monoid (Monoid(..))
#endif