[Git][ghc/ghc][wip/T22935] Fix test outputs

Matthew Craven (@clyring) gitlab at gitlab.haskell.org
Sat Sep 7 00:20:20 UTC 2024



Matthew Craven pushed to branch wip/T22935 at Glasgow Haskell Compiler / GHC


Commits:
62ab854c by Matthew Craven at 2024-09-06T20:19:25-04:00
Fix test outputs

- - - - -


4 changed files:

- + libraries/base/tests/T23233.stderr
- libraries/base/tests/T23233.stdout
- testsuite/tests/llvm/should_compile/T5681.hs
- testsuite/tests/simplCore/should_compile/par01.stderr


Changes:

=====================================
libraries/base/tests/T23233.stderr
=====================================
@@ -0,0 +1,2 @@
+eval p
+eval q


=====================================
libraries/base/tests/T23233.stdout
=====================================
@@ -1,2 +1 @@
-eval p
-eval q
+SP 3 144


=====================================
testsuite/tests/llvm/should_compile/T5681.hs
=====================================
@@ -1,6 +1,10 @@
 {-# LANGUAGE Haskell2010 #-}
 {-# LANGUAGE MagicHash, UnboxedTuples #-}
 -- Test case for #5681
+
+{-# OPTIONS_GHC -Wno-deprecations #-}
+  -- The use of the (now-deprecated) primop par# is an
+  -- essential part of the issue that this is meant to test.
 module Main where
 
 import GHC.Exts


=====================================
testsuite/tests/simplCore/should_compile/par01.stderr
=====================================
@@ -1,16 +1,23 @@
 
 ==================== CorePrep ====================
 Result size of CorePrep
-  = {terms: 22, types: 10, coercions: 0, joins: 0/0}
+  = {terms: 31, types: 34, coercions: 0, joins: 0/0}
 
 Rec {
--- RHS size: {terms: 7, types: 3, coercions: 0, joins: 0/0}
+-- RHS size: {terms: 16, types: 27, coercions: 0, joins: 0/0}
 Par01.depth [Occ=LoopBreaker] :: GHC.Types.Int -> GHC.Types.Int
 [GblId, Arity=1, Str=<L>, Unf=OtherCon []]
 Par01.depth
   = \ (d :: GHC.Types.Int) ->
-      case GHC.Prim.par# @GHC.Types.Int d of { __DEFAULT ->
-      Par01.depth d
+      case GHC.Prim.spark#
+             @GHC.Types.Int @GHC.Prim.RealWorld d GHC.Prim.realWorld#
+      of
+      { (# ipv [Occ=Once1], _ [Occ=Dead] #) ->
+      case Par01.depth d of sat [Occ=Once1] { __DEFAULT ->
+      case (# ipv, sat #) of { (# _ [Occ=Dead], ipv3 [Occ=Once1] #) ->
+      ipv3
+      }
+      }
       }
 end Rec }
 



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

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/62ab854c931f1ef50c6607dd930babae5459a9de
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/20240906/7901a203/attachment-0001.html>


More information about the ghc-commits mailing list