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

On branch  : master

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

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

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

    Test Trac #4310

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

 tests/typecheck/should_compile/T4310.hs |   11 +++++++++++
 tests/typecheck/should_compile/all.T    |    1 +
 2 files changed, 12 insertions(+), 0 deletions(-)

diff --git a/tests/typecheck/should_compile/T4310.hs 
b/tests/typecheck/should_compile/T4310.hs
new file mode 100644
index 0000000..43b82ca
--- /dev/null
+++ b/tests/typecheck/should_compile/T4310.hs
@@ -0,0 +1,11 @@
+{-# LANGUAGE TypeFamilies, RankNTypes, ScopedTypeVariables, KindSignatures #-}
+
+module T4310 where
+import GHC.ST
+
+type family Mutable a :: * -> * -> *
+
+data New v a = New (forall s. ST s (Mutable v s a))
+
+create :: (forall s. ST s (Mutable v s a)) -> New v a
+create = New
diff --git a/tests/typecheck/should_compile/all.T 
b/tests/typecheck/should_compile/all.T
index acfec5e..a4ad3cf 100644
--- a/tests/typecheck/should_compile/all.T
+++ b/tests/typecheck/should_compile/all.T
@@ -369,4 +369,5 @@ test('T5655', normal, compile, [''])
 test('T5643', normal, compile, [''])
 test('T5595', normal, compile, [''])
 test('T5676', normal, compile, [''])
+test('T4310', normal, compile, [''])
 



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

Reply via email to