[commit: ghc] wip/branchedness: cleanups (edb627d)

git at git.haskell.org git at git.haskell.org
Sat Aug 1 08:22:42 UTC 2015


Repository : ssh://git@git.haskell.org/ghc

On branch  : wip/branchedness
Link       : http://ghc.haskell.org/trac/ghc/changeset/edb627d8fbba9b616f96c00af85946b0aa97ad49/ghc

>---------------------------------------------------------------

commit edb627d8fbba9b616f96c00af85946b0aa97ad49
Author: Gabor Greif <ggreif at gmail.com>
Date:   Sat Aug 1 10:21:10 2015 +0200

    cleanups


>---------------------------------------------------------------

edb627d8fbba9b616f96c00af85946b0aa97ad49
 compiler/basicTypes/MkId.hs              | 2 +-
 compiler/iface/TcIface.hs                | 2 +-
 compiler/main/HscTypes.hs                | 2 +-
 compiler/typecheck/FamInst.hs            | 2 +-
 compiler/typecheck/TcEnv.hs              | 2 +-
 compiler/typecheck/TcEvidence.hs         | 2 +-
 compiler/typecheck/TcTyClsDecls.hs       | 2 +-
 compiler/types/CoAxiom.hs                | 2 --
 compiler/types/Coercion.hs               | 2 +-
 compiler/types/FamInstEnv.hs             | 2 +-
 compiler/types/OptCoercion.hs            | 2 +-
 compiler/types/TyCon.hs                  | 2 +-
 compiler/types/TypeRep.hs                | 2 +-
 compiler/vectorise/Vectorise/Type/Env.hs | 2 +-
 14 files changed, 13 insertions(+), 15 deletions(-)

diff --git a/compiler/basicTypes/MkId.hs b/compiler/basicTypes/MkId.hs
index 784ba1d..bdcaf72 100644
--- a/compiler/basicTypes/MkId.hs
+++ b/compiler/basicTypes/MkId.hs
@@ -12,7 +12,7 @@ have a standard form, namely:
 - primitive operations
 -}
 
-{-# LANGUAGE CPP, DataKinds #-}
+{-# LANGUAGE CPP #-}
 
 module MkId (
         mkDictFunId, mkDictFunTy, mkDictSelId, mkDictSelRhs,
diff --git a/compiler/iface/TcIface.hs b/compiler/iface/TcIface.hs
index dc1bf0f..30ce0cd 100644
--- a/compiler/iface/TcIface.hs
+++ b/compiler/iface/TcIface.hs
@@ -6,7 +6,7 @@
 Type checking of type signatures in interface files
 -}
 
-{-# LANGUAGE CPP, DataKinds #-}
+{-# LANGUAGE CPP #-}
 
 module TcIface (
         tcLookupImported_maybe,
diff --git a/compiler/main/HscTypes.hs b/compiler/main/HscTypes.hs
index 6b8d40d..7bceda5 100644
--- a/compiler/main/HscTypes.hs
+++ b/compiler/main/HscTypes.hs
@@ -4,7 +4,7 @@
 \section[HscTypes]{Types for the per-module compiler}
 -}
 
-{-# LANGUAGE CPP, DataKinds, DeriveDataTypeable, ScopedTypeVariables #-}
+{-# LANGUAGE CPP, DeriveDataTypeable, ScopedTypeVariables #-}
 
 -- | Types for the per-module compiler
 module HscTypes (
diff --git a/compiler/typecheck/FamInst.hs b/compiler/typecheck/FamInst.hs
index 1dfdd21..3af2358 100644
--- a/compiler/typecheck/FamInst.hs
+++ b/compiler/typecheck/FamInst.hs
@@ -1,6 +1,6 @@
 -- The @FamInst@ type: family instance heads
 
-{-# LANGUAGE CPP, DataKinds, GADTs #-}
+{-# LANGUAGE CPP, GADTs #-}
 
 module FamInst (
         FamInstEnvs, tcGetFamInstEnvs,
diff --git a/compiler/typecheck/TcEnv.hs b/compiler/typecheck/TcEnv.hs
index 7f0fd86..8db9f26 100644
--- a/compiler/typecheck/TcEnv.hs
+++ b/compiler/typecheck/TcEnv.hs
@@ -1,6 +1,6 @@
 -- (c) The University of Glasgow 2006
 
-{-# LANGUAGE CPP, DataKinds, FlexibleInstances #-}
+{-# LANGUAGE CPP, FlexibleInstances #-}
 {-# OPTIONS_GHC -fno-warn-orphans #-}  -- instance MonadThings is necessarily an orphan
 
 module TcEnv(
diff --git a/compiler/typecheck/TcEvidence.hs b/compiler/typecheck/TcEvidence.hs
index ab3c9c5..e08d0d5 100644
--- a/compiler/typecheck/TcEvidence.hs
+++ b/compiler/typecheck/TcEvidence.hs
@@ -1,6 +1,6 @@
 -- (c) The University of Glasgow 2006
 
-{-# LANGUAGE CPP, DataKinds, DeriveDataTypeable #-}
+{-# LANGUAGE CPP, DeriveDataTypeable #-}
 
 module TcEvidence (
 
diff --git a/compiler/typecheck/TcTyClsDecls.hs b/compiler/typecheck/TcTyClsDecls.hs
index da68cfa..b7a959e 100644
--- a/compiler/typecheck/TcTyClsDecls.hs
+++ b/compiler/typecheck/TcTyClsDecls.hs
@@ -6,7 +6,7 @@
 TcTyClsDecls: Typecheck type and class declarations
 -}
 
-{-# LANGUAGE CPP, DataKinds, TupleSections #-}
+{-# LANGUAGE CPP, TupleSections #-}
 
 module TcTyClsDecls (
         tcTyAndClassDecls, tcAddImplicits,
diff --git a/compiler/types/CoAxiom.hs b/compiler/types/CoAxiom.hs
index 5f36048..36d9a67 100644
--- a/compiler/types/CoAxiom.hs
+++ b/compiler/types/CoAxiom.hs
@@ -123,9 +123,7 @@ data BranchFlag = Branched | Unbranched
 type Branched = 'Branched
 deriving instance Typeable 'Branched
 type Unbranched = 'Unbranched
---data Branchedness = Unbranched | Branched
 deriving instance Typeable 'Unbranched
---deriving instance Typeable 'Branched
 
 data BranchList a (br :: BranchFlag) where
   FirstBranch :: a -> BranchList a br
diff --git a/compiler/types/Coercion.hs b/compiler/types/Coercion.hs
index 79d3b1c..80fdcc6 100644
--- a/compiler/types/Coercion.hs
+++ b/compiler/types/Coercion.hs
@@ -1,6 +1,6 @@
 -- (c) The University of Glasgow 2006
 
-{-# LANGUAGE CPP, DataKinds, DeriveDataTypeable #-}
+{-# LANGUAGE CPP, DeriveDataTypeable #-}
 
 -- | Module for (a) type kinds and (b) type coercions,
 -- as used in System FC. See 'CoreSyn.Expr' for
diff --git a/compiler/types/FamInstEnv.hs b/compiler/types/FamInstEnv.hs
index 9867551..98071e8 100644
--- a/compiler/types/FamInstEnv.hs
+++ b/compiler/types/FamInstEnv.hs
@@ -2,7 +2,7 @@
 --
 -- FamInstEnv: Type checked family instance declarations
 
-{-# LANGUAGE CPP, DataKinds, GADTs, ScopedTypeVariables #-}
+{-# LANGUAGE CPP, GADTs, ScopedTypeVariables #-}
 
 module FamInstEnv (
         FamInst(..), FamFlavor(..), famInstAxiom, famInstTyCon, famInstRHS,
diff --git a/compiler/types/OptCoercion.hs b/compiler/types/OptCoercion.hs
index e50967b..35d1781 100644
--- a/compiler/types/OptCoercion.hs
+++ b/compiler/types/OptCoercion.hs
@@ -1,6 +1,6 @@
 -- (c) The University of Glasgow 2006
 
-{-# LANGUAGE CPP, DataKinds #-}
+{-# LANGUAGE CPP #-}
 
 module OptCoercion ( optCoercion, checkAxInstCo ) where
 
diff --git a/compiler/types/TyCon.hs b/compiler/types/TyCon.hs
index 76e1d28..683c939 100644
--- a/compiler/types/TyCon.hs
+++ b/compiler/types/TyCon.hs
@@ -6,7 +6,7 @@
 The @TyCon@ datatype
 -}
 
-{-# LANGUAGE CPP, DataKinds, DeriveDataTypeable #-}
+{-# LANGUAGE CPP, DeriveDataTypeable #-}
 
 module TyCon(
         -- * Main TyCon data types
diff --git a/compiler/types/TypeRep.hs b/compiler/types/TypeRep.hs
index b928d6a..b37ca62 100644
--- a/compiler/types/TypeRep.hs
+++ b/compiler/types/TypeRep.hs
@@ -15,7 +15,7 @@ Note [The Type-related module hierarchy]
   Coercion imports Type
 -}
 
-{-# LANGUAGE CPP, DataKinds, DeriveDataTypeable, DeriveFunctor, DeriveFoldable, DeriveTraversable #-}
+{-# LANGUAGE CPP, DeriveDataTypeable, DeriveFunctor, DeriveFoldable, DeriveTraversable #-}
 {-# OPTIONS_HADDOCK hide #-}
 -- We expose the relevant stuff from this module via the Type module
 
diff --git a/compiler/vectorise/Vectorise/Type/Env.hs b/compiler/vectorise/Vectorise/Type/Env.hs
index 4e1e900..47b1caa 100644
--- a/compiler/vectorise/Vectorise/Type/Env.hs
+++ b/compiler/vectorise/Vectorise/Type/Env.hs
@@ -1,4 +1,4 @@
-{-# LANGUAGE CPP, DataKinds #-}
+{-# LANGUAGE CPP #-}
 
 -- Vectorise a modules type and class declarations.
 --



More information about the ghc-commits mailing list