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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/bbe714323b5b2491403902b70f0e124cf79d147f

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

commit bbe714323b5b2491403902b70f0e124cf79d147f
Author: Simon Peyton Jones <[email protected]>
Date:   Thu Dec 29 10:33:19 2011 +0000

    Test Trac #5721

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

 tests/th/T5721.hs |    7 +++++++
 tests/th/all.T    |    1 +
 2 files changed, 8 insertions(+), 0 deletions(-)

diff --git a/tests/th/T5721.hs b/tests/th/T5721.hs
new file mode 100644
index 0000000..9fcecc7
--- /dev/null
+++ b/tests/th/T5721.hs
@@ -0,0 +1,7 @@
+{-# LANGUAGE TemplateHaskell, ScopedTypeVariables #-}  
+
+module T5371 where
+import Language.Haskell.TH
+
+f :: a -> Name
+f (x :: a) = ''a
diff --git a/tests/th/all.T b/tests/th/all.T
index 9c08427..03d7bdb 100644
--- a/tests/th/all.T
+++ b/tests/th/all.T
@@ -219,4 +219,5 @@ test('T5665', extra_clean(['T5665a.hi','T5665a.o']),
               multimod_compile, ['T5665','-v0'])
 test('T5700', extra_clean(['T5700a.hi','T5700a.o']), 
               multimod_compile, ['T5700','-v0 -ddump-splices'])
+test('T5721', normal, compile, ['-v0'])
 



_______________________________________________
Cvs-ghc mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to