Skip to content

Commit

Permalink
remove outdated CPP
Browse files Browse the repository at this point in the history
  • Loading branch information
byorgey committed Jul 10, 2023
1 parent 48d796d commit 5221844
Show file tree
Hide file tree
Showing 4 changed files with 0 additions and 23 deletions.
4 changes: 0 additions & 4 deletions src/Diagrams/Anchors.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,3 @@
{-# LANGUAGE CPP #-}
{-# LANGUAGE DefaultSignatures #-}
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE TypeFamilies #-}
Expand Down Expand Up @@ -59,9 +58,6 @@ import qualified Data.Map as Map
import Data.Maybe (fromJust, fromMaybe)
import qualified Data.Set as Set
import Data.Typeable (Typeable)
#if !MIN_VERSION_base(4,11,0)
import Data.Semigroup
#endif

import Linear.Vector
import Linear.V2
Expand Down
5 changes: 0 additions & 5 deletions src/Diagrams/Lens.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,3 @@
{-# LANGUAGE CPP #-}
{-# LANGUAGE ConstraintKinds #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
Expand Down Expand Up @@ -35,10 +34,6 @@ module Diagrams.Lens
, _lineSegments
) where

#if __GLASGOW_HASKELL__ < 710
import Control.Applicative
import Data.Foldable
#endif
import Diagrams.BoundingBox
import Diagrams.Prelude

Expand Down
9 changes: 0 additions & 9 deletions src/Diagrams/TwoD/Layout/Tree.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,3 @@
{-# LANGUAGE CPP #-}
{-# LANGUAGE DeriveFoldable #-}
{-# LANGUAGE DeriveFunctor #-}
{-# LANGUAGE DeriveTraversable #-}
Expand Down Expand Up @@ -171,14 +170,6 @@ import Diagrams
import Linear ((*^))
import Linear.Affine

#if !MIN_VERSION_base(4,11,0)
import Data.Semigroup
#endif

#if __GLASGOW_HASKELL__ < 710
import Control.Applicative
#endif

------------------------------------------------------------
-- Binary trees
------------------------------------------------------------
Expand Down
5 changes: 0 additions & 5 deletions src/Diagrams/TwoD/Path/IteratedSubset.hs
Original file line number Diff line number Diff line change
@@ -1,4 +1,3 @@
{-# LANGUAGE CPP #-}
{-# LANGUAGE ExplicitForAll #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE MultiParamTypeClasses #-}
Expand Down Expand Up @@ -535,10 +534,6 @@ data IterTrailConfig n = ITC { seed :: Trail' Line V2 n -- ^ The seed trail
-- code and modify it to suit.
randITC ::
(MonadRandom m,
#if MIN_VERSION_base(4,9,0)
#else
Applicative m,
#endif
Ord n, Floating n, Random n) =>
m (IterTrailConfig n)
randITC = do
Expand Down

0 comments on commit 5221844

Please sign in to comment.