[Git][ghc/ghc][wip/24327] testsuite: Add test for #24327

Zubin (@wz1000) gitlab at gitlab.haskell.org
Thu Jan 18 09:01:05 UTC 2024



Zubin pushed to branch wip/24327 at Glasgow Haskell Compiler / GHC


Commits:
f2f469a7 by Zubin Duggal at 2024-01-18T14:30:58+05:30
testsuite: Add test for #24327

- - - - -


4 changed files:

- + testsuite/tests/ghci/T24327/T24327.hs
- + testsuite/tests/ghci/T24327/T24327.script
- + testsuite/tests/ghci/T24327/T24327A.hs
- + testsuite/tests/ghci/T24327/all.T


Changes:

=====================================
testsuite/tests/ghci/T24327/T24327.hs
=====================================
@@ -0,0 +1,6 @@
+module T24327 where
+import T24327A
+
+bar :: Int
+bar = foo1 'a' 1
+


=====================================
testsuite/tests/ghci/T24327/T24327.script
=====================================
@@ -0,0 +1 @@
+:l T24327


=====================================
testsuite/tests/ghci/T24327/T24327A.hs
=====================================
@@ -0,0 +1,10 @@
+module T24327A where
+
+{-# INLINE foo1 #-}
+foo1 :: Char -> Int -> Int
+foo1 _  y = bar1 y
+
+{-# INLINE bar1 #-}
+bar1 :: Int -> Int
+bar1 x = length [1..10] + x
+


=====================================
testsuite/tests/ghci/T24327/all.T
=====================================
@@ -0,0 +1 @@
+test('T24327', [extra_ways(['ghci-ext-prof']), only_ways(['ghci-ext-prof']), extra_files(['T24327A.hs', 'T24327.hs']), extra_hc_opts('-fno-unoptimized-core-for-interpreter -O')], ghci_script, ['T24327.script'])



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

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/f2f469a7d941237f252a7a76257028b26953f0c8
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/20240118/1cb70e21/attachment-0001.html>


More information about the ghc-commits mailing list