[Git][ghc/ghc][wip/ghc-internals-move] 2 commits: base-exports

Ben Gamari (@bgamari) gitlab at gitlab.haskell.org
Wed Jan 24 01:50:55 UTC 2024



Ben Gamari pushed to branch wip/ghc-internals-move at Glasgow Haskell Compiler / GHC


Commits:
fdadbe16 by Ben Gamari at 2024-01-23T20:47:29-05:00
base-exports

- - - - -
a9396924 by Ben Gamari at 2024-01-23T20:50:47-05:00
Haddock

- - - - -


2 changed files:

- testsuite/tests/interface-stability/base-exports.stdout
- utils/haddock


Changes:

=====================================
testsuite/tests/interface-stability/base-exports.stdout
=====================================
@@ -5144,7 +5144,7 @@ module GHC.Constants where
   -- Safety: Trustworthy
 
 module GHC.Desugar where
-  -- Safety: Trustworthy
+  -- Safety: Safe-Inferred
   (>>>) :: forall (arr :: * -> * -> *) a b c. Control.Arrow.Arrow arr => arr a b -> arr b c -> arr a c
   type AnnotationWrapper :: *
   data AnnotationWrapper = forall a. Data.Data.Data a => AnnotationWrapper a
@@ -5200,7 +5200,7 @@ module GHC.Err where
   undefined :: forall (r :: GHC.Types.RuntimeRep) (a :: TYPE r). GHC.Stack.Types.HasCallStack => a
 
 module GHC.Event where
-  -- Safety: Trustworthy
+  -- Safety: Safe-Inferred
   type Event :: *
   newtype Event = ...
   type EventManager :: *
@@ -7247,7 +7247,7 @@ module GHC.Float.RealFracMethods where
   truncateFloatInteger :: GHC.Types.Float -> GHC.Num.Integer.Integer
 
 module GHC.Foreign where
-  -- Safety: Trustworthy
+  -- Safety: Safe-Inferred
   type CString :: *
   type CString = GHC.Ptr.Ptr Foreign.C.Types.CChar
   type CStringLen :: *
@@ -10736,7 +10736,7 @@ module Text.Show.Functions where
   -- Safety: Safe
 
 module Type.Reflection where
-  -- Safety: Trustworthy
+  -- Safety: Safe-Inferred
   type role (:~:) nominal nominal
   type (:~:) :: forall {k}. k -> k -> *
   data (:~:) a b where


=====================================
utils/haddock
=====================================
@@ -1 +1 @@
-Subproject commit b0b0e0366457c9aefebcc94df74e5de4d00e17b7
+Subproject commit 37935de33400b8f4b9844f9243d74e2f9079875a



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/compare/11fa889a038fb93c784225704726f09cb0a4774a...a9396924a580255a67c04b19a9cc2ff3d9c27cec

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/compare/11fa889a038fb93c784225704726f09cb0a4774a...a9396924a580255a67c04b19a9cc2ff3d9c27cec
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/20240123/6d17b659/attachment-0001.html>


More information about the ghc-commits mailing list