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

On branch  : master

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

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

commit ff0b4a0d133a91a3751de89ad091c5ae55f57598
Author: Simon Peyton Jones <simo...@microsoft.com>
Date:   Wed Dec 19 17:26:22 2012 +0000

    Test Trac #7489

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

 tests/indexed-types/should_compile/T7489.hs |   12 ++++++++++++
 tests/indexed-types/should_compile/all.T    |    1 +
 2 files changed, 13 insertions(+), 0 deletions(-)

diff --git a/tests/indexed-types/should_compile/T7489.hs 
b/tests/indexed-types/should_compile/T7489.hs
new file mode 100644
index 0000000..70cb560
--- /dev/null
+++ b/tests/indexed-types/should_compile/T7489.hs
@@ -0,0 +1,12 @@
+{-# LANGUAGE EmptyDataDecls, GADTs, TypeFamilies #-}
+
+module T7489 where
+
+data Credit
+data Debit
+
+data family Account (s :: *) (t :: *)
+
+data instance Account Int t where
+  CAccount :: Account Int Credit
+  DAccount :: {  debitAccountPostings :: [Int] } -> Account Int Debit
diff --git a/tests/indexed-types/should_compile/all.T 
b/tests/indexed-types/should_compile/all.T
index a255d07..2f94d95 100644
--- a/tests/indexed-types/should_compile/all.T
+++ b/tests/indexed-types/should_compile/all.T
@@ -201,5 +201,6 @@ test('T5591a', normal, compile, [''])
 test('T5591b', normal, compile, [''])
 test('T7280', normal, compile, [''])
 test('T7474', normal, compile, [''])
+test('T7489', normal, compile, [''])
 
 



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

Reply via email to