Skip to content
GitLab
Explore
Sign in
Register
Primary navigation
Search or go to…
Project
GHC
Manage
Activity
Members
Labels
Plan
Issues
Issue boards
Milestones
Wiki
Requirements
Code
Merge requests
Repository
Branches
Commits
Tags
Repository graph
Compare revisions
Snippets
Locked files
Build
Pipelines
Jobs
Pipeline schedules
Test cases
Artifacts
Deploy
Releases
Package Registry
Model registry
Operate
Terraform modules
Analyze
Value stream analytics
Contributor analytics
CI/CD analytics
Repository analytics
Code review analytics
Issue analytics
Insights
Model experiments
Help
Help
Support
GitLab documentation
Compare GitLab plans
Community forum
Contribute to GitLab
Provide feedback
Terms and privacy
Keyboard shortcuts
?
Snippets
Groups
Projects
Show more breadcrumbs
Gesh
GHC
Commits
8be8b43b
Commit
8be8b43b
authored
27 years ago
by
sof
Browse files
Options
Downloads
Patches
Plain Diff
[project @ 1997-07-25 23:23:18 by sof]
new function: dsExprToGivenTy; removed: dsExprToAtom
parent
9614b62b
Loading
Loading
No related merge requests found
Changes
1
Hide whitespace changes
Inline
Side-by-side
Showing
1 changed file
ghc/compiler/deSugar/DsUtils.lhs
+28
-24
28 additions, 24 deletions
ghc/compiler/deSugar/DsUtils.lhs
with
28 additions
and
24 deletions
ghc/compiler/deSugar/DsUtils.lhs
+
28
−
24
View file @
8be8b43b
...
...
@@ -13,7 +13,7 @@ module DsUtils (
combineGRHSMatchResults,
combineMatchResults,
dsExprToAtom, SYN_IE(DsCoreArg),
dsExprToAtom
GivenTy
, SYN_IE(DsCoreArg),
mkCoAlgCaseMatchResult,
mkAppDs, mkConDs, mkPrimDs, mkErrorAppDs,
mkCoLetsMatchResult,
...
...
@@ -275,39 +275,43 @@ combineGRHSMatchResults match_result1 match_result2
%************************************************************************
\begin{code}
ds
Expr
ToAtom :: DsCoreArg -- The argument expression
ds
Arg
ToAtom :: DsCoreArg -- The argument expression
-> (CoreArg -> DsM CoreExpr) -- Something taking the argument *atom*,
-- and delivering an expression E
-> DsM CoreExpr -- Either E or let x=arg-expr in E
dsExprToAtom (UsageArg u) continue_with = continue_with (UsageArg u)
dsExprToAtom (TyArg t) continue_with = continue_with (TyArg t)
dsExprToAtom (LitArg l) continue_with = continue_with (LitArg l)
dsExprToAtom (VarArg (Var v)) continue_with = continue_with (VarArg v)
dsExprToAtom (VarArg (Lit v)) continue_with = continue_with (LitArg v)
dsExprToAtom (VarArg arg_expr) continue_with
= let
ty = coreExprType arg_expr
in
newSysLocalDs ty `thenDs` \ arg_id ->
dsArgToAtom (UsageArg u) continue_with = continue_with (UsageArg u)
dsArgToAtom (TyArg t) continue_with = continue_with (TyArg t)
dsArgToAtom (LitArg l) continue_with = continue_with (LitArg l)
dsArgToAtom (VarArg arg) continue_with = dsExprToAtomGivenTy arg (coreExprType arg) continue_with
dsExprToAtomGivenTy
:: CoreExpr -- The argument expression
-> Type -- Type of the argument
-> (CoreArg -> DsM CoreExpr) -- Something taking the argument *atom*,
-- and delivering an expression E
-> DsM CoreExpr -- Either E or let x=arg-expr in E
dsExprToAtomGivenTy (Var v) arg_ty continue_with = continue_with (VarArg v)
dsExprToAtomGivenTy (Lit v) arg_ty continue_with = continue_with (LitArg v)
dsExprToAtomGivenTy arg_expr arg_ty continue_with
= newSysLocalDs arg_ty `thenDs` \ arg_id ->
continue_with (VarArg arg_id) `thenDs` \ body ->
returnDs (
if isUnboxedType ty
if isUnboxedType
arg_
ty
then Case arg_expr (PrimAlts [] (BindDefault arg_id body))
else Let (NonRec arg_id arg_expr) body
)
ds
Expr
sToAtoms :: [DsCoreArg]
ds
Arg
sToAtoms :: [DsCoreArg]
-> ([CoreArg] -> DsM CoreExpr)
-> DsM CoreExpr
ds
Expr
sToAtoms [] continue_with = continue_with []
ds
Arg
sToAtoms [] continue_with = continue_with []
ds
Expr
sToAtoms (arg:args) continue_with
= ds
Expr
ToAtom arg $ \ arg_atom ->
ds
Expr
sToAtoms args $ \ arg_atoms ->
ds
Arg
sToAtoms (arg:args) continue_with
= ds
Arg
ToAtom arg $ \ arg_atom ->
ds
Arg
sToAtoms args $ \ arg_atoms ->
continue_with (arg_atom:arg_atoms)
\end{code}
...
...
@@ -325,15 +329,15 @@ mkConDs :: Id -> [DsCoreArg] -> DsM CoreExpr
mkPrimDs :: PrimOp -> [DsCoreArg] -> DsM CoreExpr
mkAppDs fun args
= ds
Expr
sToAtoms args $ \ atoms ->
= ds
Arg
sToAtoms args $ \ atoms ->
returnDs (mkGenApp fun atoms)
mkConDs con args
= ds
Expr
sToAtoms args $ \ atoms ->
returnDs (Con
con atoms)
= ds
Arg
sToAtoms args $ \ atoms ->
returnDs (Con con atoms)
mkPrimDs op args
= ds
Expr
sToAtoms args $ \ atoms ->
= ds
Arg
sToAtoms args $ \ atoms ->
returnDs (Prim op atoms)
\end{code}
...
...
This diff is collapsed.
Click to expand it.
Preview
0%
Loading
Try again
or
attach a new file
.
Cancel
You are about to add
0
people
to the discussion. Proceed with caution.
Finish editing this message first!
Save comment
Cancel
Please
register
or
sign in
to comment