dd53545154
We use no custom Prelude with the latest ghc version (8.4.1), so we don't have problems with ghci. See https://ghc.haskell.org/trac/ghc/ticket/10920 https://www.reddit.com/r/haskell/comments/3ryf2p/how_can_you_use_a_custom_prelude_with_ghci/ This may help with #4464.
17 lines
365 B
Haskell
17 lines
365 B
Haskell
{-# LANGUAGE NoImplicitPrelude #-}
|
|
{-# LANGUAGE PackageImports #-}
|
|
{-# LANGUAGE CPP #-}
|
|
|
|
-- The intent is that this Prelude provide the API of
|
|
-- the base 4.11 Prelude in a way that is portable for
|
|
-- all base versions.
|
|
|
|
module Prelude
|
|
(
|
|
module Prelude.Compat
|
|
, Semigroup(..)
|
|
)
|
|
where
|
|
|
|
import Prelude.Compat
|
|
import Data.Semigroup (Semigroup(..)) -- includes (<>)
|