Repository : ssh://darcs.haskell.org//srv/darcs/testsuite

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/848b138724b215a1c4e6b4f6b2247abf6392f782

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

commit 848b138724b215a1c4e6b4f6b2247abf6392f782
Author: Simon Peyton Jones <simo...@microsoft.com>
Date:   Wed Oct 3 08:44:20 2012 +0100

    Test Trac #7287

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

 tests/simplCore/should_compile/T7287.hs |    8 ++++++++
 tests/simplCore/should_compile/all.T    |    1 +
 2 files changed, 9 insertions(+), 0 deletions(-)

diff --git a/tests/simplCore/should_compile/T7287.hs 
b/tests/simplCore/should_compile/T7287.hs
new file mode 100644
index 0000000..1d777bd
--- /dev/null
+++ b/tests/simplCore/should_compile/T7287.hs
@@ -0,0 +1,8 @@
+{-# LANGUAGE MagicHash #-}
+module T7287 where
+
+import GHC.Prim
+
+{-# RULES
+  "int2Word#/word2Int#" forall x. int2Word# (word2Int# x) = x
+  #-}
diff --git a/tests/simplCore/should_compile/all.T 
b/tests/simplCore/should_compile/all.T
index 973342a..e9b9aa3 100644
--- a/tests/simplCore/should_compile/all.T
+++ b/tests/simplCore/should_compile/all.T
@@ -153,4 +153,5 @@ test('T7165',
      extra_clean(['T7165a.hi', 'T7165a.o']),
      run_command,
      ['$MAKE -s --no-print-directory T7165'])
+test('T7287', normal, compile, [''])
 



_______________________________________________
Cvs-ghc mailing list
Cvs-ghc@haskell.org
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to