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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/9149af85d7b3b2d5083b1ff7f3b90c097f6a442d

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

commit 9149af85d7b3b2d5083b1ff7f3b90c097f6a442d
Author: Simon Peyton Jones <simo...@microsoft.com>
Date:   Fri Oct 26 16:18:22 2012 +0100

    Test Trac #7341

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

 tests/polykinds/T7341.hs                           |   12 ++++++++++++
 .../T5472.stdout => polykinds/T7341.stderr}        |    0 
 tests/polykinds/all.T                              |    1 +
 3 files changed, 13 insertions(+), 0 deletions(-)

diff --git a/tests/polykinds/T7341.hs b/tests/polykinds/T7341.hs
new file mode 100644
index 0000000..1c91847
--- /dev/null
+++ b/tests/polykinds/T7341.hs
@@ -0,0 +1,12 @@
+{-# LANGUAGE KindSignatures, TypeFamilies, PolyKinds #-}
+
+module T7341 where
+
+data Proxy a = Proxy
+
+class C a where
+  type F (a :: *) :: *
+  op :: Proxy a -> Int
+
+instance C [] where
+  op _ = 5
diff --git a/tests/deSugar/should_run/T5472.stdout 
b/tests/polykinds/T7341.stderr
similarity index 100%
copy from tests/deSugar/should_run/T5472.stdout
copy to tests/polykinds/T7341.stderr
diff --git a/tests/polykinds/all.T b/tests/polykinds/all.T
index 686562f..dc6bb53 100644
--- a/tests/polykinds/all.T
+++ b/tests/polykinds/all.T
@@ -76,4 +76,5 @@ test('Holdermans', normal, compile_fail,[''])
 test('T7328', normal, compile_fail,[''])
 test('T7332', normal, compile,[''])
 test('T7347', normal, compile_fail,[''])
+test('T7341', normal, compile_fail,[''])
 



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

Reply via email to