[commit: ghc] wip/angerman/llvmng: Adds test (4eac8fe)

git at git.haskell.org git at git.haskell.org
Wed Feb 7 06:39:53 UTC 2018


Repository : ssh://git@git.haskell.org/ghc

On branch  : wip/angerman/llvmng
Link       : http://ghc.haskell.org/trac/ghc/changeset/4eac8fe493ab00da87ce1fa059fed12271e8f0a5/ghc

>---------------------------------------------------------------

commit 4eac8fe493ab00da87ce1fa059fed12271e8f0a5
Author: Moritz Angermann <moritz.angermann at gmail.com>
Date:   Thu Sep 21 22:07:44 2017 +0800

    Adds test


>---------------------------------------------------------------

4eac8fe493ab00da87ce1fa059fed12271e8f0a5
 testsuite/tests/codeGen/should_run/T14251.hs     | 22 ++++++++++++++++++++++
 testsuite/tests/codeGen/should_run/T14251.stdout |  1 +
 testsuite/tests/codeGen/should_run/all.T         |  2 +-
 3 files changed, 24 insertions(+), 1 deletion(-)

diff --git a/testsuite/tests/codeGen/should_run/T14251.hs b/testsuite/tests/codeGen/should_run/T14251.hs
new file mode 100644
index 0000000..6f552e1
--- /dev/null
+++ b/testsuite/tests/codeGen/should_run/T14251.hs
@@ -0,0 +1,22 @@
+{-# LANGUAGE MagicHash, BangPatterns #-}
+module Main where
+
+-- A minor modification from T8064.hs.
+--
+-- The key here is that we ensure that
+-- subsequently passed floats do not
+-- accidentally end up in previous
+-- registers.
+--
+
+import GHC.Exts
+
+{-# NOINLINE f #-}
+f :: (Int# -> Float# -> Double# -> Float# -> Double# -> String) -> String
+f g = g 3# 4.0# 5.0## 6.0# 6.9## ++ " World!"
+
+{-# NOINLINE q #-}
+q :: Int# -> Float# -> Double# -> Float# -> Double# -> String
+q i j k l m = "Hello " ++ show (F# l) ++ " " ++ show (D# m)
+
+main = putStrLn (f $ q)
diff --git a/testsuite/tests/codeGen/should_run/T14251.stdout b/testsuite/tests/codeGen/should_run/T14251.stdout
new file mode 100644
index 0000000..8ec577b
--- /dev/null
+++ b/testsuite/tests/codeGen/should_run/T14251.stdout
@@ -0,0 +1 @@
+Hello 6.0 6.9 World!
diff --git a/testsuite/tests/codeGen/should_run/all.T b/testsuite/tests/codeGen/should_run/all.T
index 9403c4b..1711260 100644
--- a/testsuite/tests/codeGen/should_run/all.T
+++ b/testsuite/tests/codeGen/should_run/all.T
@@ -166,4 +166,4 @@ test('T13825-unit',
      compile_and_run,
      ['-package ghc'])
 test('T14619', normal, compile_and_run, [''])
-test('T14754', normal, compile_and_run, [''])
+test('T14754', normal, compile_and_run, ['-O2'])



More information about the ghc-commits mailing list