[project @ 2003-01-10 15:00:22 by simonmar]
[ghc-hetmet.git] / ghc / utils / genapply / GenApply.hs
1 {-# OPTIONS -cpp #-}
2 module Main(main) where
3
4 #include "../../includes/config.h"
5 #include "../../includes/MachRegs.h"
6
7 #if __GLASGOW_HASKELL__ >= 504
8 import Text.PrettyPrint
9 import Data.Word
10 import Data.Bits
11 import Data.List        ( intersperse )
12 import Data.Char        ( toUpper )
13 #else
14 import Bits
15 import Word
16 import Pretty
17 import List             ( intersperse )
18 import Char             ( toUpper )
19 #endif
20
21
22 -- -----------------------------------------------------------------------------
23 -- Argument kinds (rougly equivalent to PrimRep)
24
25 data ArgRep 
26   = N           -- non-ptr
27   | P           -- ptr
28   | V           -- void
29   | F           -- float
30   | D           -- double
31   | L           -- long (64-bit)
32
33 -- size of a value in *words*
34 argSize :: ArgRep -> Int
35 argSize N = 1
36 argSize P = 1
37 argSize V = 0
38 argSize F = 1
39 argSize D = (SIZEOF_DOUBLE `quot` SIZEOF_VOID_P :: Int)
40 argSize L = (8 `quot` SIZEOF_VOID_P :: Int)
41
42 showArg :: ArgRep -> Char
43 showArg N = 'n'
44 showArg P = 'p'
45 showArg V = 'v'
46 showArg F = 'f'
47 showArg D = 'd'
48 showArg L = 'l'
49
50 -- is a value a pointer?
51 isPtr :: ArgRep -> Bool
52 isPtr P = True
53 isPtr _ = False
54
55 -- -----------------------------------------------------------------------------
56 -- Registers
57
58 type Reg = String
59
60 availableRegs :: ([Reg],[Reg],[Reg],[Reg])
61 availableRegs = 
62   ( vanillaRegs MAX_REAL_VANILLA_REG,
63     floatRegs   MAX_REAL_FLOAT_REG,
64     doubleRegs  MAX_REAL_DOUBLE_REG,
65     longRegs    MAX_REAL_LONG_REG
66   )
67
68 vanillaRegs, floatRegs, doubleRegs, longRegs :: Int -> [Reg]
69 vanillaRegs n = [ "R" ++ show m ++ ".w" | m <- [2..n] ]  -- never use R1
70 floatRegs   n = [ "F" ++ show m | m <- [1..n] ]
71 doubleRegs  n = [ "D" ++ show m | m <- [1..n] ]
72 longRegs    n = [ "L" ++ show m | m <- [1..n] ]
73
74 -- -----------------------------------------------------------------------------
75 -- Loading/saving register arguments to the stack
76
77 loadRegArgs :: Int -> [ArgRep] -> (Doc,Int)
78 loadRegArgs sp args = (vcat (map (uncurry assign_stk_to_reg) reg_locs), sp')
79  where
80   (reg_locs, sp') = assignRegs sp args
81
82 -- a bit like assignRegs in CgRetConv.lhs
83 assignRegs
84         :: Int                  -- Sp of first arg
85         -> [ArgRep]             -- args
86         -> ([(Reg,Int)], Int)   -- Sp and rest of args
87 assignRegs sp args = assign sp args availableRegs []
88
89 assign sp [] regs doc = (doc, sp)
90 assign sp (V : args) regs doc = assign sp args regs doc
91 assign sp (arg : args) regs doc
92  = case findAvailableReg arg regs of
93     Just (reg, regs') -> assign (sp + argSize arg)  args regs' 
94                             ((reg, sp) : doc)
95     Nothing -> (doc, sp)
96
97 findAvailableReg N (vreg:vregs, fregs, dregs, lregs) =
98   Just (vreg, (vregs,fregs,dregs,lregs))
99 findAvailableReg P (vreg:vregs, fregs, dregs, lregs) =
100   Just (vreg, (vregs,fregs,dregs,lregs))
101 findAvailableReg F (vregs, freg:fregs, dregs, lregs) =
102   Just (freg, (vregs,fregs,dregs,lregs))
103 findAvailableReg D (vregs, fregs, dreg:dregs, lregs) =
104   Just (dreg, (vregs,fregs,dregs,lregs))
105 findAvailableReg L (vregs, fregs, dregs, lreg:lregs) =
106   Just (lreg, (vregs,fregs,dregs,lregs))
107 findAvailableReg _ _ = Nothing
108
109 assign_reg_to_stk reg@('F':_) sp
110    = text "ASSIGN_FLT(Sp+" <> int sp <> comma <> text reg <> text ");"
111 assign_reg_to_stk reg@('D':_) sp
112    = text "ASSIGN_DBL(Sp+" <> int sp <> comma <> text reg <> text ");"
113 assign_reg_to_stk reg@('L':_) sp
114    = text "ASSIGN_Word64(Sp+" <> int sp <> comma <> text reg <> text ");"
115 assign_reg_to_stk reg sp
116    = text "Sp[" <> int sp <> text "] = " <> text reg <> semi
117
118 assign_stk_to_reg reg@('F':_) sp
119    = text reg <> text " = "  <> text "PK_FLT(Sp+" <> int sp <> text ");"
120 assign_stk_to_reg reg@('D':_) sp
121    = text reg <> text " = "  <> text "PK_DBL(Sp+" <> int sp <> text ");"
122 assign_stk_to_reg reg@('L':_) sp
123    = text reg <> text " = "  <> text "PK_Word64(Sp+" <> int sp <> text ");"
124 assign_stk_to_reg reg sp
125    = text reg <> text " = Sp[" <> int sp <> text "];"
126
127
128 -- make a ptr/non-ptr bitmap from a list of argument types
129 mkBitmap :: [ArgRep] -> Word32
130 mkBitmap args = foldr f 0 args
131  where f arg bm | isPtr arg = bm `shiftL` 1
132                 | otherwise = (bm `shiftL` size) .|. ((1 `shiftL` size) - 1)
133                 where size = argSize arg
134
135 -- -----------------------------------------------------------------------------
136 -- Generating the application functions
137
138 mkApplyRetName args
139   = text "stg_ap_" <> text (map showArg args) <> text "_ret"
140
141 mkApplyInfoName args
142   = text "stg_ap_" <> text (map showArg args) <> text "_info"
143
144 genMkPAP macro jump stack_apply is_pap args all_args_size fun_info_label
145   =  smaller_arity_cases
146   $$ exact_arity_case
147   $$ larger_arity_case
148         
149   where
150     n_args = length args
151
152 -- The SMALLER ARITY cases:
153 --      if (arity == 1) {
154 --          Sp[0] = Sp[1];
155 --          Sp[1] = (W_)&stg_ap_1_info;
156 --          JMP_(GET_ENTRY(R1.cl));
157
158     smaller_arity_cases = vcat [ smaller_arity i | i <- [1..n_args-1] ]
159
160     smaller_arity arity
161         =  text "if (arity == " <> int arity <> text ") {" $$
162            let
163              (reg_doc, sp')
164                 | stack_apply = (empty, 1)
165                 | otherwise   = loadRegArgs 1 these_args
166            in
167            nest 4 (vcat [
168              reg_doc,
169              vcat [ shuffle_down j | j <- [sp'..these_args_size] ],
170              text "Sp[" <> int these_args_size <>  text "] = (W_)&" <>
171                 mkApplyInfoName rest_args <> semi,
172              text "Sp += " <> int (sp' -  1) <> semi,
173                 -- for a PAP, we have to arrange that the stack contains a
174                 -- return address in the even that stg_PAP_entry fails its
175                 -- heap check.  See stg_PAP_entry in Apply.hc for details.
176              if is_pap 
177                 then text "R2.w = (W_)&" <> mkApplyInfoName these_args <> semi
178                 else empty,
179              text "JMP_" <> parens (text jump) <> semi
180             ]) $$
181            text "}"
182         where
183                 (these_args, rest_args) = splitAt arity args
184                 these_args_size = sum (map argSize these_args)
185                 
186                 shuffle_down i = 
187                   text "Sp[" <> int (i-1) <> text "] = Sp["
188                      <> int i <> text "];"
189
190 -- The EXACT ARITY case
191 --
192 --      if (arity == 1) {
193 --          Sp++;
194 --          JMP_(GET_ENTRY(R1.cl));
195
196     exact_arity_case 
197         = text "if (arity == " <> int n_args <> text ") {" $$
198           let
199              (reg_doc, sp')
200                 | stack_apply = (empty, 1)
201                 | otherwise   = loadRegArgs 1 args
202           in
203           nest 4 (vcat [
204             reg_doc,
205             text "Sp += " <> int sp' <> semi,
206             if is_pap 
207                 then text "R2.w = (W_)&" <> fun_info_label <> semi
208                 else empty,
209             text "JMP_" <> parens (text jump) <> semi
210           ])
211
212 -- The LARGER ARITY cases:
213 --
214 --      } else /* arity > 1 */ {
215 --          BUILD_PAP(1,0,(W_)&stg_ap_v_info);
216 --      }
217
218     larger_arity_case = 
219            text "} else {" $$
220            nest 4 (
221                 text macro <> char '(' <> int n_args <> comma <> 
222                                         int all_args_size <>  
223                                         text ",(W_)&" <> fun_info_label <>
224                                         text ");"
225            ) $$
226            char '}'
227
228 -- -----------------------------------------------------------------------------
229 -- generate an apply function
230
231 -- args is a list of 'p', 'n', 'f', 'd' or 'l'
232
233 genApply args =
234    let
235     fun_ret_label  = mkApplyRetName args
236     fun_info_label = mkApplyInfoName args
237     all_args_size  = sum (map argSize args)
238    in
239     vcat [
240       text "INFO_TABLE_RET(" <> fun_info_label <> text "," <>
241         fun_ret_label <> text "," <>
242         text "MK_SMALL_BITMAP(" <> int all_args_size <> text "/*framsize*/," <>
243         int (fromIntegral (mkBitmap args)) <> text "/*bitmap*/), " <>
244         text "0,0,0,RET_SMALL,,EF_,0,0);",
245       text "",
246       text "F_ " <> fun_ret_label <> text "( void )\n{",
247       nest 4 (vcat [
248        text "StgInfoTable *info;",
249        text "nat arity;",
250
251 --    if fast == 1:
252 --        print "static void *lbls[] ="
253 --        print "  { [FUN]             &&fun_lbl,"
254 --        print "    [FUN_1_0]         &&fun_lbl,"
255 --        print "    [FUN_0_1]        &&fun_lbl,"
256 --        print "    [FUN_2_0]        &&fun_lbl,"
257 --        print "    [FUN_1_1]        &&fun_lbl,"
258 --        print "    [FUN_0_2]        &&fun_lbl,"
259 --        print "    [FUN_STATIC]      &&fun_lbl,"
260 --        print "    [PAP]             &&pap_lbl,"
261 --        print "    [THUNK]           &&thunk_lbl,"
262 --        print "    [THUNK_1_0]              &&thunk_lbl,"
263 --        print "    [THUNK_0_1]              &&thunk_lbl,"
264 --        print "    [THUNK_2_0]              &&thunk_lbl,"
265 --        print "    [THUNK_1_1]              &&thunk_lbl,"
266 --        print "    [THUNK_0_2]              &&thunk_lbl,"
267 --        print "    [THUNK_STATIC]    &&thunk_lbl,"
268 --        print "    [THUNK_SELECTOR]  &&thunk_lbl,"
269 --        print "    [IND]            &&ind_lbl,"
270 --        print "    [IND_OLDGEN]      &&ind_lbl,"
271 --        print "    [IND_STATIC]      &&ind_lbl,"
272 --        print "    [IND_PERM]       &&ind_lbl,"
273 --        print "    [IND_OLDGEN_PERM] &&ind_lbl"
274 --        print "  };"
275     
276        text "FB_",
277        text "",
278        text "IF_DEBUG(apply,fprintf(stderr, \"" <> fun_ret_label <> 
279           text "... \"); printClosure(R1.cl));",
280
281        text "IF_DEBUG(sanity,checkStackFrame(Sp+" <> int (1 + all_args_size)
282         <> text "));",
283
284 --       text "IF_DEBUG(sanity,checkStackChunk(Sp+" <> int (1 + all_args_size) <>
285 --        text ", CurrentTSO->stack + CurrentTSO->stack_size));",
286     
287        text "TICK_SLOW_CALL(" <> int (length args) <> text ");",
288
289        let do_assert [] _ = []
290            do_assert (arg:args) offset
291                 | isPtr arg = this : rest
292                 | otherwise = rest
293                 where this = text "ASSERT(LOOKS_LIKE_CLOSURE_PTR(Sp[" 
294                                  <> int offset <> text "]));"
295                       rest = do_assert args (offset + argSize arg)
296        in
297        vcat (do_assert args 1),
298          
299        text  "again:",
300        text  "info = get_itbl(R1.cl);",
301
302 --    if fast == 1:
303 --        print "    goto *lbls[info->type];";
304 --    else:
305         text "switch (info->type) {" $$
306          nest 4 (vcat [
307
308 --    if fast == 1:
309 --        print "    bco_lbl:"
310 --    else:
311         text "case BCO:",
312         nest 4 (vcat [
313           text "arity = BCO_ARITY((StgBCO *)R1.p);",
314           text "ASSERT(arity > 0);",
315           genMkPAP "BUILD_PAP" "stg_BCO_entry" 
316                 True{-stack apply-} False{-not a PAP-}
317                 args all_args_size fun_info_label
318          ]),
319
320 --    if fast == 1:
321 --        print "    fun_lbl:"
322 --    else:
323         text "case FUN:",
324         text "case FUN_1_0:",
325         text "case FUN_0_1:",
326         text "case FUN_2_0:",
327         text "case FUN_1_1:",
328         text "case FUN_0_2:",
329         text "case FUN_STATIC:",
330         nest 4 (vcat [
331           text "arity = itbl_to_fun_itbl(info)->arity;",
332           text "ASSERT(arity > 0);",
333           genMkPAP "BUILD_PAP" "GET_ENTRY(R1.cl)" 
334                 False{-reg apply-} False{-not a PAP-}
335                 args all_args_size fun_info_label
336          ]),
337
338 --    if fast == 1:
339 --        print "    pap_lbl:"
340 --    else:
341
342         text "case PAP:",
343         nest 4 (vcat [
344           text "arity = ((StgPAP *)R1.p)->arity;",
345           text "ASSERT(arity > 0);",
346           genMkPAP "NEW_PAP" "stg_PAP_entry" 
347                 True{-stack apply-} True{-is a PAP-}
348                 args all_args_size fun_info_label
349          ]),
350
351         text "",
352
353 --    if fast == 1:
354 --        print "    thunk_lbl:"
355 --    else:
356         text "case AP:",
357         text "case AP_STACK:",
358         text "case CAF_BLACKHOLE:",
359         text "case BLACKHOLE:",
360         text "case BLACKHOLE_BQ:",
361         text "case SE_BLACKHOLE:",
362         text "case SE_CAF_BLACKHOLE:",
363         text "case THUNK:",
364         text "case THUNK_1_0:",
365         text "case THUNK_0_1:",
366         text "case THUNK_2_0:",
367         text "case THUNK_1_1:",
368         text "case THUNK_0_2:",
369         text "case THUNK_STATIC:",
370         text "case THUNK_SELECTOR:",
371         nest 4 (vcat [
372           text "Sp[0] = (W_)&" <> fun_info_label <> text ";",
373           text "JMP_(GET_ENTRY(R1.cl));",
374           text ""
375          ]),
376
377 --    if fast == 1:
378 --        print "    ind_lbl:"
379 --    else:
380         text "case IND:",
381         text "case IND_OLDGEN:",
382         text "case IND_STATIC:",
383         text "case IND_PERM:",
384         text "case IND_OLDGEN_PERM:",
385         nest 4 (vcat [
386           text "R1.cl = ((StgInd *)R1.p)->indirectee;",
387           text "goto again;"
388          ]),
389         text "",
390
391 --    if fast == 0:
392
393        text "default:",
394        nest 4 (
395          text "barf(\"" <> fun_ret_label <> text "\");"
396        ),
397        text "}"
398         
399         ])
400       ]),
401       text "FE_",
402       text "}"
403     ]
404
405 -- -----------------------------------------------------------------------------
406 -- Making a stack apply
407
408 -- These little functions are like slow entry points.  They provide
409 -- the layer between the PAP entry code and the function's fast entry
410 -- point: namely they load arguments off the stack into registers (if
411 -- available) and jump to the function's entry code.
412 --
413 -- On entry: R1 points to the function closure
414 --           arguments are on the stack starting at Sp
415 --
416 -- Invariant: the list of arguments never contains void.  Since we're only
417 -- interested in loading arguments off the stack here, we can ignore
418 -- void arguments.
419
420 mkStackApplyEntryLabel:: [ArgRep] -> Doc
421 mkStackApplyEntryLabel args = text "stg_ap_stk_" <> text (map showArg args)
422
423 genStackApply :: [ArgRep] -> Doc
424 genStackApply args = 
425   let fn_entry_label = mkStackApplyEntryLabel args in
426   vcat [
427     text "IF_" <> parens fn_entry_label,
428     text "{",
429     nest 4 (text "FB_" $$ body $$ text "FE_"),
430     text "}"
431    ]
432  where
433    (assign_regs, sp') = loadRegArgs 0 args
434    body = vcat [assign_regs,
435                 text "Sp += " <> int sp' <> semi,
436                 text "JMP_(GET_ENTRY(R1.cl));"
437                 ]
438
439 -- -----------------------------------------------------------------------------
440 -- Stack save entry points.
441 --
442 -- These code fragments are used to save registers on the stack at a heap
443 -- check failure in the entry code for a function.  We also have to save R1
444 -- and the return address (stg_gen_ap_info) on the stack.  See stg_fun_gc_gen
445 -- in HeapStackCheck.hc for more details.
446
447 mkStackSaveEntryLabel :: [ArgRep] -> Doc
448 mkStackSaveEntryLabel args = text "stg_stk_save_" <> text (map showArg args)
449
450 genStackSave :: [ArgRep] -> Doc
451 genStackSave args =
452   let fn_entry_label= mkStackSaveEntryLabel args in
453   vcat [
454     text "IF_" <> parens fn_entry_label,
455     text "{",
456     nest 4 (text "FB_" $$ body $$ text "FE_"),
457     text "}"
458    ]
459  where
460    body = vcat [text "Sp -= " <> int sp_offset <> semi,
461                 vcat (map (uncurry assign_reg_to_stk) reg_locs),
462                 text "Sp[2] = R1.w;",
463                 text "Sp[1] =" <+> int (sp_offset - std_frame_size) <> semi,
464                 text "Sp[0] = (W_)&stg_gc_fun_info;",
465                 text "JMP_(stg_gc_noregs);"
466                 ]
467
468    std_frame_size = 3 -- the std bits of the frame. See StgRetFun in Closures.h,
469                       -- and the comment on stg_fun_gc_gen in HeapStackCheck.hc.
470    (reg_locs, sp_offset) = assignRegs std_frame_size args
471
472 -- -----------------------------------------------------------------------------
473 -- The prologue...
474
475 main = putStr (render the_code)
476   where the_code = vcat [
477                 text "// DO NOT EDIT!",
478                 text "// Automatically generated by GenApply.hs",
479                 text "",
480                 text "#include \"Stg.h\"",
481                 text "#include \"Rts.h\"",
482                 text "#include \"RtsFlags.h\"",
483                 text "#include \"Storage.h\"",
484                 text "#include \"RtsUtils.h\"",
485                 text "#include \"Printer.h\"",
486                 text "#include \"Sanity.h\"",
487                 text "#include \"Apply.h\"",
488                 text "",
489                 text "#include <stdio.h>",
490
491                 vcat (intersperse (text "") $ map genApply applyTypes),
492                 vcat (intersperse (text "") $ map genStackFns stackApplyTypes),
493
494                 genStackApplyArray stackApplyTypes,
495                 genStackSaveArray stackApplyTypes,
496                 genBitmapArray stackApplyTypes,
497
498                 text ""  -- add a newline at the end of the file
499             ]
500
501 -- These have been shown to cover about 99% of cases in practice...
502 applyTypes = [
503         [V],
504         [F],
505         [D],
506         [L],
507         [N],
508         [P],
509         [P,V],
510         [P,P],
511         [P,P,V],
512         [P,P,P],
513         [P,P,P,P],
514         [P,P,P,P,P],
515         [P,P,P,P,P,P],
516         [P,P,P,P,P,P,P]
517    ]
518
519 -- No need for V args in the stack apply cases.
520 -- ToDo: the stack apply and stack save code doesn't make a distinction
521 -- between N and P (they both live in the same register), only the bitmap
522 -- changes, so we could share the apply/save code between lots of cases.
523 stackApplyTypes = [
524         [N],
525         [P],
526         [F],
527         [D],
528         [L],
529         [N,N],
530         [N,P],
531         [P,N],
532         [P,P],
533         [N,N,N],
534         [N,N,P],
535         [N,P,N],
536         [N,P,P],
537         [P,N,N],
538         [P,N,P],
539         [P,P,N],
540         [P,P,P],
541         [P,P,P,P],
542         [P,P,P,P,P],
543         [P,P,P,P,P,P],
544         [P,P,P,P,P,P,P],
545         [P,P,P,P,P,P,P,P]
546    ]
547
548 genStackFns args = genStackApply args $$ genStackSave args
549
550
551 genStackApplyArray types =
552   text "StgFun *stg_ap_stack_entries[] = {" $$  
553   vcat (map arr_ent types) $$
554   text "};"
555  where
556   arr_ent ty = brackets (arg_const ty) <+> mkStackApplyEntryLabel ty <> comma
557
558 genStackSaveArray types =
559   text "StgFun *stg_stack_save_entries[] = {" $$  
560   vcat (map arr_ent types) $$
561   text "};"
562  where
563   arr_ent ty = brackets (arg_const ty) <+> mkStackSaveEntryLabel ty <> comma
564
565 genBitmapArray :: [[ArgRep]] -> Doc
566 genBitmapArray types =
567   vcat [
568     text "StgWord stg_arg_bitmaps[] = {",
569     vcat (map gen_bitmap types),
570     text "};"
571   ]
572   where
573    gen_bitmap ty = brackets (arg_const ty) <+> 
574                    text "MK_SMALL_BITMAP" <> parens (
575                         int (sum (map argSize ty)) <> comma <>
576                         text (show (mkBitmap ty))) <>
577                    comma
578
579 arg_const ty = text "ARG_" <> text (map toUpper (map showArg ty))
580