diff --git a/ghc/compiler/tests/wdp-array.hs b/ghc/compiler/tests/wdp-array.hs deleted file mode 100644 index f3432c2bdc9f8831fba801720cc0dc9ea0bd8ca9..0000000000000000000000000000000000000000 --- a/ghc/compiler/tests/wdp-array.hs +++ /dev/null @@ -1,4 +0,0 @@ -import MiniPrel - -a :: Array Int Int -a = array (1,100) ((1 := 1) : [i := i * a!(i-1) | i <- [2..100]]) diff --git a/ghc/compiler/tests/wdp-otherwise.hs b/ghc/compiler/tests/wdp-otherwise.hs deleted file mode 100644 index c59b949a48de791d3c584cafd862e06db48d1bf2..0000000000000000000000000000000000000000 --- a/ghc/compiler/tests/wdp-otherwise.hs +++ /dev/null @@ -1,11 +0,0 @@ --- this is legal, I think (WDP) - -module Confused where - -import Prelude hiding (otherwise) - -otherwise = False - -f x | otherwise = 1 - -g otherwise | otherwise = 2 diff --git a/ghc/compiler/tests/wdp-ppr.hs b/ghc/compiler/tests/wdp-ppr.hs deleted file mode 100644 index 563e752b909ea8c20dcb475cca0c4f54ec042558..0000000000000000000000000000000000000000 --- a/ghc/compiler/tests/wdp-ppr.hs +++ /dev/null @@ -1,13 +0,0 @@ -{- -From: Kubiak Ryszard <fozzie> -To: partain -Subject: You may test the new pretty-printer on the following text: -Date: Wed, 2 Oct 91 18:06:05 BST --} - -data LList alpha = Nill | Conss alpha (LList alpha) - -append :: LList a -> LList a -> LList a -append xs ys = case xs of - Nill -> ys - (Conss z zs) -> Conss z (append zs ys) diff --git a/ghc/compiler/tests/wdp-prel-insts.hs b/ghc/compiler/tests/wdp-prel-insts.hs deleted file mode 100644 index 00a06cbecef608f66880ecb52d94b0c2a9d33a57..0000000000000000000000000000000000000000 --- a/ghc/compiler/tests/wdp-prel-insts.hs +++ /dev/null @@ -1,8 +0,0 @@ --- what error do you get if you redefined PreludeCore instances? - -module Test where - -f x@(a,b) y@(c,d) = x == y - -instance Eq (a,b) where - (m,n) == (o,p) = m == o