[commit: testsuite] master: Fix a failing test. (34eafd6)

git at git.haskell.org git
Fri Oct 4 00:39:17 UTC 2013


Repository : ssh://git at git.haskell.org/testsuite

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/34eafd69d0f5df619670010ae3202210f2239306/testsuite

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

commit 34eafd69d0f5df619670010ae3202210f2239306
Author: Iavor S. Diatchki <diatchki at galois.com>
Date:   Thu Oct 3 17:39:11 2013 -0700

    Fix a failing test.
    
    GHC.TypeLits does not export `Sing` anymore, so we just define it
    locally.


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

34eafd69d0f5df619670010ae3202210f2239306
 tests/indexed-types/should_fail/T7786.hs |    4 ++--
 1 file changed, 2 insertions(+), 2 deletions(-)

diff --git a/tests/indexed-types/should_fail/T7786.hs b/tests/indexed-types/should_fail/T7786.hs
index 59c5fec..72cf061 100644
--- a/tests/indexed-types/should_fail/T7786.hs
+++ b/tests/indexed-types/should_fail/T7786.hs
@@ -4,8 +4,8 @@
              FlexibleContexts, ScopedTypeVariables #-}
 module T7786 where
 
-
-import GHC.TypeLits
+import GHC.TypeLits(Symbol,Nat)
+data family Sing (a :: k)
 
 data Inventory a = Empty | More (Inventory a) a
 




More information about the ghc-commits mailing list