[Git][ghc/ghc][wip/int-index/list-tuple-cleanup] tests: Extrapolate base-exports.stdout diff to other platforms

Vladislav Zavialov (@int-index) gitlab at gitlab.haskell.org
Fri Aug 23 08:59:27 UTC 2024



Vladislav Zavialov pushed to branch wip/int-index/list-tuple-cleanup at Glasgow Haskell Compiler / GHC


Commits:
22ee9ad1 by Vladislav Zavialov at 2024-08-23T10:58:52+02:00
tests: Extrapolate base-exports.stdout diff to other platforms

- - - - -


3 changed files:

- 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:

=====================================
testsuite/tests/interface-stability/base-exports.stdout-javascript-unknown-ghcjs
=====================================
@@ -3329,6 +3329,7 @@ module GHC.Base where
   data MVar# a b
   type Maybe :: * -> *
   data Maybe a = Nothing | Just a
+  MkSolo# :: forall (k :: RuntimeRep) (a :: TYPE k). a -> (# a #)
   type Module :: *
   data Module = Module TrName TrName
   type Monad :: (* -> *) -> Constraint
@@ -5494,6 +5495,7 @@ module GHC.Exts where
   type role MVar# nominal representational
   type MVar# :: forall {l :: Levity}. * -> TYPE (BoxedRep l) -> UnliftedType
   data MVar# a b
+  MkSolo# :: forall (k :: RuntimeRep) (a :: TYPE k). a -> (# a #)
   type MultMul :: Multiplicity -> Multiplicity -> Multiplicity
   type family MultMul a b where
     forall (x :: Multiplicity). MultMul One x = x


=====================================
testsuite/tests/interface-stability/base-exports.stdout-mingw32
=====================================
@@ -3329,6 +3329,7 @@ module GHC.Base where
   data MVar# a b
   type Maybe :: * -> *
   data Maybe a = Nothing | Just a
+  MkSolo# :: forall (k :: RuntimeRep) (a :: TYPE k). a -> (# a #)
   type Module :: *
   data Module = Module TrName TrName
   type Monad :: (* -> *) -> Constraint
@@ -5671,6 +5672,7 @@ module GHC.Exts where
   type role MVar# nominal representational
   type MVar# :: forall {l :: Levity}. * -> TYPE (BoxedRep l) -> UnliftedType
   data MVar# a b
+  MkSolo# :: forall (k :: RuntimeRep) (a :: TYPE k). a -> (# a #)
   type MultMul :: Multiplicity -> Multiplicity -> Multiplicity
   type family MultMul a b where
     forall (x :: Multiplicity). MultMul One x = x


=====================================
testsuite/tests/interface-stability/base-exports.stdout-ws-32
=====================================
@@ -3329,6 +3329,7 @@ module GHC.Base where
   data MVar# a b
   type Maybe :: * -> *
   data Maybe a = Nothing | Just a
+  MkSolo# :: forall (k :: RuntimeRep) (a :: TYPE k). a -> (# a #)
   type Module :: *
   data Module = Module TrName TrName
   type Monad :: (* -> *) -> Constraint
@@ -5525,6 +5526,7 @@ module GHC.Exts where
   type role MVar# nominal representational
   type MVar# :: forall {l :: Levity}. * -> TYPE (BoxedRep l) -> UnliftedType
   data MVar# a b
+  MkSolo# :: forall (k :: RuntimeRep) (a :: TYPE k). a -> (# a #)
   type MultMul :: Multiplicity -> Multiplicity -> Multiplicity
   type family MultMul a b where
     forall (x :: Multiplicity). MultMul One x = x



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

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/22ee9ad1a4baf5d551c8d9f1218da292220fddec
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/20240823/05bfa5c1/attachment-0001.html>


More information about the ghc-commits mailing list