[commit: ghc] master: Add (failing) test case for #7672. (a27fb46)

git at git.haskell.org git at git.haskell.org
Mon Jun 1 17:57:37 UTC 2015


Repository : ssh://git@git.haskell.org/ghc

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/a27fb46ff1ea46a45e0084c3db92a24475e3bab5/ghc

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

commit a27fb46ff1ea46a45e0084c3db92a24475e3bab5
Author: Edward Z. Yang <ezyang at cs.stanford.edu>
Date:   Mon Jun 1 10:39:48 2015 -0700

    Add (failing) test case for #7672.
    
    Signed-off-by: Edward Z. Yang <ezyang at cs.stanford.edu>


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

a27fb46ff1ea46a45e0084c3db92a24475e3bab5
 testsuite/tests/rename/should_compile/T7672.hs      | 3 +++
 testsuite/tests/rename/should_compile/T7672.hs-boot | 2 ++
 testsuite/tests/rename/should_compile/T7672a.hs     | 2 ++
 testsuite/tests/rename/should_compile/all.T         | 1 +
 4 files changed, 8 insertions(+)

diff --git a/testsuite/tests/rename/should_compile/T7672.hs b/testsuite/tests/rename/should_compile/T7672.hs
new file mode 100644
index 0000000..405c853
--- /dev/null
+++ b/testsuite/tests/rename/should_compile/T7672.hs
@@ -0,0 +1,3 @@
+module T7672 where
+import qualified T7672a
+data T = S B.T
diff --git a/testsuite/tests/rename/should_compile/T7672.hs-boot b/testsuite/tests/rename/should_compile/T7672.hs-boot
new file mode 100644
index 0000000..90b4f16
--- /dev/null
+++ b/testsuite/tests/rename/should_compile/T7672.hs-boot
@@ -0,0 +1,2 @@
+module T7672 where
+data T
diff --git a/testsuite/tests/rename/should_compile/T7672a.hs b/testsuite/tests/rename/should_compile/T7672a.hs
new file mode 100644
index 0000000..361c770
--- /dev/null
+++ b/testsuite/tests/rename/should_compile/T7672a.hs
@@ -0,0 +1,2 @@
+module T7672a(Decl.T) where
+import {-# SOURCE #-} qualified T7672 as Decl
diff --git a/testsuite/tests/rename/should_compile/all.T b/testsuite/tests/rename/should_compile/all.T
index 0747f98..fc5d125 100644
--- a/testsuite/tests/rename/should_compile/all.T
+++ b/testsuite/tests/rename/should_compile/all.T
@@ -212,6 +212,7 @@ test('T7167', normal, compile, [''])
 test('T7336', expect_broken(7336), compile, ['-Wall'])
 
 test('T2435', normal, multimod_compile, ['T2435','-v0'])
+test('T7672', expect_broken(7672), multimod_compile, ['T7672',''])
 test('T7963',
      [extra_clean(['T7963a.hi', 'T7963a.o',
                    'T7963.imports'])],



More information about the ghc-commits mailing list