summaryrefslogtreecommitdiff
path: root/ghc/compiler/codeGen
diff options
context:
space:
mode:
Diffstat (limited to 'ghc/compiler/codeGen')
-rw-r--r--ghc/compiler/codeGen/CgBindery.hi-bootbin270 -> 1407 bytes
-rw-r--r--ghc/compiler/codeGen/CgBindery.lhs-boot11
-rw-r--r--ghc/compiler/codeGen/CgExpr.hi-bootbin109 -> 1948 bytes
-rw-r--r--ghc/compiler/codeGen/CgExpr.lhs-boot7
-rw-r--r--ghc/compiler/codeGen/ClosureInfo.lhs-boot6
5 files changed, 24 insertions, 0 deletions
diff --git a/ghc/compiler/codeGen/CgBindery.hi-boot b/ghc/compiler/codeGen/CgBindery.hi-boot
index f80decba35..398791a038 100644
--- a/ghc/compiler/codeGen/CgBindery.hi-boot
+++ b/ghc/compiler/codeGen/CgBindery.hi-boot
Binary files differ
diff --git a/ghc/compiler/codeGen/CgBindery.lhs-boot b/ghc/compiler/codeGen/CgBindery.lhs-boot
new file mode 100644
index 0000000000..e504a6a9ba
--- /dev/null
+++ b/ghc/compiler/codeGen/CgBindery.lhs-boot
@@ -0,0 +1,11 @@
+\begin{code}
+module CgBindery where
+import VarEnv( IdEnv )
+
+data CgIdInfo
+data VolatileLoc
+data StableLoc
+type CgBindings = IdEnv CgIdInfo
+
+nukeVolatileBinds :: CgBindings -> CgBindings
+\end{code} \ No newline at end of file
diff --git a/ghc/compiler/codeGen/CgExpr.hi-boot b/ghc/compiler/codeGen/CgExpr.hi-boot
index a091afa31f..6794d184cd 100644
--- a/ghc/compiler/codeGen/CgExpr.hi-boot
+++ b/ghc/compiler/codeGen/CgExpr.hi-boot
Binary files differ
diff --git a/ghc/compiler/codeGen/CgExpr.lhs-boot b/ghc/compiler/codeGen/CgExpr.lhs-boot
new file mode 100644
index 0000000000..29cdc3a605
--- /dev/null
+++ b/ghc/compiler/codeGen/CgExpr.lhs-boot
@@ -0,0 +1,7 @@
+\begin{code}
+module CgExpr where
+import StgSyn( StgExpr )
+import CgMonad( Code )
+
+cgExpr :: StgExpr -> Code
+\end{code}
diff --git a/ghc/compiler/codeGen/ClosureInfo.lhs-boot b/ghc/compiler/codeGen/ClosureInfo.lhs-boot
new file mode 100644
index 0000000000..b069905d3e
--- /dev/null
+++ b/ghc/compiler/codeGen/ClosureInfo.lhs-boot
@@ -0,0 +1,6 @@
+\begin{code}
+module ClosureInfo where
+
+data LambdaFormInfo
+data ClosureInfo
+\end{code} \ No newline at end of file