[Git][ghc/ghc][wip/ghc-internals-move] base-exports

Ben Gamari (@bgamari) gitlab at gitlab.haskell.org
Fri Jan 26 20:07:05 UTC 2024



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


Commits:
aec5beb9 by Ben Gamari at 2024-01-26T15:06:57-05:00
base-exports

- - - - -


1 changed file:

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


Changes:

=====================================
testsuite/tests/interface-stability/base-exports.stdout
=====================================
@@ -5144,7 +5144,7 @@ module GHC.Constants where
   -- Safety: Trustworthy
 
 module GHC.Desugar where
-  -- Safety: Safe-Inferred
+  -- Safety: Safe
   (>>>) :: 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: Safe-Inferred
+  -- Safety: Safe
   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: Safe-Inferred
+  -- Safety: Safe
   type CString :: *
   type CString = GHC.Ptr.Ptr Foreign.C.Types.CChar
   type CStringLen :: *



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

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/aec5beb900cac94afbf226ea8dda39699b13ee3a
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/20240126/2977d261/attachment-0001.html>


More information about the ghc-commits mailing list