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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/6be5743a472e60b80bfac59757440845127e44d5

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

commit 6be5743a472e60b80bfac59757440845127e44d5
Author: Daniel Fischer <[email protected]>
Date:   Sat Jul 2 17:39:16 2011 +0200

    Rename T1595 because there is T1595 in typecheck/should_fail already

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

 tests/ghc-regress/rename/should_fail/T1595.stderr  |    2 --
 .../rename/should_fail/{T1595.hs => T1595a.hs}     |    2 +-
 tests/ghc-regress/rename/should_fail/T1595a.stderr |    2 ++
 tests/ghc-regress/rename/should_fail/all.T         |    2 +-
 4 files changed, 4 insertions(+), 4 deletions(-)

diff --git a/tests/ghc-regress/rename/should_fail/T1595.stderr 
b/tests/ghc-regress/rename/should_fail/T1595.stderr
deleted file mode 100644
index 82ad07c..0000000
--- a/tests/ghc-regress/rename/should_fail/T1595.stderr
+++ /dev/null
@@ -1,2 +0,0 @@
-
-T1595.hs:3:20: Not in scope: type constructor or class `Tpyo'
diff --git a/tests/ghc-regress/rename/should_fail/T1595.hs 
b/tests/ghc-regress/rename/should_fail/T1595a.hs
similarity index 72%
rename from tests/ghc-regress/rename/should_fail/T1595.hs
rename to tests/ghc-regress/rename/should_fail/T1595a.hs
index 8029878..5497a7a 100644
--- a/tests/ghc-regress/rename/should_fail/T1595.hs
+++ b/tests/ghc-regress/rename/should_fail/T1595a.hs
@@ -1,4 +1,4 @@
-module T1595 where
+module T1595a where
 
 a, b :: Integer -> Tpyo
 a = undefined
diff --git a/tests/ghc-regress/rename/should_fail/T1595a.stderr 
b/tests/ghc-regress/rename/should_fail/T1595a.stderr
new file mode 100644
index 0000000..3c9adca
--- /dev/null
+++ b/tests/ghc-regress/rename/should_fail/T1595a.stderr
@@ -0,0 +1,2 @@
+
+T1595a.hs:3:20: Not in scope: type constructor or class `Tpyo'
diff --git a/tests/ghc-regress/rename/should_fail/all.T 
b/tests/ghc-regress/rename/should_fail/all.T
index 6b56ae7..78d35ce 100644
--- a/tests/ghc-regress/rename/should_fail/all.T
+++ b/tests/ghc-regress/rename/should_fail/all.T
@@ -80,4 +80,4 @@ test('T4042', normal, compile_fail, [''])
 test('mc13', normal, compile_fail, [''])
 test('mc14', normal, compile_fail, [''])
 test('T5211', normal, compile, [''])  # Warnings only
-test('T1595', normal, compile_fail, ['']) 
+test('T1595a', normal, compile_fail, [''])



_______________________________________________
Cvs-ghc mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to