summaryrefslogtreecommitdiff
path: root/ghc/compiler/hsSyn/HsExpr.hi-boot-6
diff options
context:
space:
mode:
authorsimonmar <unknown>2002-03-14 15:47:55 +0000
committersimonmar <unknown>2002-03-14 15:47:55 +0000
commitb9312420f355a3b6f24f3bd732300d9e03f59268 (patch)
treef80e04d21f2e88ffcf338f0e0d8f97588063eec6 /ghc/compiler/hsSyn/HsExpr.hi-boot-6
parent1553c7788e7f663bfc55813158325d695a21a229 (diff)
downloadhaskell-b9312420f355a3b6f24f3bd732300d9e03f59268.tar.gz
[project @ 2002-03-14 15:47:52 by simonmar]
Remove the interface file parser, and move .hi-boot parsing into the main parser. The syntax of .hi-boot files is now greatly improved in terms of readability; here's an example: module M where data T f :: T -> GHC.Base.Int note that (a) layout can be used (b) there's no explcit export list; everything declared is implicitly exported (c) Z-encoding of names is no longer required (d) Any identifier not declared in the current module must still be quailified with the module which originally defined it (eg. GHC.Base.Int above). We'd like to relax (d), but that will come later.
Diffstat (limited to 'ghc/compiler/hsSyn/HsExpr.hi-boot-6')
-rw-r--r--ghc/compiler/hsSyn/HsExpr.hi-boot-618
1 files changed, 10 insertions, 8 deletions
diff --git a/ghc/compiler/hsSyn/HsExpr.hi-boot-6 b/ghc/compiler/hsSyn/HsExpr.hi-boot-6
index bf952e3fdf..fd32ceb5ed 100644
--- a/ghc/compiler/hsSyn/HsExpr.hi-boot-6
+++ b/ghc/compiler/hsSyn/HsExpr.hi-boot-6
@@ -1,12 +1,14 @@
-__interface HsExpr 1 0 where
-__export HsExpr HsExpr pprExpr Match GRHSs pprPatBind pprFunBind ;
+module HsExpr where
-1 data HsExpr i p ;
-1 pprExpr :: __forall [i p] {Outputable.Outputable i, Outputable.Outputable p} => HsExpr.HsExpr i p -> Outputable.SDoc ;
+data HsExpr i p
+data Match a b
+data GRHSs a b
-1 data Match a b ;
-1 data GRHSs a b ;
+pprExpr :: (Outputable.Outputable i, Outputable.Outputable p) =>
+ HsExpr.HsExpr i p -> Outputable.SDoc
-1 pprPatBind :: __forall [i p] {Outputable.Outputable i, Outputable.Outputable p} => p -> HsExpr.GRHSs i p -> Outputable.SDoc ;
-1 pprFunBind :: __forall [i p] {Outputable.Outputable i, Outputable.Outputable p} => i -> [HsExpr.Match i p] -> Outputable.SDoc ;
+pprPatBind :: (Outputable.Outputable i, Outputable.Outputable p) =>
+ p -> HsExpr.GRHSs i p -> Outputable.SDoc
+pprFunBind :: (Outputable.Outputable i, Outputable.Outputable p) =>
+ i -> [HsExpr.Match i p] -> Outputable.SDoc