Skip to content
GitLab
Menu
Projects
Groups
Snippets
Help
Help
Support
Community forum
Keyboard shortcuts
?
Submit feedback
Sign in / Register
Toggle navigation
Menu
Open sidebar
Tobias Decking
GHC
Commits
e4137764
Commit
e4137764
authored
Oct 09, 2006
by
Ian Lynagh
Browse files
Update hi-boot files to fix building with old GHCs
parent
9cef40bd
Changes
4
Hide whitespace changes
Inline
Side-by-side
compiler/iface/TcIface.hi-boot-6
View file @
e4137764
module TcIface where
tcIfaceDecl :: IfaceSyn.IfaceDecl -> TcRnTypes.IfL TypeRep.TyThing
tcIfaceDecl ::
GHC.Base.Bool ->
IfaceSyn.IfaceDecl -> TcRnTypes.IfL TypeRep.TyThing
tcIfaceInst :: IfaceSyn.IfaceInst -> TcRnTypes.IfL InstEnv.Instance
tcIfaceRule
:: IfaceSyn.IfaceRule -> TcRnTypes.IfL CoreSyn.CoreRule
tcIfaceRule
s
::
GHC.Base.Bool -> [
IfaceSyn.IfaceRule
]
-> TcRnTypes.IfL
[
CoreSyn.CoreRule
]
compiler/parser/HaddockLex.hi-boot-6
0 → 100644
View file @
e4137764
module HaddockLex where
tokenise :: GHC.Base.String -> [Token]
data Token
= TokPara
| TokNumber
| TokBullet
| TokDefStart
| TokDefEnd
| TokSpecial GHC.Base.Char
| TokIdent [RdrName.RdrName]
| TokString GHC.Base.String
| TokURL GHC.Base.String
| TokAName GHC.Base.String
| TokBirdTrack GHC.Base.String
compiler/typecheck/TcMatches.hi-boot-6
View file @
e4137764
...
...
@@ -2,9 +2,9 @@ module TcMatches where
tcGRHSsPat :: HsExpr.GRHSs Name.Name
-> TcType.BoxyRhoType
-> TcRnTypes.TcM (HsExpr.GRHSs
Var.
Id)
-> TcRnTypes.TcM (HsExpr.GRHSs
TcRnTypes.Tc
Id)
tcMatchesFun :: Name.Name
-> HsExpr.MatchGroup Name.Name
-> TcType.BoxyRhoType
-> TcRnTypes.TcM (HsBinds.
ExprCoFn
, HsExpr.MatchGroup
Var.
Id)
-> TcRnTypes.TcM (HsBinds.
HsWrapper
, HsExpr.MatchGroup
TcRnTypes.Tc
Id)
compiler/types/TypeRep.hi-boot-6
View file @
e4137764
...
...
@@ -3,4 +3,5 @@ module TypeRep where
data Type
data PredType
data TyThing
type Kind = Type
Write
Preview
Supports
Markdown
0%
Try again
or
attach a new file
.
Attach a file
Cancel
You are about to add
0
people
to the discussion. Proceed with caution.
Finish editing this message first!
Cancel
Please
register
or
sign in
to comment