2 % (c) The University of Glasgow 2006
3 % (c) The GRASP Project, Glasgow University, 1992-1998
5 \section[CgCon]{Code generation for constructors}
7 This module provides the support code for @StgToAbstractC@ to deal
8 with {\em constructors} on the RHSs of let(rec)s. See also
9 @CgClosure@, which deals with closures.
13 cgTopRhsCon, buildDynCon,
14 bindConArgs, bindUnboxedTupleComponents,
19 #include "HsVersions.h"
51 %************************************************************************
53 \subsection[toplevel-constructors]{Top-level constructors}
55 %************************************************************************
58 cgTopRhsCon :: Id -- Name of thing bound to this RHS
61 -> FCode (Id, CgIdInfo)
62 cgTopRhsCon id con args
64 ; this_pkg <- getThisPackage
66 -- Windows DLLs have a problem with static cross-DLL refs.
67 ; ASSERT( not (isDllConApp this_pkg con args) ) return ()
69 ; ASSERT( args `lengthIs` dataConRepArity con ) return ()
72 ; amodes <- getArgAmodes args
76 lf_info = mkConLFInfo con
77 closure_label = mkClosureLabel this_pkg name
78 caffy = any stgArgHasCafRefs args
79 (closure_info, amodes_w_offsets) = layOutStaticConstr this_pkg con amodes
80 closure_rep = mkStaticClosureFields
82 dontCareCCS -- Because it's static data
86 payload = map get_lit amodes_w_offsets
87 get_lit (CmmLit lit, _offset) = lit
88 get_lit other = pprPanic "CgCon.get_lit" (ppr other)
89 -- NB1: amodes_w_offsets is sorted into ptrs first, then non-ptrs
90 -- NB2: all the amodes should be Lits!
93 ; emitDataLits closure_label closure_rep
96 ; returnFC (id, stableIdInfo id (mkLblExpr closure_label) lf_info) }
99 %************************************************************************
101 %* non-top-level constructors *
103 %************************************************************************
104 \subsection[code-for-constructors]{The code for constructors}
107 buildDynCon :: Id -- Name of the thing to which this constr will
109 -> CostCentreStack -- Where to grab cost centre from;
110 -- current CCS if currentOrSubsumedCCS
111 -> DataCon -- The data constructor
112 -> [(CgRep,CmmExpr)] -- Its args
113 -> FCode CgIdInfo -- Return details about how to find it
115 -- We used to pass a boolean indicating whether all the
116 -- args were of size zero, so we could use a static
117 -- construtor; but I concluded that it just isn't worth it.
118 -- Now I/O uses unboxed tuples there just aren't any constructors
119 -- with all size-zero args.
121 -- The reason for having a separate argument, rather than looking at
122 -- the addr modes of the args is that we may be in a "knot", and
123 -- premature looking at the args will cause the compiler to black-hole!
126 First we deal with the case of zero-arity constructors. Now, they
127 will probably be unfolded, so we don't expect to see this case much,
128 if at all, but it does no harm, and sets the scene for characters.
130 In the case of zero-arity constructors, or, more accurately, those
131 which have exclusively size-zero (VoidRep) args, we generate no code
135 buildDynCon binder cc con []
136 = do this_pkg <- getThisPackage
137 returnFC (stableIdInfo binder
138 (mkLblExpr (mkClosureLabel this_pkg (dataConName con)))
142 The following three paragraphs about @Char@-like and @Int@-like
143 closures are obsolete, but I don't understand the details well enough
144 to properly word them, sorry. I've changed the treatment of @Char@s to
145 be analogous to @Int@s: only a subset is preallocated, because @Char@
146 has now 31 bits. Only literals are handled here. -- Qrczak
148 Now for @Char@-like closures. We generate an assignment of the
149 address of the closure to a temporary. It would be possible simply to
150 generate no code, and record the addressing mode in the environment,
151 but we'd have to be careful if the argument wasn't a constant --- so
152 for simplicity we just always asssign to a temporary.
154 Last special case: @Int@-like closures. We only special-case the
155 situation in which the argument is a literal in the range
156 @mIN_INTLIKE@..@mAX_INTLILKE@. NB: for @Char@-like closures we can
157 work with any old argument, but for @Int@-like ones the argument has
158 to be a literal. Reason: @Char@ like closures have an argument type
159 which is guaranteed in range.
161 Because of this, we use can safely return an addressing mode.
164 buildDynCon binder cc con [arg_amode]
165 | maybeIntLikeCon con
166 , (_, CmmLit (CmmInt val _)) <- arg_amode
167 , let val_int = (fromIntegral val) :: Int
168 , val_int <= mAX_INTLIKE && val_int >= mIN_INTLIKE
169 = do { let intlike_lbl = mkRtsDataLabel SLIT("stg_INTLIKE_closure")
170 offsetW = (val_int - mIN_INTLIKE) * (fixedHdrSize + 1)
171 -- INTLIKE closures consist of a header and one word payload
172 intlike_amode = CmmLit (cmmLabelOffW intlike_lbl offsetW)
173 ; returnFC (stableIdInfo binder intlike_amode (mkConLFInfo con)) }
175 buildDynCon binder cc con [arg_amode]
176 | maybeCharLikeCon con
177 , (_, CmmLit (CmmInt val _)) <- arg_amode
178 , let val_int = (fromIntegral val) :: Int
179 , val_int <= mAX_CHARLIKE && val_int >= mIN_CHARLIKE
180 = do { let charlike_lbl = mkRtsDataLabel SLIT("stg_CHARLIKE_closure")
181 offsetW = (val_int - mIN_CHARLIKE) * (fixedHdrSize + 1)
182 -- CHARLIKE closures consist of a header and one word payload
183 charlike_amode = CmmLit (cmmLabelOffW charlike_lbl offsetW)
184 ; returnFC (stableIdInfo binder charlike_amode (mkConLFInfo con)) }
187 Now the general case.
190 buildDynCon binder ccs con args
192 ; this_pkg <- getThisPackage
194 (closure_info, amodes_w_offsets) = layOutDynConstr this_pkg con args
196 ; hp_off <- allocDynClosure closure_info use_cc blame_cc amodes_w_offsets
197 ; returnFC (heapIdInfo binder hp_off lf_info) }
199 lf_info = mkConLFInfo con
201 use_cc -- cost-centre to stick in the object
202 | currentOrSubsumedCCS ccs = curCCS
203 | otherwise = CmmLit (mkCCostCentreStack ccs)
205 blame_cc = use_cc -- cost-centre on which to blame the alloc (same)
209 %************************************************************************
211 %* constructor-related utility function: *
212 %* bindConArgs is called from cgAlt of a case *
214 %************************************************************************
215 \subsection[constructor-utilities]{@bindConArgs@: constructor-related utility}
217 @bindConArgs@ $con args$ augments the environment with bindings for the
218 binders $args$, assuming that we have just returned from a @case@ which
222 bindConArgs :: DataCon -> [Id] -> Code
224 = do this_pkg <- getThisPackage
226 bind_arg (arg, offset) = bindNewToNode arg offset (mkLFArgument arg)
227 (_, args_w_offsets) = layOutDynConstr this_pkg con (addIdReps args)
229 ASSERT(not (isUnboxedTupleCon con)) return ()
230 mapCs bind_arg args_w_offsets
233 Unboxed tuples are handled slightly differently - the object is
234 returned in registers and on the stack instead of the heap.
237 bindUnboxedTupleComponents
239 -> FCode ([(Id,GlobalReg)], -- Regs assigned
240 WordOff, -- Number of pointer stack slots
241 WordOff, -- Number of non-pointer stack slots
242 VirtualSpOffset) -- Offset of return address slot
243 -- (= realSP on entry)
245 bindUnboxedTupleComponents args
250 -- Assign as many components as possible to registers
251 ; let (reg_args, stk_args) = assignReturnRegs (addIdReps args)
253 -- Separate the rest of the args into pointers and non-pointers
254 (ptr_args, nptr_args) = separateByPtrFollowness stk_args
256 -- Allocate the rest on the stack
257 -- The real SP points to the return address, above which any
258 -- leftover unboxed-tuple components will be allocated
259 (ptr_sp, ptr_offsets) = mkVirtStkOffsets rsp ptr_args
260 (nptr_sp, nptr_offsets) = mkVirtStkOffsets ptr_sp nptr_args
262 nptrs = nptr_sp - ptr_sp
264 -- The stack pointer points to the last stack-allocated component
265 ; setRealAndVirtualSp nptr_sp
267 -- We have just allocated slots starting at real SP + 1, and set the new
268 -- virtual SP to the topmost allocated slot.
269 -- If the virtual SP started *below* the real SP, we've just jumped over
270 -- some slots that won't be in the free-list, so put them there
271 -- This commonly happens because we've freed the return-address slot
272 -- (trimming back the virtual SP), but the real SP still points to that slot
273 ; freeStackSlots [vsp+1,vsp+2 .. rsp]
275 ; bindArgsToRegs reg_args
276 ; bindArgsToStack ptr_offsets
277 ; bindArgsToStack nptr_offsets
279 ; returnFC (reg_args, ptrs, nptrs, rsp) }
282 %************************************************************************
284 Actually generate code for a constructor return
286 %************************************************************************
289 Note: it's the responsibility of the @cgReturnDataCon@ caller to be
290 sure the @amodes@ passed don't conflict with each other.
292 cgReturnDataCon :: DataCon -> [(CgRep, CmmExpr)] -> Code
294 cgReturnDataCon con amodes
295 = ASSERT( amodes `lengthIs` dataConRepArity con )
296 do { EndOfBlockInfo _ sequel <- getEndOfBlockInfo
298 CaseAlts _ (Just (alts, deflt_lbl)) bndr
299 -> -- Ho! We know the constructor so we can
300 -- go straight to the right alternative
301 case assocMaybe alts (dataConTagZ con) of {
302 Just join_lbl -> build_it_then (jump_to join_lbl);
304 -- Special case! We're returning a constructor to the default case
305 -- of an enclosing case. For example:
307 -- case (case e of (a,b) -> C a b) of
309 -- y -> ...<returning here!>...
312 -- if the default is a non-bind-default (ie does not use y),
313 -- then we should simply jump to the default join point;
315 | isDeadBinder bndr -> performReturn (jump_to deflt_lbl)
316 | otherwise -> build_it_then (jump_to deflt_lbl) }
318 other_sequel -- The usual case
319 | isUnboxedTupleCon con -> returnUnboxedTuple amodes
320 | otherwise -> build_it_then emitReturnInstr
323 jump_to lbl = stmtC (CmmJump (CmmLit lbl) [])
324 build_it_then return_code
325 = do { -- BUILD THE OBJECT IN THE HEAP
326 -- The first "con" says that the name bound to this
327 -- closure is "con", which is a bit of a fudge, but it only
330 -- This Id is also used to get a unique for a
331 -- temporary variable, if the closure is a CHARLIKE.
332 -- funnily enough, this makes the unique always come
334 tickyReturnNewCon (length amodes)
335 ; idinfo <- buildDynCon (dataConWorkId con) currentCCS con amodes
336 ; amode <- idInfoToAmode idinfo
337 ; checkedAbsC (CmmAssign nodeReg amode)
338 ; performReturn return_code }
342 %************************************************************************
344 Generating static stuff for algebraic data types
346 %************************************************************************
348 [These comments are rather out of date]
351 Info tbls & Macro & Kind of constructor \\
353 info & @CONST_INFO_TABLE@& Zero arity (no info -- compiler uses static closure)\\
354 info & @CHARLIKE_INFO_TABLE@& Charlike (no info -- compiler indexes fixed array)\\
355 info & @INTLIKE_INFO_TABLE@& Intlike; the one macro generates both info tbls\\
356 info & @SPEC_INFO_TABLE@& SPECish, and bigger than or equal to @MIN_UPD_SIZE@\\
357 info & @GEN_INFO_TABLE@& GENish (hence bigger than or equal to @MIN_UPD_SIZE@)\\
360 Possible info tables for constructor con:
364 Used for dynamically let(rec)-bound occurrences of
365 the constructor, and for updates. For constructors
366 which are int-like, char-like or nullary, when GC occurs,
367 the closure tries to get rid of itself.
369 \item[@_static_info@:]
370 Static occurrences of the constructor
371 macro: @STATIC_INFO_TABLE@.
374 For zero-arity constructors, \tr{con}, we NO LONGER generate a static closure;
375 it's place is taken by the top level defn of the constructor.
377 For charlike and intlike closures there is a fixed array of static
378 closures predeclared.
381 cgTyCon :: TyCon -> FCode [Cmm] -- each constructor gets a separate Cmm
383 = do { constrs <- mapM (getCmm . cgDataCon) (tyConDataCons tycon)
385 -- Generate a table of static closures for an enumeration type
386 -- Put the table after the data constructor decls, because the
387 -- datatype closure table (for enumeration types)
388 -- to (say) PrelBase_$wTrue_closure, which is defined in code_stuff
390 if isEnumerationTyCon tycon then do
391 tbl <- getCmm (emitRODataLits (mkLocalClosureTableLabel
393 [ CmmLabel (mkLocalClosureLabel (dataConName con))
394 | con <- tyConDataCons tycon])
399 ; return (extra ++ constrs)
403 Generate the entry code, info tables, and (for niladic constructor) the
404 static closure, for a constructor.
407 cgDataCon :: DataCon -> Code
409 = do { -- Don't need any dynamic closure code for zero-arity constructors
410 this_pkg <- getThisPackage
413 -- To allow the debuggers, interpreters, etc to cope with
414 -- static data structures (ie those built at compile
415 -- time), we take care that info-table contains the
416 -- information we need.
417 (static_cl_info, _) =
418 layOutStaticConstr this_pkg data_con arg_reps
420 (dyn_cl_info, arg_things) =
421 layOutDynConstr this_pkg data_con arg_reps
423 emit_info cl_info ticky_code
424 = do { code_blks <- getCgStmts the_code
425 ; emitClosureCodeAndInfoTable cl_info [] code_blks }
427 the_code = do { ticky_code
428 ; ldvEnter (CmmReg nodeReg)
431 arg_reps :: [(CgRep, Type)]
432 arg_reps = [(typeCgRep ty, ty) | ty <- dataConRepArgTys data_con]
435 -- NB: We don't set CC when entering data (WDP 94/06)
436 tickyReturnOldCon (length arg_things)
437 ; performReturn emitReturnInstr }
438 -- noStmts: Ptr to thing already in Node
440 ; whenC (not (isNullaryRepDataCon data_con))
441 (emit_info dyn_cl_info tickyEnterDynCon)
443 -- Dynamic-Closure first, to reduce forward references
444 ; emit_info static_cl_info tickyEnterStaticCon }