From 0223e7466c2ee9fb735fa4f5e5b537408133700f Mon Sep 17 00:00:00 2001
From: sof <unknown>
Date: Thu, 14 Aug 1997 18:33:26 +0000
Subject: [PATCH] [project @ 1997-08-14 18:33:23 by sof] Moved to tests/etc

---
 ghc/compiler/tests/wdp-array.hs      |  4 ----
 ghc/compiler/tests/wdp-otherwise.hs  | 11 -----------
 ghc/compiler/tests/wdp-ppr.hs        | 13 -------------
 ghc/compiler/tests/wdp-prel-insts.hs |  8 --------
 4 files changed, 36 deletions(-)
 delete mode 100644 ghc/compiler/tests/wdp-array.hs
 delete mode 100644 ghc/compiler/tests/wdp-otherwise.hs
 delete mode 100644 ghc/compiler/tests/wdp-ppr.hs
 delete mode 100644 ghc/compiler/tests/wdp-prel-insts.hs

diff --git a/ghc/compiler/tests/wdp-array.hs b/ghc/compiler/tests/wdp-array.hs
deleted file mode 100644
index f3432c2bdc9f..000000000000
--- 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 c59b949a48de..000000000000
--- 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 563e752b909e..000000000000
--- 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 00a06cbecef6..000000000000
--- 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
-- 
GitLab