[commit: ghc] wip/T14677: add test (246ed44)

git at git.haskell.org git at git.haskell.org
Sun Mar 31 15:07:57 UTC 2019


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

On branch  : wip/T14677
Link       : http://ghc.haskell.org/trac/ghc/changeset/246ed44a7ec0cf0f3fae12fdaf4077fec3350475/ghc

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

commit 246ed44a7ec0cf0f3fae12fdaf4077fec3350475
Author: Gabor Greif <ggreif at gmail.com>
Date:   Sun Jan 6 20:43:16 2019 +0100

    add test


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

246ed44a7ec0cf0f3fae12fdaf4077fec3350475
 testsuite/tests/codeGen/should_run/T14677.hs                        | 5 +++++
 testsuite/tests/codeGen/should_run/{T9533c.stdout => T14677.stdout} | 0
 testsuite/tests/codeGen/should_run/all.T                            | 2 ++
 3 files changed, 7 insertions(+)

diff --git a/testsuite/tests/codeGen/should_run/T14677.hs b/testsuite/tests/codeGen/should_run/T14677.hs
new file mode 100644
index 0000000..268f22f
--- /dev/null
+++ b/testsuite/tests/codeGen/should_run/T14677.hs
@@ -0,0 +1,5 @@
+module T14677 where
+
+import GHC.Event
+
+main = print evtWrite
diff --git a/testsuite/tests/codeGen/should_run/T9533c.stdout b/testsuite/tests/codeGen/should_run/T14677.stdout
similarity index 100%
copy from testsuite/tests/codeGen/should_run/T9533c.stdout
copy to testsuite/tests/codeGen/should_run/T14677.stdout
diff --git a/testsuite/tests/codeGen/should_run/all.T b/testsuite/tests/codeGen/should_run/all.T
index 7f976b8..f3bf1e0 100644
--- a/testsuite/tests/codeGen/should_run/all.T
+++ b/testsuite/tests/codeGen/should_run/all.T
@@ -192,3 +192,5 @@ test('T15892',
         # happen, so -G1 -A32k:
         extra_run_opts('+RTS -G1 -A32k -RTS') ],
      compile_and_run, ['-O'])
+
+test('T14677', normal, compile_and_run, ['-O'])



More information about the ghc-commits mailing list