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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/6401a905ad8de4720b2e189675b4a9162c482004

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

commit 6401a905ad8de4720b2e189675b4a9162c482004
Author: Simon Peyton Jones <simo...@microsoft.com>
Date:   Wed Nov 21 11:29:44 2012 +0000

    Test Trac #7422

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

 tests/polykinds/T7422.hs |   17 +++++++++++++++++
 tests/polykinds/all.T    |    1 +
 2 files changed, 18 insertions(+), 0 deletions(-)

diff --git a/tests/polykinds/T7422.hs b/tests/polykinds/T7422.hs
new file mode 100644
index 0000000..dbf9e12
--- /dev/null
+++ b/tests/polykinds/T7422.hs
@@ -0,0 +1,17 @@
+{-# LANGUAGE StandaloneDeriving, DataKinds, KindSignatures, DeriveGeneric, 
GADTs#-}
+
+module T7422 where
+
+import GHC.Generics
+
+type CellId = Int
+type Ident = String
+type LabelName = String
+
+data ExprTag = TagAst | TagEval
+
+data Expr (tag :: ExprTag) where
+  Var :: Ident -> Expr tag
+  Label :: LabelName -> Expr tag -> Expr tag
+
+deriving instance Generic (Expr a)
diff --git a/tests/polykinds/all.T b/tests/polykinds/all.T
index dc6bb53..869ccdc 100644
--- a/tests/polykinds/all.T
+++ b/tests/polykinds/all.T
@@ -77,4 +77,5 @@ test('T7328', normal, compile_fail,[''])
 test('T7332', normal, compile,[''])
 test('T7347', normal, compile_fail,[''])
 test('T7341', normal, compile_fail,[''])
+test('T7422', normal, compile,[''])
 



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

Reply via email to