[Git][ghc/ghc][wip/T22010] Comment out lift deriving in Word64Map/Set

Jaro Reinders (@Noughtmare) gitlab at gitlab.haskell.org
Wed Jun 21 11:38:19 UTC 2023



Jaro Reinders pushed to branch wip/T22010 at Glasgow Haskell Compiler / GHC


Commits:
9129d59f by Jaro Reinders at 2023-06-21T13:38:05+02:00
Comment out lift deriving in Word64Map/Set

- - - - -


2 changed files:

- compiler/GHC/Data/Word64Map/Internal.hs
- compiler/GHC/Data/Word64Set/Internal.hs


Changes:

=====================================
compiler/GHC/Data/Word64Map/Internal.hs
=====================================
@@ -2,7 +2,7 @@
 {-# LANGUAGE BangPatterns #-}
 {-# LANGUAGE PatternGuards #-}
 #ifdef __GLASGOW_HASKELL__
-{-# LANGUAGE DeriveLift #-}
+-- {-# LANGUAGE DeriveLift #-}
 {-# LANGUAGE MagicHash #-}
 {-# LANGUAGE ScopedTypeVariables #-}
 {-# LANGUAGE StandaloneDeriving #-}
@@ -326,9 +326,9 @@ import Data.Data (Data(..), Constr, mkConstr, constrIndex, Fixity(Prefix),
 import GHC.Exts (build)
 import qualified GHC.Exts as GHCExts
 import Text.Read
-import Language.Haskell.TH.Syntax (Lift)
+-- import Language.Haskell.TH.Syntax (Lift)
 -- See Note [ Template Haskell Dependencies ]
-import Language.Haskell.TH ()
+-- import Language.Haskell.TH ()
 #endif
 import qualified Control.Category as Category
 import Data.Word
@@ -381,7 +381,7 @@ type Word64SetPrefix = Word64
 type Word64SetBitMap = Word64
 
 -- | @since 0.6.6
-deriving instance Lift a => Lift (Word64Map a)
+-- deriving instance Lift a => Lift (Word64Map a)
 
 bitmapOf :: Word64 -> Word64SetBitMap
 bitmapOf x = shiftLL 1 (fromIntegral (x .&. Word64Set.suffixBitMask))


=====================================
compiler/GHC/Data/Word64Set/Internal.hs
=====================================
@@ -2,7 +2,7 @@
 {-# LANGUAGE BangPatterns #-}
 {-# LANGUAGE PatternGuards #-}
 #ifdef __GLASGOW_HASKELL__
-{-# LANGUAGE DeriveLift #-}
+-- {-# LANGUAGE DeriveLift #-}
 {-# LANGUAGE MagicHash #-}
 {-# LANGUAGE StandaloneDeriving #-}
 {-# LANGUAGE TypeFamilies #-}
@@ -219,9 +219,9 @@ import Text.Read
 
 #if __GLASGOW_HASKELL__
 import qualified GHC.Exts
-import Language.Haskell.TH.Syntax (Lift)
+-- import Language.Haskell.TH.Syntax (Lift)
 -- See Note [ Template Haskell Dependencies ]
-import Language.Haskell.TH ()
+-- import Language.Haskell.TH ()
 #endif
 
 import qualified Data.Foldable as Foldable
@@ -278,10 +278,10 @@ type Mask   = Word64
 type BitMap = Word64
 type Key    = Word64
 
-#ifdef __GLASGOW_HASKELL__
+-- #ifdef __GLASGOW_HASKELL__
 -- | @since 0.6.6
-deriving instance Lift Word64Set
-#endif
+-- deriving instance Lift Word64Set
+-- #endif
 
 instance Monoid Word64Set where
     mempty  = empty



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/9129d59fa1a5b16b555f466bc570f72ea45366e2

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/9129d59fa1a5b16b555f466bc570f72ea45366e2
You're receiving this email because of your account on gitlab.haskell.org.


-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://mail.haskell.org/pipermail/ghc-commits/attachments/20230621/ebdf9650/attachment-0001.html>


More information about the ghc-commits mailing list