From 1bda1b2e226f0dab69d938953a4f579e45646b33 Mon Sep 17 00:00:00 2001
From: sof <unknown>
Date: Mon, 26 May 1997 04:37:33 +0000
Subject: [PATCH] [project @ 1997-05-26 04:37:33 by sof] Updated imports

---
 ghc/compiler/hsSyn/HsMatches.lhs | 14 +++++++++++---
 1 file changed, 11 insertions(+), 3 deletions(-)

diff --git a/ghc/compiler/hsSyn/HsMatches.lhs b/ghc/compiler/hsSyn/HsMatches.lhs
index ef370e330aa2..d4f4cae4f62b 100644
--- a/ghc/compiler/hsSyn/HsMatches.lhs
+++ b/ghc/compiler/hsSyn/HsMatches.lhs
@@ -12,15 +12,19 @@ module HsMatches where
 
 IMP_Ubiq(){-uitous-}
 
-IMPORT_DELOOPER(HsLoop)		( HsExpr, Stmt, nullBinds, HsBinds )
-import Outputable	--( ifPprShowAll )
+-- Friends
+import HsExpr		( HsExpr, Stmt )
+import HsBinds		( HsBinds, nullBinds )
+
+-- Others
+import Outputable	( ifPprShowAll, PprStyle )
 import PprType		( GenType{-instance Outputable-} )
 import Pretty
 import SrcLoc		( SrcLoc{-instances-} )
 import Util		( panic )
+import Outputable	( Outputable(..) )
 #if __GLASGOW_HASKELL__ >= 202
 import Name
-import PprStyle
 #endif
        
 \end{code}
@@ -130,6 +134,10 @@ pprMatch sty is_case first_match
 
 ----------------------------------------------------------
 
+pprGRHSsAndBinds :: (NamedThing id, Outputable id, Outputable pat,
+	            Eq tyvar, Outputable tyvar, Eq uvar, Outputable uvar) =>
+		PprStyle -> Bool -> GRHSsAndBinds tyvar uvar id pat -> Doc
+
 pprGRHSsAndBinds sty is_case (GRHSsAndBindsIn grhss binds)
  = ($$) (vcat (map (pprGRHS sty is_case) grhss))
 	   (if (nullBinds binds)
-- 
GitLab