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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/143fc5b61f5abf875c8005c5be9fa1187b8c6749

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

commit 143fc5b61f5abf875c8005c5be9fa1187b8c6749
Author: Ian Lynagh <[email protected]>
Date:   Thu Jun 16 00:53:24 2011 +0100

    Remove the tcrun007 test
    
    It was testing the old Generics extension, which has now been
    removed.

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

 tests/ghc-regress/typecheck/should_run/all.T       |    1 -
 tests/ghc-regress/typecheck/should_run/tcrun007.hs |   61 --------------------
 .../typecheck/should_run/tcrun007.stdout           |    5 --
 3 files changed, 0 insertions(+), 67 deletions(-)

diff --git a/tests/ghc-regress/typecheck/should_run/all.T 
b/tests/ghc-regress/typecheck/should_run/all.T
index f373ffb..a66586f 100644
--- a/tests/ghc-regress/typecheck/should_run/all.T
+++ b/tests/ghc-regress/typecheck/should_run/all.T
@@ -21,7 +21,6 @@ def f(opts):
 setTestOpts(f)
 
 test('tcrun006', normal, compile_and_run, [''])
-test('tcrun007', normal, compile_and_run, [''])
 test('tcrun008', normal, compile_and_run, [''])
 test('tcrun009', normal, compile_and_run, [''])
 test('tcrun010', normal, compile_and_run, [''])
diff --git a/tests/ghc-regress/typecheck/should_run/tcrun007.hs 
b/tests/ghc-regress/typecheck/should_run/tcrun007.hs
deleted file mode 100644
index aacf12d..0000000
--- a/tests/ghc-regress/typecheck/should_run/tcrun007.hs
+++ /dev/null
@@ -1,61 +0,0 @@
-
-{-# LANGUAGE Generics, TypeOperators #-}
-
--- !!! Test generics
-module Main where
-
-import GHC.Base
-
-class Bin a where
-  toBin   :: a -> [Int]
-  fromBin :: [Int] -> (a, [Int])
-
-  toBin {| Unit |}    Unit     = []
-  toBin {| a :+: b |} (Inl x)   = 0 : toBin x
-  toBin {| a :+: b |} (Inr y)   = 1 : toBin y
-  toBin {| a :*: b |} (x :*: y) = toBin x ++ toBin y
-
-
-  fromBin {| Unit |}    bs      = (Unit, bs)
-  fromBin {| a :+: b |} (0:bs)  = (Inl x, bs') where (x,bs') = fromBin bs
-  fromBin {| a :+: b |} (1:bs)  = (Inr y, bs') where (y,bs') = fromBin bs
-  fromBin {| a :*: b |} bs     = (x :*: y, bs'') where (x,bs' ) = fromBin bs
-                                                       (y,bs'') = fromBin bs'
-
-
-class Tag a where
-  nCons :: a -> Int
-  nCons {| Unit |}    _ = 1
-  nCons {| a :*: b |} _ = 1
-  nCons {| a :+: b |} _ = nCons (bot::a) + nCons (bot::b)
-
-  tag :: a -> Int
-  tag {| Unit |}    _      = 1
-  tag {| a :*: b |} _      = 1   
-  tag {| a :+: b |} (Inl x) = tag x
-  tag {| a :+: b |} (Inr y) = nCons (bot::a) + tag y
-  
-bot = bot
-
-instance (Bin a, Bin b) => Bin (a,b)
-instance Bin a => Bin [a]
-instance Bin a => Bin (T a)
-
-instance Bin Int where
-  toBin x = [x]
-  fromBin (x:xs) = (x,xs)
-
-data T a = MkT a (T a) (T a) | Nil deriving Show
-
-instance Tag Colour 
-data Colour = Red | Blue | Green | Purple | White
-
-t :: T Int
-t = MkT 3 (MkT 6 Nil Nil) Nil
-
-main = print (toBin t) >>
-       print ((fromBin (toBin t))::(T Int,[Int])) >>
-       print (tag Blue) >>
-       print (tag White) >>
-       print (nCons Red)
-
diff --git a/tests/ghc-regress/typecheck/should_run/tcrun007.stdout 
b/tests/ghc-regress/typecheck/should_run/tcrun007.stdout
deleted file mode 100644
index 3b451bf..0000000
--- a/tests/ghc-regress/typecheck/should_run/tcrun007.stdout
+++ /dev/null
@@ -1,5 +0,0 @@
-[0,3,0,6,1,1,1]
-(MkT 3 (MkT 6 Nil Nil) Nil,[])
-2
-5
-5



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

Reply via email to