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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/8c206820212fa7ae32d65605b0abac8b050ae2c7

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

commit 8c206820212fa7ae32d65605b0abac8b050ae2c7
Author: Simon Peyton Jones <[email protected]>
Date:   Thu Nov 17 14:19:10 2011 +0000

    Test Trac #5597

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

 tests/th/T5597.hs  |    5 +++++
 tests/th/T5597a.hs |    6 ++++++
 tests/th/all.T     |    2 ++
 3 files changed, 13 insertions(+), 0 deletions(-)

diff --git a/tests/th/T5597.hs b/tests/th/T5597.hs
new file mode 100644
index 0000000..b6ab9da
--- /dev/null
+++ b/tests/th/T5597.hs
@@ -0,0 +1,5 @@
+{-# LANGUAGE TemplateHaskell #-}
+module T5597 where
+import T5597a( f )
+
+g = $(f [t| (Int, Int) |])
diff --git a/tests/th/T5597a.hs b/tests/th/T5597a.hs
new file mode 100644
index 0000000..eeea7f5
--- /dev/null
+++ b/tests/th/T5597a.hs
@@ -0,0 +1,6 @@
+{-# LANGUAGE TemplateHaskell #-}
+module T5597a where
+import Language.Haskell.TH
+
+f :: Q Type -> Q Exp
+f t = [| (3,4) :: $t |]
diff --git a/tests/th/all.T b/tests/th/all.T
index 91432cf..a2121bd 100644
--- a/tests/th/all.T
+++ b/tests/th/all.T
@@ -213,3 +213,5 @@ test('TH_Depends',
                    'TH_Depends_external.txt'])],
      run_command,
      ['$MAKE -s --no-print-directory TH_Depends'])
+test('T5597', extra_clean(['T5597a.hi','T5597a.o']), 
+              multimod_compile, ['T5597','-v0'])



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

Reply via email to