[Git][ghc/ghc][master] ghc-internal: Eliminate GHC.Internal.Data.Kind

Marge Bot (@marge-bot) gitlab at gitlab.haskell.org
Fri Mar 8 08:33:08 UTC 2024



Marge Bot pushed to branch master at Glasgow Haskell Compiler / GHC


Commits:
50454a29 by Ben Gamari at 2024-03-08T03:32:42-05:00
ghc-internal: Eliminate GHC.Internal.Data.Kind

This was simply reexporting things from `ghc-prim`. Instead reexport
these directly from `Data.Kind`. Also add build ordering dependency to
work around #23942.

- - - - -


6 changed files:

- libraries/base/src/Data/Kind.hs
- libraries/ghc-internal/ghc-internal.cabal
- testsuite/tests/interface-stability/base-exports.stdout
- testsuite/tests/interface-stability/base-exports.stdout-javascript-unknown-ghcjs
- testsuite/tests/interface-stability/base-exports.stdout-mingw32
- testsuite/tests/interface-stability/base-exports.stdout-ws-32


Changes:

=====================================
libraries/base/src/Data/Kind.hs
=====================================
@@ -1,4 +1,4 @@
-{-# LANGUAGE Safe #-}
+{-# LANGUAGE Trustworthy #-}
 
 -- |
 --
@@ -19,4 +19,6 @@ module Data.Kind
      FUN
      ) where
 
-import GHC.Internal.Data.Kind
\ No newline at end of file
+import GHC.Num.BigNat () -- for build ordering (#23942)
+import GHC.Prim (FUN)
+import GHC.Types (Type, Constraint)


=====================================
libraries/ghc-internal/ghc-internal.cabal
=====================================
@@ -120,7 +120,6 @@ Library
         GHC.Internal.Data.Functor.Utils
         GHC.Internal.Data.IORef
         GHC.Internal.Data.Ix
-        GHC.Internal.Data.Kind
         GHC.Internal.Data.List
         GHC.Internal.Data.Maybe
         GHC.Internal.Data.Monoid


=====================================
testsuite/tests/interface-stability/base-exports.stdout
=====================================
@@ -1276,7 +1276,7 @@ module Data.Ix where
     {-# MINIMAL range, (index | GHC.Internal.Ix.unsafeIndex), inRange #-}
 
 module Data.Kind where
-  -- Safety: Safe
+  -- Safety: Trustworthy
   type Constraint :: *
   type Constraint = GHC.Prim.CONSTRAINT GHC.Types.LiftedRep
   type role FUN nominal representational representational


=====================================
testsuite/tests/interface-stability/base-exports.stdout-javascript-unknown-ghcjs
=====================================
@@ -1276,7 +1276,7 @@ module Data.Ix where
     {-# MINIMAL range, (index | GHC.Internal.Ix.unsafeIndex), inRange #-}
 
 module Data.Kind where
-  -- Safety: Safe
+  -- Safety: Trustworthy
   type Constraint :: *
   type Constraint = GHC.Prim.CONSTRAINT GHC.Types.LiftedRep
   type role FUN nominal representational representational


=====================================
testsuite/tests/interface-stability/base-exports.stdout-mingw32
=====================================
@@ -1276,7 +1276,7 @@ module Data.Ix where
     {-# MINIMAL range, (index | GHC.Internal.Ix.unsafeIndex), inRange #-}
 
 module Data.Kind where
-  -- Safety: Safe
+  -- Safety: Trustworthy
   type Constraint :: *
   type Constraint = GHC.Prim.CONSTRAINT GHC.Types.LiftedRep
   type role FUN nominal representational representational


=====================================
testsuite/tests/interface-stability/base-exports.stdout-ws-32
=====================================
@@ -1276,7 +1276,7 @@ module Data.Ix where
     {-# MINIMAL range, (index | GHC.Internal.Ix.unsafeIndex), inRange #-}
 
 module Data.Kind where
-  -- Safety: Safe
+  -- Safety: Trustworthy
   type Constraint :: *
   type Constraint = GHC.Prim.CONSTRAINT GHC.Types.LiftedRep
   type role FUN nominal representational representational



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/50454a299cdef5375ece5fdaf70b36b4a09c3804

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/50454a299cdef5375ece5fdaf70b36b4a09c3804
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/20240308/25a0998b/attachment-0001.html>


More information about the ghc-commits mailing list