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

On branch  : master

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

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

commit f2a617e766e6fb2d3efc9bca3ad09f9ba11a9a61
Author: Simon Peyton Jones <simo...@microsoft.com>
Date:   Fri Oct 5 16:37:22 2012 +0100

    Test Trac #7294

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

 tests/gadt/{T7293.hs => T7294.hs} |    1 +
 tests/gadt/T7294.stderr           |    9 +++++++++
 tests/gadt/all.T                  |    1 +
 3 files changed, 11 insertions(+), 0 deletions(-)

diff --git a/tests/gadt/T7293.hs b/tests/gadt/T7294.hs
similarity index 94%
copy from tests/gadt/T7293.hs
copy to tests/gadt/T7294.hs
index 26d9188..1c39a2a 100644
--- a/tests/gadt/T7293.hs
+++ b/tests/gadt/T7294.hs
@@ -1,3 +1,4 @@
+{-# OPTIONS_GHC -fdefer-type-errors #-}
 {-# LANGUAGE GADTs, DataKinds, KindSignatures, TypeFamilies,
              TypeOperators, RankNTypes #-}
 
diff --git a/tests/gadt/T7294.stderr b/tests/gadt/T7294.stderr
new file mode 100644
index 0000000..dc1eef1
--- /dev/null
+++ b/tests/gadt/T7294.stderr
@@ -0,0 +1,9 @@
+
+T7294.hs:25:5: Warning:
+    Couldn't match type 'False with 'True
+    Inaccessible code in
+      a pattern with constructor
+        Nil :: forall a. Vec a 'Zero,
+      in an equation for `nth'
+    In the pattern: Nil
+    In an equation for `nth': nth Nil _ = undefined
diff --git a/tests/gadt/all.T b/tests/gadt/all.T
index 566afcb..f28e28d 100644
--- a/tests/gadt/all.T
+++ b/tests/gadt/all.T
@@ -115,3 +115,4 @@ test('T5424',
 test('FloatEq', normal, compile, [''])
 test('T7205', normal, compile, [''])
 test('T7293', normal, compile_fail, [''])
+test('T7294', normal, compile, [''])



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

Reply via email to