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

On branch  : master

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

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

commit a1be96f5229f77730f5202da019d20c6a1d85bb5
Author: Ian Lynagh <i...@well-typed.com>
Date:   Sat Dec 8 15:49:15 2012 +0000

    Add a test for #7474

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

 tests/indexed-types/should_compile/T7474.hs |   17 +++++++++++++++++
 tests/indexed-types/should_compile/all.T    |    1 +
 2 files changed, 18 insertions(+), 0 deletions(-)

diff --git a/tests/indexed-types/should_compile/T7474.hs 
b/tests/indexed-types/should_compile/T7474.hs
new file mode 100644
index 0000000..081b7d1
--- /dev/null
+++ b/tests/indexed-types/should_compile/T7474.hs
@@ -0,0 +1,17 @@
+
+{-# LANGUAGE TypeFamilies, GADTs, FlexibleContexts, MultiParamTypeClasses #-}
+
+module T7474 where
+
+type family T :: * -> *
+
+data E :: * -> * where
+    E :: C p => T (T p) -> E p
+
+class C' b a where c :: T b -> a
+
+class C' (T a) a => C a
+
+-- f :: C' (T p) a => E p -> a
+f (E d) = c d
+
diff --git a/tests/indexed-types/should_compile/all.T 
b/tests/indexed-types/should_compile/all.T
index 067415d..a255d07 100644
--- a/tests/indexed-types/should_compile/all.T
+++ b/tests/indexed-types/should_compile/all.T
@@ -200,5 +200,6 @@ test('T7156', normal, compile, [''])
 test('T5591a', normal, compile, [''])
 test('T5591b', normal, compile, [''])
 test('T7280', normal, compile, [''])
+test('T7474', normal, compile, [''])
 
 



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

Reply via email to