2 % (c) The University of Glasgow 2006
3 % (c) The GRASP/AQUA Project, Glasgow University, 1992-1998
7 module CgExpr ( cgExpr ) where
9 #include "HsVersions.h"
47 This module provides the support code for @StgToAbstractC@ to deal
48 with STG {\em expressions}. See also @CgClosure@, which deals
49 with closures, and @CgCon@, which deals with constructors.
52 cgExpr :: StgExpr -- input
56 %********************************************************
60 %********************************************************
62 ``Applications'' mean {\em tail calls}, a service provided by module
63 @CgTailCall@. This includes literals, which show up as
64 @(STGApp (StgLitArg 42) [])@.
67 cgExpr (StgApp fun args) = cgTailCall fun args
70 %********************************************************
72 %* STG ConApps (for inline versions) *
74 %********************************************************
77 cgExpr (StgConApp con args)
78 = do { amodes <- getArgAmodes args
79 ; cgReturnDataCon con amodes }
82 Literals are similar to constructors; they return by putting
83 themselves in an appropriate register and returning to the address on
88 = do { cmm_lit <- cgLit lit
89 ; performPrimReturn rep (CmmLit cmm_lit) }
91 rep = (typeCgRep) (literalType lit)
95 %********************************************************
97 %* PrimOps and foreign calls.
99 %********************************************************
101 NOTE about "safe" foreign calls: a safe foreign call is never compiled
102 inline in a case expression. When we see
104 case (ccall ...) of { ... }
106 We generate a proper return address for the alternatives and push the
107 stack frame before doing the call, so that in the event that the call
108 re-enters the RTS the stack is in a sane state.
111 cgExpr (StgOpApp (StgFCallOp fcall _) stg_args res_ty) = do
113 First, copy the args into temporaries. We're going to push
114 a return address right before doing the call, so the args
115 must be out of the way.
117 reps_n_amodes <- getArgAmodes stg_args
119 -- Get the *non-void* args, and jiggle them with shimForeignCall
120 arg_exprs = [ shimForeignCallArg stg_arg expr
121 | (stg_arg, (rep,expr)) <- stg_args `zip` reps_n_amodes,
124 arg_tmps <- mapM assignTemp arg_exprs
125 let arg_hints = zip arg_tmps (map (typeHint.stgArgType) stg_args)
127 Now, allocate some result regs.
129 (res_reps,res_regs,res_hints) <- newUnboxedTupleRegs res_ty
130 ccallReturnUnboxedTuple (zip res_reps (map CmmReg res_regs)) $
131 emitForeignCall (zip res_regs res_hints) fcall
132 arg_hints emptyVarSet{-no live vars-}
134 -- tagToEnum# is special: we need to pull the constructor out of the table,
135 -- and perform an appropriate return.
137 cgExpr (StgOpApp (StgPrimOp TagToEnumOp) [arg] res_ty)
138 = ASSERT(isEnumerationTyCon tycon)
139 do { (_,amode) <- getArgAmode arg
140 ; amode' <- assignTemp amode -- We're going to use it twice,
141 -- so save in a temp if non-trivial
142 ; this_pkg <- getThisPackage
143 ; stmtC (CmmAssign nodeReg (tagToClosure this_pkg tycon amode'))
144 ; performReturn emitReturnInstr }
146 -- If you're reading this code in the attempt to figure
147 -- out why the compiler panic'ed here, it is probably because
148 -- you used tagToEnum# in a non-monomorphic setting, e.g.,
149 -- intToTg :: Enum a => Int -> a ; intToTg (I# x#) = tagToEnum# x#
151 tycon = tyConAppTyCon res_ty
154 cgExpr x@(StgOpApp op@(StgPrimOp primop) args res_ty)
155 | primOpOutOfLine primop
156 = tailCallPrimOp primop args
158 | ReturnsPrim VoidRep <- result_info
159 = do cgPrimOp [] primop args emptyVarSet
160 performReturn emitReturnInstr
162 | ReturnsPrim rep <- result_info
163 = do cgPrimOp [dataReturnConvPrim (primRepToCgRep rep)]
164 primop args emptyVarSet
165 performReturn emitReturnInstr
167 | ReturnsAlg tycon <- result_info, isUnboxedTupleTyCon tycon
168 = do (reps, regs, _hints) <- newUnboxedTupleRegs res_ty
169 cgPrimOp regs primop args emptyVarSet{-no live vars-}
170 returnUnboxedTuple (zip reps (map CmmReg regs))
172 | ReturnsAlg tycon <- result_info, isEnumerationTyCon tycon
173 -- c.f. cgExpr (...TagToEnumOp...)
174 = do tag_reg <- newTemp wordRep
175 this_pkg <- getThisPackage
176 cgPrimOp [tag_reg] primop args emptyVarSet
177 stmtC (CmmAssign nodeReg (tagToClosure this_pkg tycon (CmmReg tag_reg)))
178 performReturn emitReturnInstr
180 result_info = getPrimOpResultInfo primop
183 %********************************************************
185 %* Case expressions *
187 %********************************************************
188 Case-expression conversion is complicated enough to have its own
192 cgExpr (StgCase expr live_vars save_vars bndr srt alt_type alts)
193 = cgCase expr live_vars save_vars bndr srt alt_type alts
197 %********************************************************
201 %********************************************************
202 \subsection[let-and-letrec-codegen]{Converting @StgLet@ and @StgLetrec@}
205 cgExpr (StgLet (StgNonRec name rhs) expr)
206 = cgRhs name rhs `thenFC` \ (name, info) ->
207 addBindC name info `thenC`
210 cgExpr (StgLet (StgRec pairs) expr)
211 = fixC (\ new_bindings -> addBindsC new_bindings `thenC`
212 listFCs [ cgRhs b e | (b,e) <- pairs ]
213 ) `thenFC` \ new_bindings ->
215 addBindsC new_bindings `thenC`
220 cgExpr (StgLetNoEscape live_in_whole_let live_in_rhss bindings body)
221 = do { -- Figure out what volatile variables to save
222 ; nukeDeadBindings live_in_whole_let
223 ; (save_assts, rhs_eob_info, maybe_cc_slot)
224 <- saveVolatileVarsAndRegs live_in_rhss
226 -- Save those variables right now!
227 ; emitStmts save_assts
229 -- Produce code for the rhss
230 -- and add suitable bindings to the environment
231 ; cgLetNoEscapeBindings live_in_rhss rhs_eob_info
232 maybe_cc_slot bindings
235 ; setEndOfBlockInfo rhs_eob_info (cgExpr body) }
239 %********************************************************
243 %********************************************************
245 SCC expressions are treated specially. They set the current cost
249 cgExpr (StgSCC cc expr) = do emitSetCCC cc; cgExpr expr
252 %********************************************************
256 %********************************************************
259 cgExpr (StgTick m n expr) = do cgTickBox m n; cgExpr expr
262 %********************************************************
264 %* Non-top-level bindings *
266 %********************************************************
267 \subsection[non-top-level-bindings]{Converting non-top-level bindings}
269 We rely on the support code in @CgCon@ (to do constructors) and
270 in @CgClosure@ (to do closures).
273 cgRhs :: Id -> StgRhs -> FCode (Id, CgIdInfo)
274 -- the Id is passed along so a binding can be set up
276 cgRhs name (StgRhsCon maybe_cc con args)
277 = do { amodes <- getArgAmodes args
278 ; idinfo <- buildDynCon name maybe_cc con amodes
279 ; returnFC (name, idinfo) }
281 cgRhs name (StgRhsClosure cc bi fvs upd_flag srt args body)
282 = do this_pkg <- getThisPackage
283 mkRhsClosure this_pkg name cc bi srt fvs upd_flag args body
286 mkRhsClosure looks for two special forms of the right-hand side:
290 If neither happens, it just calls mkClosureLFInfo. You might think
291 that mkClosureLFInfo should do all this, but it seems wrong for the
292 latter to look at the structure of an expression
296 We look at the body of the closure to see if it's a selector---turgid,
297 but nothing deep. We are looking for a closure of {\em exactly} the
300 ... = [the_fv] \ u [] ->
302 con a_1 ... a_n -> a_i
306 mkRhsClosure this_pkg bndr cc bi srt
307 [the_fv] -- Just one free var
308 upd_flag -- Updatable thunk
310 body@(StgCase (StgApp scrutinee [{-no args-}])
311 _ _ _ _ -- ignore uniq, etc.
313 [(DataAlt con, params, use_mask,
314 (StgApp selectee [{-no args-}]))])
315 | the_fv == scrutinee -- Scrutinee is the only free variable
316 && maybeToBool maybe_offset -- Selectee is a component of the tuple
317 && offset_into_int <= mAX_SPEC_SELECTEE_SIZE -- Offset is small enough
318 = -- NOT TRUE: ASSERT(is_single_constructor)
319 -- The simplifier may have statically determined that the single alternative
320 -- is the only possible case and eliminated the others, even if there are
321 -- other constructors in the datatype. It's still ok to make a selector
322 -- thunk in this case, because we *know* which constructor the scrutinee
324 cgStdRhsClosure bndr cc bi [the_fv] [] body lf_info [StgVarArg the_fv]
326 lf_info = mkSelectorLFInfo bndr offset_into_int
327 (isUpdatable upd_flag)
328 (_, params_w_offsets) = layOutDynConstr this_pkg con (addIdReps params)
329 -- Just want the layout
330 maybe_offset = assocMaybe params_w_offsets selectee
331 Just the_offset = maybe_offset
332 offset_into_int = the_offset - fixedHdrSize
338 A more generic AP thunk of the form
340 x = [ x_1...x_n ] \.. [] -> x_1 ... x_n
342 A set of these is compiled statically into the RTS, so we just use
343 those. We could extend the idea to thunks where some of the x_i are
344 global ids (and hence not free variables), but this would entail
345 generating a larger thunk. It might be an option for non-optimising
348 We only generate an Ap thunk if all the free variables are pointers,
349 for semi-obvious reasons.
352 mkRhsClosure this_pkg bndr cc bi srt
355 [] -- No args; a thunk
356 body@(StgApp fun_id args)
358 | args `lengthIs` (arity-1)
359 && all isFollowableArg (map idCgRep fvs)
360 && isUpdatable upd_flag
361 && arity <= mAX_SPEC_AP_SIZE
364 = cgStdRhsClosure bndr cc bi fvs [] body lf_info payload
367 lf_info = mkApLFInfo bndr upd_flag arity
368 -- the payload has to be in the correct order, hence we can't
370 payload = StgVarArg fun_id : args
377 mkRhsClosure this_pkg bndr cc bi srt fvs upd_flag args body
378 = cgRhsClosure bndr cc bi srt fvs upd_flag args body
382 %********************************************************
384 %* Let-no-escape bindings
386 %********************************************************
388 cgLetNoEscapeBindings live_in_rhss rhs_eob_info maybe_cc_slot
389 (StgNonRec binder rhs)
390 = do { (binder,info) <- cgLetNoEscapeRhs live_in_rhss rhs_eob_info
392 NonRecursive binder rhs
393 ; addBindC binder info }
395 cgLetNoEscapeBindings live_in_rhss rhs_eob_info maybe_cc_slot (StgRec pairs)
396 = do { new_bindings <- fixC (\ new_bindings -> do
397 { addBindsC new_bindings
398 ; listFCs [ cgLetNoEscapeRhs full_live_in_rhss
399 rhs_eob_info maybe_cc_slot Recursive b e
400 | (b,e) <- pairs ] })
402 ; addBindsC new_bindings }
404 -- We add the binders to the live-in-rhss set so that we don't
405 -- delete the bindings for the binder from the environment!
406 full_live_in_rhss = live_in_rhss `unionVarSet` (mkVarSet [b | (b,r) <- pairs])
409 :: StgLiveVars -- Live in rhss
411 -> Maybe VirtualSpOffset
415 -> FCode (Id, CgIdInfo)
417 cgLetNoEscapeRhs full_live_in_rhss rhs_eob_info maybe_cc_slot rec binder
418 (StgRhsClosure cc bi _ upd_flag srt args body)
419 = -- We could check the update flag, but currently we don't switch it off
420 -- for let-no-escaped things, so we omit the check too!
422 -- Updatable -> panic "cgLetNoEscapeRhs" -- Nothing to update!
423 -- other -> cgLetNoEscapeClosure binder cc bi live_in_whole_let live_in_rhss args body
424 cgLetNoEscapeClosure binder cc bi srt full_live_in_rhss rhs_eob_info
425 maybe_cc_slot rec args body
427 -- For a constructor RHS we want to generate a single chunk of code which
428 -- can be jumped to from many places, which will return the constructor.
429 -- It's easy; just behave as if it was an StgRhsClosure with a ConApp inside!
430 cgLetNoEscapeRhs full_live_in_rhss rhs_eob_info maybe_cc_slot rec binder
431 (StgRhsCon cc con args)
432 = cgLetNoEscapeClosure binder cc noBinderInfo{-safe-} NoSRT
433 full_live_in_rhss rhs_eob_info maybe_cc_slot rec
434 [] --No args; the binder is data structure, not a function
438 Little helper for primitives that return unboxed tuples.
441 newUnboxedTupleRegs :: Type -> FCode ([CgRep], [CmmReg], [MachHint])
442 newUnboxedTupleRegs res_ty =
444 ty_args = tyConAppArgs (repType res_ty)
445 (reps,hints) = unzip [ (rep, typeHint ty) | ty <- ty_args,
446 let rep = typeCgRep ty,
449 regs <- mapM (newTemp . argMachRep) reps
450 return (reps,regs,hints)