OSDN Git Service

PR middle-end/24998
[pf3gnuchains/gcc-fork.git] / gcc / tree-inline.c
1 /* Tree inlining.
2    Copyright 2001, 2002, 2003, 2004, 2005 Free Software Foundation, Inc.
3    Contributed by Alexandre Oliva <aoliva@redhat.com>
4
5 This file is part of GCC.
6
7 GCC is free software; you can redistribute it and/or modify
8 it under the terms of the GNU General Public License as published by
9 the Free Software Foundation; either version 2, or (at your option)
10 any later version.
11
12 GCC is distributed in the hope that it will be useful,
13 but WITHOUT ANY WARRANTY; without even the implied warranty of
14 MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
15 GNU General Public License for more details.
16
17 You should have received a copy of the GNU General Public License
18 along with GCC; see the file COPYING.  If not, write to
19 the Free Software Foundation, 51 Franklin Street, Fifth Floor,
20 Boston, MA 02110-1301, USA.  */
21
22 #include "config.h"
23 #include "system.h"
24 #include "coretypes.h"
25 #include "tm.h"
26 #include "toplev.h"
27 #include "tree.h"
28 #include "tree-inline.h"
29 #include "rtl.h"
30 #include "expr.h"
31 #include "flags.h"
32 #include "params.h"
33 #include "input.h"
34 #include "insn-config.h"
35 #include "varray.h"
36 #include "hashtab.h"
37 #include "splay-tree.h"
38 #include "langhooks.h"
39 #include "basic-block.h"
40 #include "tree-iterator.h"
41 #include "cgraph.h"
42 #include "intl.h"
43 #include "tree-mudflap.h"
44 #include "tree-flow.h"
45 #include "function.h"
46 #include "ggc.h"
47 #include "tree-flow.h"
48 #include "diagnostic.h"
49 #include "except.h"
50 #include "debug.h"
51 #include "pointer-set.h"
52 #include "ipa-prop.h"
53
54 /* I'm not real happy about this, but we need to handle gimple and
55    non-gimple trees.  */
56 #include "tree-gimple.h"
57
58 /* Inlining, Saving, Cloning
59
60    Inlining: a function body is duplicated, but the PARM_DECLs are
61    remapped into VAR_DECLs, and non-void RETURN_EXPRs become
62    MODIFY_EXPRs that store to a dedicated returned-value variable.
63    The duplicated eh_region info of the copy will later be appended
64    to the info for the caller; the eh_region info in copied throwing
65    statements and RESX_EXPRs is adjusted accordingly.
66
67    Saving: make a semantically-identical copy of the function body.
68    Necessary when we want to generate code for the body (a destructive
69    operation), but we expect to need this body in the future (e.g. for
70    inlining into another function).
71
72    Cloning: (only in C++) We have one body for a con/de/structor, and
73    multiple function decls, each with a unique parameter list.
74    Duplicate the body, using the given splay tree; some parameters
75    will become constants (like 0 or 1).
76
77    All of these will simultaneously lookup any callgraph edges.  If
78    we're going to inline the duplicated function body, and the given
79    function has some cloned callgraph nodes (one for each place this
80    function will be inlined) those callgraph edges will be duplicated.
81    If we're saving or cloning the body, those callgraph edges will be
82    updated to point into the new body.  (Note that the original
83    callgraph node and edge list will not be altered.)
84
85    See the CALL_EXPR handling case in copy_body_r ().  */
86
87 /* 0 if we should not perform inlining.
88    1 if we should expand functions calls inline at the tree level.
89    2 if we should consider *all* functions to be inline
90    candidates.  */
91
92 int flag_inline_trees = 0;
93
94 /* To Do:
95
96    o In order to make inlining-on-trees work, we pessimized
97      function-local static constants.  In particular, they are now
98      always output, even when not addressed.  Fix this by treating
99      function-local static constants just like global static
100      constants; the back-end already knows not to output them if they
101      are not needed.
102
103    o Provide heuristics to clamp inlining of recursive template
104      calls?  */
105
106 /* Data required for function inlining.  */
107
108 typedef struct inline_data
109 {
110   /* FUNCTION_DECL for function being inlined.  */
111   tree callee;
112   /* FUNCTION_DECL for function being inlined into.  */
113   tree caller;
114   /* struct function for function being inlined.  Usually this is the same
115      as DECL_STRUCT_FUNCTION (callee), but can be different if saved_cfg
116      and saved_eh are in use.  */
117   struct function *callee_cfun;
118   /* The VAR_DECL for the return value.  */
119   tree retvar;
120   /* The map from local declarations in the inlined function to
121      equivalents in the function into which it is being inlined.  */
122   splay_tree decl_map;
123   /* We use the same mechanism to build clones that we do to perform
124      inlining.  However, there are a few places where we need to
125      distinguish between those two situations.  This flag is true if
126      we are cloning, rather than inlining.  */
127   bool cloning_p;
128   /* Similarly for saving function body.  */
129   bool saving_p;
130   /* Versioning function is slightly different from inlining. */
131   bool versioning_p;
132   /* Callgraph node of function we are inlining into.  */
133   struct cgraph_node *node;
134   /* Callgraph node of currently inlined function.  */
135   struct cgraph_node *current_node;
136   /* Current BLOCK.  */
137   tree block;
138   varray_type ipa_info;
139   /* Exception region the inlined call lie in.  */
140   int eh_region;
141   /* Take region number in the function being copied, add this value and
142      get eh region number of the duplicate in the function we inline into.  */
143   int eh_region_offset;
144 } inline_data;
145
146 /* Prototypes.  */
147
148 static tree declare_return_variable (inline_data *, tree, tree, tree *);
149 static tree copy_body_r (tree *, int *, void *);
150 static tree copy_generic_body (inline_data *);
151 static bool inlinable_function_p (tree);
152 static tree remap_decl (tree, inline_data *);
153 static tree remap_type (tree, inline_data *);
154 static void remap_block (tree *, inline_data *);
155 static tree remap_decl (tree, inline_data *);
156 static tree remap_decls (tree, inline_data *);
157 static void copy_bind_expr (tree *, int *, inline_data *);
158 static tree mark_local_for_remap_r (tree *, int *, void *);
159 static void unsave_expr_1 (tree);
160 static tree unsave_r (tree *, int *, void *);
161 static void declare_inline_vars (tree, tree);
162 static void remap_save_expr (tree *, void *, int *);
163 static bool replace_ref_tree (inline_data *, tree *);
164 static inline bool inlining_p (inline_data *);
165 static void add_lexical_block (tree current_block, tree new_block);
166
167 /* Insert a tree->tree mapping for ID.  Despite the name suggests
168    that the trees should be variables, it is used for more than that.  */
169
170 static void
171 insert_decl_map (inline_data *id, tree key, tree value)
172 {
173   splay_tree_insert (id->decl_map, (splay_tree_key) key,
174                      (splay_tree_value) value);
175
176   /* Always insert an identity map as well.  If we see this same new
177      node again, we won't want to duplicate it a second time.  */
178   if (key != value)
179     splay_tree_insert (id->decl_map, (splay_tree_key) value,
180                        (splay_tree_value) value);
181 }
182
183 /* Remap DECL during the copying of the BLOCK tree for the function.  */
184
185 static tree
186 remap_decl (tree decl, inline_data *id)
187 {
188   splay_tree_node n;
189   tree fn;
190
191   /* We only remap local variables in the current function.  */
192   fn = id->callee;
193
194   /* See if we have remapped this declaration.  */
195
196   n = splay_tree_lookup (id->decl_map, (splay_tree_key) decl);
197
198   /* If we didn't already have an equivalent for this declaration,
199      create one now.  */
200   if (!n)
201     {
202       /* Make a copy of the variable or label.  */
203       tree t;
204       t = copy_decl_for_dup (decl, fn, id->caller, id->versioning_p);
205      
206       /* Remember it, so that if we encounter this local entity again
207          we can reuse this copy.  Do this early because remap_type may
208          need this decl for TYPE_STUB_DECL.  */
209       insert_decl_map (id, decl, t);
210
211       /* Remap types, if necessary.  */
212       TREE_TYPE (t) = remap_type (TREE_TYPE (t), id);
213       if (TREE_CODE (t) == TYPE_DECL)
214         DECL_ORIGINAL_TYPE (t) = remap_type (DECL_ORIGINAL_TYPE (t), id);
215
216       /* Remap sizes as necessary.  */
217       walk_tree (&DECL_SIZE (t), copy_body_r, id, NULL);
218       walk_tree (&DECL_SIZE_UNIT (t), copy_body_r, id, NULL);
219
220       /* If fields, do likewise for offset and qualifier.  */
221       if (TREE_CODE (t) == FIELD_DECL)
222         {
223           walk_tree (&DECL_FIELD_OFFSET (t), copy_body_r, id, NULL);
224           if (TREE_CODE (DECL_CONTEXT (t)) == QUAL_UNION_TYPE)
225             walk_tree (&DECL_QUALIFIER (t), copy_body_r, id, NULL);
226         }
227
228 #if 0
229       /* FIXME handle anon aggrs.  */
230       if (! DECL_NAME (t) && TREE_TYPE (t)
231           && lang_hooks.tree_inlining.anon_aggr_type_p (TREE_TYPE (t)))
232         {
233           /* For a VAR_DECL of anonymous type, we must also copy the
234              member VAR_DECLS here and rechain the DECL_ANON_UNION_ELEMS.  */
235           tree members = NULL;
236           tree src;
237
238           for (src = DECL_ANON_UNION_ELEMS (t); src;
239                src = TREE_CHAIN (src))
240             {
241               tree member = remap_decl (TREE_VALUE (src), id);
242
243               gcc_assert (!TREE_PURPOSE (src));
244               members = tree_cons (NULL, member, members);
245             }
246           DECL_ANON_UNION_ELEMS (t) = nreverse (members);
247         }
248 #endif
249
250       /* Remember it, so that if we encounter this local entity
251          again we can reuse this copy.  */
252       insert_decl_map (id, decl, t);
253       return t;
254     }
255
256   return unshare_expr ((tree) n->value);
257 }
258
259 static tree
260 remap_type_1 (tree type, inline_data *id)
261 {
262   tree new, t;
263
264   /* We do need a copy.  build and register it now.  If this is a pointer or
265      reference type, remap the designated type and make a new pointer or
266      reference type.  */
267   if (TREE_CODE (type) == POINTER_TYPE)
268     {
269       new = build_pointer_type_for_mode (remap_type (TREE_TYPE (type), id),
270                                          TYPE_MODE (type),
271                                          TYPE_REF_CAN_ALIAS_ALL (type));
272       insert_decl_map (id, type, new);
273       return new;
274     }
275   else if (TREE_CODE (type) == REFERENCE_TYPE)
276     {
277       new = build_reference_type_for_mode (remap_type (TREE_TYPE (type), id),
278                                             TYPE_MODE (type),
279                                             TYPE_REF_CAN_ALIAS_ALL (type));
280       insert_decl_map (id, type, new);
281       return new;
282     }
283   else
284     new = copy_node (type);
285
286   insert_decl_map (id, type, new);
287
288   /* This is a new type, not a copy of an old type.  Need to reassociate
289      variants.  We can handle everything except the main variant lazily.  */
290   t = TYPE_MAIN_VARIANT (type);
291   if (type != t)
292     {
293       t = remap_type (t, id);
294       TYPE_MAIN_VARIANT (new) = t;
295       TYPE_NEXT_VARIANT (new) = TYPE_MAIN_VARIANT (t);
296       TYPE_NEXT_VARIANT (t) = new;
297     }
298   else
299     {
300       TYPE_MAIN_VARIANT (new) = new;
301       TYPE_NEXT_VARIANT (new) = NULL;
302     }
303
304   if (TYPE_STUB_DECL (type))
305     TYPE_STUB_DECL (new) = remap_decl (TYPE_STUB_DECL (type), id);
306
307   /* Lazily create pointer and reference types.  */
308   TYPE_POINTER_TO (new) = NULL;
309   TYPE_REFERENCE_TO (new) = NULL;
310
311   switch (TREE_CODE (new))
312     {
313     case INTEGER_TYPE:
314     case REAL_TYPE:
315     case ENUMERAL_TYPE:
316     case BOOLEAN_TYPE:
317     case CHAR_TYPE:
318       t = TYPE_MIN_VALUE (new);
319       if (t && TREE_CODE (t) != INTEGER_CST)
320         walk_tree (&TYPE_MIN_VALUE (new), copy_body_r, id, NULL);
321
322       t = TYPE_MAX_VALUE (new);
323       if (t && TREE_CODE (t) != INTEGER_CST)
324         walk_tree (&TYPE_MAX_VALUE (new), copy_body_r, id, NULL);
325       return new;
326
327     case FUNCTION_TYPE:
328       TREE_TYPE (new) = remap_type (TREE_TYPE (new), id);
329       walk_tree (&TYPE_ARG_TYPES (new), copy_body_r, id, NULL);
330       return new;
331
332     case ARRAY_TYPE:
333       TREE_TYPE (new) = remap_type (TREE_TYPE (new), id);
334       TYPE_DOMAIN (new) = remap_type (TYPE_DOMAIN (new), id);
335       break;
336
337     case RECORD_TYPE:
338     case UNION_TYPE:
339     case QUAL_UNION_TYPE:
340       {
341         tree f, nf = NULL;
342
343         for (f = TYPE_FIELDS (new); f ; f = TREE_CHAIN (f))
344           {
345             t = remap_decl (f, id);
346             DECL_CONTEXT (t) = new;
347             TREE_CHAIN (t) = nf;
348             nf = t;
349           }
350         TYPE_FIELDS (new) = nreverse (nf);
351       }
352       break;
353
354     case OFFSET_TYPE:
355     default:
356       /* Shouldn't have been thought variable sized.  */
357       gcc_unreachable ();
358     }
359
360   walk_tree (&TYPE_SIZE (new), copy_body_r, id, NULL);
361   walk_tree (&TYPE_SIZE_UNIT (new), copy_body_r, id, NULL);
362
363   return new;
364 }
365
366 static tree
367 remap_type (tree type, inline_data *id)
368 {
369   splay_tree_node node;
370
371   if (type == NULL)
372     return type;
373
374   /* See if we have remapped this type.  */
375   node = splay_tree_lookup (id->decl_map, (splay_tree_key) type);
376   if (node)
377     return (tree) node->value;
378
379   /* The type only needs remapping if it's variably modified.  */
380   if (! variably_modified_type_p (type, id->callee))
381     {
382       insert_decl_map (id, type, type);
383       return type;
384     }
385
386   return remap_type_1 (type, id);
387 }
388
389 static tree
390 remap_decls (tree decls, inline_data *id)
391 {
392   tree old_var;
393   tree new_decls = NULL_TREE;
394
395   /* Remap its variables.  */
396   for (old_var = decls; old_var; old_var = TREE_CHAIN (old_var))
397     {
398       tree new_var;
399
400       /* We can not chain the local static declarations into the unexpanded_var_list
401          as we can't duplicate them or break one decl rule.  Go ahead and link
402          them into unexpanded_var_list.  */
403       if (!lang_hooks.tree_inlining.auto_var_in_fn_p (old_var, id->callee)
404           && !DECL_EXTERNAL (old_var))
405         {
406           cfun->unexpanded_var_list = tree_cons (NULL_TREE, old_var,
407                                                  cfun->unexpanded_var_list);
408           continue;
409         }
410
411       /* Remap the variable.  */
412       new_var = remap_decl (old_var, id);
413
414       /* If we didn't remap this variable, so we can't mess with its
415          TREE_CHAIN.  If we remapped this variable to the return slot, it's
416          already declared somewhere else, so don't declare it here.  */
417       if (!new_var || new_var == id->retvar)
418         ;
419       else
420         {
421           gcc_assert (DECL_P (new_var));
422           TREE_CHAIN (new_var) = new_decls;
423           new_decls = new_var;
424         }
425     }
426
427   return nreverse (new_decls);
428 }
429
430 /* Copy the BLOCK to contain remapped versions of the variables
431    therein.  And hook the new block into the block-tree.  */
432
433 static void
434 remap_block (tree *block, inline_data *id)
435 {
436   tree old_block;
437   tree new_block;
438   tree fn;
439
440   /* Make the new block.  */
441   old_block = *block;
442   new_block = make_node (BLOCK);
443   TREE_USED (new_block) = TREE_USED (old_block);
444   BLOCK_ABSTRACT_ORIGIN (new_block) = old_block;
445   BLOCK_SOURCE_LOCATION (new_block) = BLOCK_SOURCE_LOCATION (old_block);
446   *block = new_block;
447
448   /* Remap its variables.  */
449   BLOCK_VARS (new_block) = remap_decls (BLOCK_VARS (old_block), id);
450
451   fn = id->caller;
452   if (id->cloning_p)
453     /* We're building a clone; DECL_INITIAL is still
454        error_mark_node, and current_binding_level is the parm
455        binding level.  */
456     lang_hooks.decls.insert_block (new_block);
457   /* Remember the remapped block.  */
458   insert_decl_map (id, old_block, new_block);
459 }
460
461 /* Copy the whole block tree and root it in id->block.  */
462 static tree
463 remap_blocks (tree block, inline_data *id)
464 {
465   tree t;
466   tree new = block;
467
468   if (!block)
469     return NULL;
470
471   remap_block (&new, id);
472   gcc_assert (new != block);
473   for (t = BLOCK_SUBBLOCKS (block); t ; t = BLOCK_CHAIN (t))
474     add_lexical_block (new, remap_blocks (t, id));
475   return new;
476 }
477
478 static void
479 copy_statement_list (tree *tp)
480 {
481   tree_stmt_iterator oi, ni;
482   tree new;
483
484   new = alloc_stmt_list ();
485   ni = tsi_start (new);
486   oi = tsi_start (*tp);
487   *tp = new;
488
489   for (; !tsi_end_p (oi); tsi_next (&oi))
490     tsi_link_after (&ni, tsi_stmt (oi), TSI_NEW_STMT);
491 }
492
493 static void
494 copy_bind_expr (tree *tp, int *walk_subtrees, inline_data *id)
495 {
496   tree block = BIND_EXPR_BLOCK (*tp);
497   /* Copy (and replace) the statement.  */
498   copy_tree_r (tp, walk_subtrees, NULL);
499   if (block)
500     {
501       remap_block (&block, id);
502       BIND_EXPR_BLOCK (*tp) = block;
503     }
504
505   if (BIND_EXPR_VARS (*tp))
506     /* This will remap a lot of the same decls again, but this should be
507        harmless.  */
508     BIND_EXPR_VARS (*tp) = remap_decls (BIND_EXPR_VARS (*tp), id);
509 }
510
511 /* Called from copy_body_id via walk_tree.  DATA is really an
512    `inline_data *'.  */
513
514 static tree
515 copy_body_r (tree *tp, int *walk_subtrees, void *data)
516 {
517   inline_data *id = (inline_data *) data;
518   tree fn = id->callee;
519   tree new_block;
520
521   /* Begin by recognizing trees that we'll completely rewrite for the
522      inlining context.  Our output for these trees is completely
523      different from out input (e.g. RETURN_EXPR is deleted, and morphs
524      into an edge).  Further down, we'll handle trees that get
525      duplicated and/or tweaked.  */
526
527   /* If this is a RETURN_STMT, change it into an EXPR_STMT and a
528      GOTO_STMT with the RET_LABEL as its target.  */
529   if (TREE_CODE (*tp) == RETURN_EXPR && inlining_p (id))
530     {
531       tree assignment = TREE_OPERAND (*tp, 0);
532
533       /* If we're returning something, just turn that into an
534          assignment into the equivalent of the original RESULT_DECL.
535          If the "assignment" is just the result decl, the result
536          decl has already been set (e.g. a recent "foo (&result_decl,
537          ...)"); just toss the entire RETURN_EXPR.  */
538       if (assignment && TREE_CODE (assignment) == MODIFY_EXPR)
539         {
540           /* Replace the RETURN_EXPR with (a copy of) the
541              MODIFY_EXPR hanging underneath.  */
542           *tp = copy_node (assignment);
543         }
544       else /* Else the RETURN_EXPR returns no value.  */
545         {
546           *tp = NULL;
547           return (tree) (void *)1;
548         }
549     }
550
551   /* Local variables and labels need to be replaced by equivalent
552      variables.  We don't want to copy static variables; there's only
553      one of those, no matter how many times we inline the containing
554      function.  Similarly for globals from an outer function.  */
555   else if (lang_hooks.tree_inlining.auto_var_in_fn_p (*tp, fn))
556     {
557       tree new_decl;
558
559       /* Remap the declaration.  */
560       new_decl = remap_decl (*tp, id);
561       gcc_assert (new_decl);
562       /* Replace this variable with the copy.  */
563       STRIP_TYPE_NOPS (new_decl);
564       *tp = new_decl;
565       *walk_subtrees = 0;
566     }
567   else if (TREE_CODE (*tp) == STATEMENT_LIST)
568     copy_statement_list (tp);
569   else if (TREE_CODE (*tp) == SAVE_EXPR)
570     remap_save_expr (tp, id->decl_map, walk_subtrees);
571   else if (TREE_CODE (*tp) == LABEL_DECL
572            && (! DECL_CONTEXT (*tp)
573                || decl_function_context (*tp) == id->callee))
574     /* These may need to be remapped for EH handling.  */
575     *tp = remap_decl (*tp, id);
576   else if (TREE_CODE (*tp) == BIND_EXPR)
577     copy_bind_expr (tp, walk_subtrees, id);
578   /* Types may need remapping as well.  */
579   else if (TYPE_P (*tp))
580     *tp = remap_type (*tp, id);
581
582   /* If this is a constant, we have to copy the node iff the type will be
583      remapped.  copy_tree_r will not copy a constant.  */
584   else if (CONSTANT_CLASS_P (*tp))
585     {
586       tree new_type = remap_type (TREE_TYPE (*tp), id);
587
588       if (new_type == TREE_TYPE (*tp))
589         *walk_subtrees = 0;
590
591       else if (TREE_CODE (*tp) == INTEGER_CST)
592         *tp = build_int_cst_wide (new_type, TREE_INT_CST_LOW (*tp),
593                                   TREE_INT_CST_HIGH (*tp));
594       else
595         {
596           *tp = copy_node (*tp);
597           TREE_TYPE (*tp) = new_type;
598         }
599     }
600
601   /* Otherwise, just copy the node.  Note that copy_tree_r already
602      knows not to copy VAR_DECLs, etc., so this is safe.  */
603   else
604     {
605       /* Here we handle trees that are not completely rewritten.
606          First we detect some inlining-induced bogosities for
607          discarding.  */
608       if (TREE_CODE (*tp) == MODIFY_EXPR
609           && TREE_OPERAND (*tp, 0) == TREE_OPERAND (*tp, 1)
610           && (lang_hooks.tree_inlining.auto_var_in_fn_p
611               (TREE_OPERAND (*tp, 0), fn)))
612         {
613           /* Some assignments VAR = VAR; don't generate any rtl code
614              and thus don't count as variable modification.  Avoid
615              keeping bogosities like 0 = 0.  */
616           tree decl = TREE_OPERAND (*tp, 0), value;
617           splay_tree_node n;
618
619           n = splay_tree_lookup (id->decl_map, (splay_tree_key) decl);
620           if (n)
621             {
622               value = (tree) n->value;
623               STRIP_TYPE_NOPS (value);
624               if (TREE_CONSTANT (value) || TREE_READONLY_DECL_P (value))
625                 {
626                   *tp = build_empty_stmt ();
627                   return copy_body_r (tp, walk_subtrees, data);
628                 }
629             }
630         }
631       else if (TREE_CODE (*tp) == INDIRECT_REF
632                && !id->versioning_p)
633         {
634           /* Get rid of *& from inline substitutions that can happen when a
635              pointer argument is an ADDR_EXPR.  */
636           tree decl = TREE_OPERAND (*tp, 0);
637           splay_tree_node n;
638
639           n = splay_tree_lookup (id->decl_map, (splay_tree_key) decl);
640           if (n)
641             {
642               tree new;
643               /* If we happen to get an ADDR_EXPR in n->value, strip
644                  it manually here as we'll eventually get ADDR_EXPRs
645                  which lie about their types pointed to.  In this case
646                  build_fold_indirect_ref wouldn't strip the INDIRECT_REF,
647                  but we absolutely rely on that.  As fold_indirect_ref
648                  does other useful transformations, try that first, though.  */
649               tree type = TREE_TYPE (TREE_TYPE ((tree)n->value));
650               new = unshare_expr ((tree)n->value);
651               *tp = fold_indirect_ref_1 (type, new);
652               if (! *tp)
653                 {
654                   if (TREE_CODE (new) == ADDR_EXPR)
655                     *tp = TREE_OPERAND (new, 0);
656                   else
657                     *tp = build1 (INDIRECT_REF, type, new);
658                 }
659               *walk_subtrees = 0;
660               return NULL;
661             }
662         }
663
664       /* Here is the "usual case".  Copy this tree node, and then
665          tweak some special cases.  */
666       copy_tree_r (tp, walk_subtrees, id->versioning_p ? data : NULL);
667        
668       /* If EXPR has block defined, map it to newly constructed block.
669          When inlining we want EXPRs without block appear in the block
670          of function call.  */
671       if (IS_EXPR_CODE_CLASS (TREE_CODE_CLASS (TREE_CODE (*tp))))
672         {
673           new_block = id->block;
674           if (TREE_BLOCK (*tp))
675             {
676               splay_tree_node n;
677               n = splay_tree_lookup (id->decl_map,
678                                      (splay_tree_key) TREE_BLOCK (*tp));
679               gcc_assert (n);
680               new_block = (tree) n->value;
681             }
682           TREE_BLOCK (*tp) = new_block;
683         }
684
685       if (TREE_CODE (*tp) == RESX_EXPR && id->eh_region_offset)
686         TREE_OPERAND (*tp, 0) =
687           build_int_cst
688             (NULL_TREE,
689              id->eh_region_offset + TREE_INT_CST_LOW (TREE_OPERAND (*tp, 0)));
690
691       TREE_TYPE (*tp) = remap_type (TREE_TYPE (*tp), id);
692
693       /* The copied TARGET_EXPR has never been expanded, even if the
694          original node was expanded already.  */
695       if (TREE_CODE (*tp) == TARGET_EXPR && TREE_OPERAND (*tp, 3))
696         {
697           TREE_OPERAND (*tp, 1) = TREE_OPERAND (*tp, 3);
698           TREE_OPERAND (*tp, 3) = NULL_TREE;
699         }
700
701       /* Variable substitution need not be simple.  In particular, the
702          INDIRECT_REF substitution above.  Make sure that TREE_CONSTANT
703          and friends are up-to-date.  */
704       else if (TREE_CODE (*tp) == ADDR_EXPR)
705         {
706           walk_tree (&TREE_OPERAND (*tp, 0), copy_body_r, id, NULL);
707           recompute_tree_invariant_for_addr_expr (*tp);
708           *walk_subtrees = 0;
709         }
710     }
711
712   /* Keep iterating.  */
713   return NULL_TREE;
714 }
715
716 /* Copy basic block, scale profile accordingly.  Edges will be taken care of
717    later  */
718
719 static basic_block
720 copy_bb (inline_data *id, basic_block bb, int frequency_scale, int count_scale)
721 {
722   block_stmt_iterator bsi, copy_bsi;
723   basic_block copy_basic_block;
724
725   /* create_basic_block() will append every new block to
726      basic_block_info automatically.  */
727   copy_basic_block = create_basic_block (NULL, (void *) 0,
728                                          (basic_block) bb->prev_bb->aux);
729   copy_basic_block->count = bb->count * count_scale / REG_BR_PROB_BASE;
730   copy_basic_block->frequency = (bb->frequency
731                                      * frequency_scale / REG_BR_PROB_BASE);
732   copy_bsi = bsi_start (copy_basic_block);
733
734   for (bsi = bsi_start (bb);
735        !bsi_end_p (bsi); bsi_next (&bsi))
736     {
737       tree stmt = bsi_stmt (bsi);
738       tree orig_stmt = stmt;
739
740       walk_tree (&stmt, copy_body_r, id, NULL);
741
742       /* RETURN_EXPR might be removed,
743          this is signalled by making stmt pointer NULL.  */
744       if (stmt)
745         {
746           tree call, decl;
747           bsi_insert_after (&copy_bsi, stmt, BSI_NEW_STMT);
748           call = get_call_expr_in (stmt);
749           /* We're duplicating a CALL_EXPR.  Find any corresponding
750              callgraph edges and update or duplicate them.  */
751           if (call && (decl = get_callee_fndecl (call)))
752             {
753               if (id->saving_p)
754                 {
755                   struct cgraph_node *node;
756                   struct cgraph_edge *edge;
757
758                   /* We're saving a copy of the body, so we'll update the
759                      callgraph nodes in place.  Note that we avoid
760                      altering the original callgraph node; we begin with
761                      the first clone.  */
762                   for (node = id->node->next_clone;
763                        node;
764                        node = node->next_clone)
765                     {
766                       edge = cgraph_edge (node, orig_stmt);
767                       gcc_assert (edge);
768                       edge->call_stmt = stmt;
769                     }
770                 }
771               else
772                 {
773                   struct cgraph_edge *edge;
774
775                   /* We're cloning or inlining this body; duplicate the
776                      associate callgraph nodes.  */
777                   if (!id->versioning_p)
778                     {
779                       edge = cgraph_edge (id->current_node, orig_stmt);
780                       if (edge)
781                         cgraph_clone_edge (edge, id->node, stmt,
782                                            REG_BR_PROB_BASE, 1, true);
783                     }
784                 }
785               if (id->versioning_p)
786                 {
787                   /* Update the call_expr on the edges from the new version
788                      to its callees. */
789                   struct cgraph_edge *edge;
790                   edge = cgraph_edge (id->node, orig_stmt);
791                   if (edge)
792                     edge->call_stmt = stmt;
793                 }
794             }
795           /* If you think we can abort here, you are wrong.
796              There is no region 0 in tree land.  */
797           gcc_assert (lookup_stmt_eh_region_fn (id->callee_cfun, orig_stmt)
798                       != 0);
799
800           if (tree_could_throw_p (stmt))
801             {
802               int region = lookup_stmt_eh_region_fn (id->callee_cfun, orig_stmt);
803               /* Add an entry for the copied tree in the EH hashtable.
804                  When saving or cloning or versioning, use the hashtable in
805                  cfun, and just copy the EH number.  When inlining, use the
806                  hashtable in the caller, and adjust the region number.  */
807               if (region > 0)
808                 add_stmt_to_eh_region (stmt, region + id->eh_region_offset);
809
810               /* If this tree doesn't have a region associated with it,
811                  and there is a "current region,"
812                  then associate this tree with the current region
813                  and add edges associated with this region.  */
814               if ((lookup_stmt_eh_region_fn (id->callee_cfun,
815                                              orig_stmt) <= 0
816                    && id->eh_region > 0)
817                   && tree_could_throw_p (stmt))
818                 add_stmt_to_eh_region (stmt, id->eh_region);
819             }
820         }
821     }
822   return copy_basic_block;
823 }
824
825 /* Copy edges from BB into its copy constructed earlier, scale profile
826    accordingly.  Edges will be taken care of later.  Assume aux
827    pointers to point to the copies of each BB.  */
828 static void
829 copy_edges_for_bb (basic_block bb, int count_scale)
830 {
831   basic_block new_bb = (basic_block) bb->aux;
832   edge_iterator ei;
833   edge old_edge;
834   block_stmt_iterator bsi;
835   int flags;
836
837   /* Use the indices from the original blocks to create edges for the
838      new ones.  */
839   FOR_EACH_EDGE (old_edge, ei, bb->succs)
840     if (!(old_edge->flags & EDGE_EH))
841       {
842         edge new;
843
844         flags = old_edge->flags;
845
846         /* Return edges do get a FALLTHRU flag when the get inlined.  */
847         if (old_edge->dest->index == EXIT_BLOCK && !old_edge->flags
848             && old_edge->dest->aux != EXIT_BLOCK_PTR)
849           flags |= EDGE_FALLTHRU;
850         new = make_edge (new_bb, (basic_block) old_edge->dest->aux, flags);
851         new->count = old_edge->count * count_scale / REG_BR_PROB_BASE;
852         new->probability = old_edge->probability;
853       }
854
855   if (bb->index == ENTRY_BLOCK || bb->index == EXIT_BLOCK)
856     return;
857
858   for (bsi = bsi_start (new_bb); !bsi_end_p (bsi);)
859     {
860       tree copy_stmt;
861
862       copy_stmt = bsi_stmt (bsi);
863       update_stmt (copy_stmt);
864       /* Do this before the possible split_block.  */
865       bsi_next (&bsi);
866
867       /* If this tree could throw an exception, there are two
868          cases where we need to add abnormal edge(s): the
869          tree wasn't in a region and there is a "current
870          region" in the caller; or the original tree had
871          EH edges.  In both cases split the block after the tree,
872          and add abnormal edge(s) as needed; we need both
873          those from the callee and the caller.
874          We check whether the copy can throw, because the const
875          propagation can change an INDIRECT_REF which throws
876          into a COMPONENT_REF which doesn't.  If the copy
877          can throw, the original could also throw.  */
878
879       if (tree_can_throw_internal (copy_stmt))
880         {
881           if (!bsi_end_p (bsi))
882             /* Note that bb's predecessor edges aren't necessarily
883                right at this point; split_block doesn't care.  */
884             {
885               edge e = split_block (new_bb, copy_stmt);
886               new_bb = e->dest;
887               bsi = bsi_start (new_bb);
888             }
889
890            make_eh_edges (copy_stmt);
891         }
892     }
893 }
894
895 /* Wrapper for remap_decl so it can be used as a callback.  */
896 static tree
897 remap_decl_1 (tree decl, void *data)
898 {
899   return remap_decl (decl, (inline_data *) data);
900 }
901
902 /* Make a copy of the body of FN so that it can be inserted inline in
903    another function.  Walks FN via CFG, returns new fndecl.  */
904
905 static tree
906 copy_cfg_body (inline_data * id, gcov_type count, int frequency,
907                basic_block entry_block_map, basic_block exit_block_map)
908 {
909   tree callee_fndecl = id->callee;
910   /* Original cfun for the callee, doesn't change.  */
911   struct function *callee_cfun = DECL_STRUCT_FUNCTION (callee_fndecl);
912   /* Copy, built by this function.  */
913   struct function *new_cfun;
914   /* Place to copy from; when a copy of the function was saved off earlier,
915      use that instead of the main copy.  */
916   struct function *cfun_to_copy =
917     (struct function *) ggc_alloc_cleared (sizeof (struct function));
918   basic_block bb;
919   tree new_fndecl = NULL;
920   bool saving_or_cloning;
921   int count_scale, frequency_scale;
922
923   if (ENTRY_BLOCK_PTR_FOR_FUNCTION (callee_cfun)->count)
924     count_scale = (REG_BR_PROB_BASE * count
925                    / ENTRY_BLOCK_PTR_FOR_FUNCTION (callee_cfun)->count);
926   else
927     count_scale = 1;
928
929   if (ENTRY_BLOCK_PTR_FOR_FUNCTION (callee_cfun)->frequency)
930     frequency_scale = (REG_BR_PROB_BASE * frequency
931                        /
932                        ENTRY_BLOCK_PTR_FOR_FUNCTION (callee_cfun)->frequency);
933   else
934     frequency_scale = count_scale;
935
936   /* Register specific tree functions.  */
937   tree_register_cfg_hooks ();
938
939   /* Must have a CFG here at this point.  */
940   gcc_assert (ENTRY_BLOCK_PTR_FOR_FUNCTION
941               (DECL_STRUCT_FUNCTION (callee_fndecl)));
942
943   *cfun_to_copy = *DECL_STRUCT_FUNCTION (callee_fndecl);
944
945   /* If there is a saved_cfg+saved_args lurking in the
946      struct function, a copy of the callee body was saved there, and
947      the 'struct cgraph edge' nodes have been fudged to point into the
948      saved body.  Accordingly, we want to copy that saved body so the
949      callgraph edges will be recognized and cloned properly.  */
950   if (cfun_to_copy->saved_cfg)
951     {
952       cfun_to_copy->cfg = cfun_to_copy->saved_cfg;
953       cfun_to_copy->eh = cfun_to_copy->saved_eh;
954     }
955   id->callee_cfun = cfun_to_copy;
956
957   /* If saving or cloning a function body, create new basic_block_info
958      and label_to_block_maps.  Otherwise, we're duplicating a function
959      body for inlining; insert our new blocks and labels into the
960      existing varrays.  */
961   saving_or_cloning = (id->saving_p || id->cloning_p || id->versioning_p);
962   if (saving_or_cloning)
963     {
964       new_cfun =
965         (struct function *) ggc_alloc_cleared (sizeof (struct function));
966       *new_cfun = *DECL_STRUCT_FUNCTION (callee_fndecl);
967       new_cfun->cfg = NULL;
968       new_cfun->decl = new_fndecl = copy_node (callee_fndecl);
969       new_cfun->ib_boundaries_block = (varray_type) 0;
970       DECL_STRUCT_FUNCTION (new_fndecl) = new_cfun;
971       push_cfun (new_cfun);
972       init_empty_tree_cfg ();
973
974       ENTRY_BLOCK_PTR->count =
975         (ENTRY_BLOCK_PTR_FOR_FUNCTION (callee_cfun)->count * count_scale /
976          REG_BR_PROB_BASE);
977       ENTRY_BLOCK_PTR->frequency =
978         (ENTRY_BLOCK_PTR_FOR_FUNCTION (callee_cfun)->frequency *
979          frequency_scale / REG_BR_PROB_BASE);
980       EXIT_BLOCK_PTR->count =
981         (EXIT_BLOCK_PTR_FOR_FUNCTION (callee_cfun)->count * count_scale /
982          REG_BR_PROB_BASE);
983       EXIT_BLOCK_PTR->frequency =
984         (EXIT_BLOCK_PTR_FOR_FUNCTION (callee_cfun)->frequency *
985          frequency_scale / REG_BR_PROB_BASE);
986
987       entry_block_map = ENTRY_BLOCK_PTR;
988       exit_block_map = EXIT_BLOCK_PTR;
989     }
990
991   ENTRY_BLOCK_PTR_FOR_FUNCTION (cfun_to_copy)->aux = entry_block_map;
992   EXIT_BLOCK_PTR_FOR_FUNCTION (cfun_to_copy)->aux = exit_block_map;
993
994
995   /* Duplicate any exception-handling regions.  */
996   if (cfun->eh)
997     {
998       if (saving_or_cloning)
999         init_eh_for_function ();
1000       id->eh_region_offset = duplicate_eh_regions (cfun_to_copy,
1001                                                    remap_decl_1,
1002                                                    id, id->eh_region);
1003       gcc_assert (inlining_p (id) || !id->eh_region_offset);
1004     }
1005   /* Use aux pointers to map the original blocks to copy.  */
1006   FOR_EACH_BB_FN (bb, cfun_to_copy)
1007     bb->aux = copy_bb (id, bb, frequency_scale, count_scale);
1008   /* Now that we've duplicated the blocks, duplicate their edges.  */
1009   FOR_ALL_BB_FN (bb, cfun_to_copy)
1010     copy_edges_for_bb (bb, count_scale);
1011   FOR_ALL_BB_FN (bb, cfun_to_copy)
1012     bb->aux = NULL;
1013
1014   if (saving_or_cloning)
1015     pop_cfun ();
1016
1017   return new_fndecl;
1018 }
1019
1020 /* Make a copy of the body of FN so that it can be inserted inline in
1021    another function.  */
1022
1023 static tree
1024 copy_generic_body (inline_data *id)
1025 {
1026   tree body;
1027   tree fndecl = id->callee;
1028
1029   body = DECL_SAVED_TREE (fndecl);
1030   walk_tree (&body, copy_body_r, id, NULL);
1031
1032   return body;
1033 }
1034
1035 static tree
1036 copy_body (inline_data *id, gcov_type count, int frequency,
1037            basic_block entry_block_map, basic_block exit_block_map)
1038 {
1039   tree fndecl = id->callee;
1040   tree body;
1041
1042   /* If this body has a CFG, walk CFG and copy.  */
1043   gcc_assert (ENTRY_BLOCK_PTR_FOR_FUNCTION (DECL_STRUCT_FUNCTION (fndecl)));
1044   body = copy_cfg_body (id, count, frequency, entry_block_map, exit_block_map);
1045
1046   return body;
1047 }
1048
1049 /* Return true if VALUE is an ADDR_EXPR of an automatic variable
1050    defined in function FN, or of a data member thereof.  */
1051
1052 static bool
1053 self_inlining_addr_expr (tree value, tree fn)
1054 {
1055   tree var;
1056
1057   if (TREE_CODE (value) != ADDR_EXPR)
1058     return false;
1059
1060   var = get_base_address (TREE_OPERAND (value, 0));
1061
1062   return var && lang_hooks.tree_inlining.auto_var_in_fn_p (var, fn);
1063 }
1064
1065 static void
1066 setup_one_parameter (inline_data *id, tree p, tree value, tree fn,
1067                      basic_block bb, tree *vars)
1068 {
1069   tree init_stmt;
1070   tree var;
1071   tree var_sub;
1072
1073   /* If the parameter is never assigned to, we may not need to
1074      create a new variable here at all.  Instead, we may be able
1075      to just use the argument value.  */
1076   if (TREE_READONLY (p)
1077       && !TREE_ADDRESSABLE (p)
1078       && value && !TREE_SIDE_EFFECTS (value))
1079     {
1080       /* We may produce non-gimple trees by adding NOPs or introduce
1081          invalid sharing when operand is not really constant.
1082          It is not big deal to prohibit constant propagation here as
1083          we will constant propagate in DOM1 pass anyway.  */
1084       if (is_gimple_min_invariant (value)
1085           && lang_hooks.types_compatible_p (TREE_TYPE (value), TREE_TYPE (p))
1086           /* We have to be very careful about ADDR_EXPR.  Make sure
1087              the base variable isn't a local variable of the inlined
1088              function, e.g., when doing recursive inlining, direct or
1089              mutually-recursive or whatever, which is why we don't
1090              just test whether fn == current_function_decl.  */
1091           && ! self_inlining_addr_expr (value, fn))
1092         {
1093           insert_decl_map (id, p, value);
1094           return;
1095         }
1096     }
1097
1098   /* Make an equivalent VAR_DECL.  Note that we must NOT remap the type
1099      here since the type of this decl must be visible to the calling
1100      function.  */
1101   var = copy_decl_for_dup (p, fn, id->caller, /*versioning=*/false);
1102
1103   /* See if the frontend wants to pass this by invisible reference.  If
1104      so, our new VAR_DECL will have REFERENCE_TYPE, and we need to
1105      replace uses of the PARM_DECL with dereferences.  */
1106   if (TREE_TYPE (var) != TREE_TYPE (p)
1107       && POINTER_TYPE_P (TREE_TYPE (var))
1108       && TREE_TYPE (TREE_TYPE (var)) == TREE_TYPE (p))
1109     {
1110       insert_decl_map (id, var, var);
1111       var_sub = build_fold_indirect_ref (var);
1112     }
1113   else
1114     var_sub = var;
1115
1116   /* Register the VAR_DECL as the equivalent for the PARM_DECL;
1117      that way, when the PARM_DECL is encountered, it will be
1118      automatically replaced by the VAR_DECL.  */
1119   insert_decl_map (id, p, var_sub);
1120
1121   /* Declare this new variable.  */
1122   TREE_CHAIN (var) = *vars;
1123   *vars = var;
1124
1125   /* Make gimplifier happy about this variable.  */
1126   DECL_SEEN_IN_BIND_EXPR_P (var) = 1;
1127
1128   /* Even if P was TREE_READONLY, the new VAR should not be.
1129      In the original code, we would have constructed a
1130      temporary, and then the function body would have never
1131      changed the value of P.  However, now, we will be
1132      constructing VAR directly.  The constructor body may
1133      change its value multiple times as it is being
1134      constructed.  Therefore, it must not be TREE_READONLY;
1135      the back-end assumes that TREE_READONLY variable is
1136      assigned to only once.  */
1137   if (TYPE_NEEDS_CONSTRUCTING (TREE_TYPE (p)))
1138     TREE_READONLY (var) = 0;
1139
1140   /* Initialize this VAR_DECL from the equivalent argument.  Convert
1141      the argument to the proper type in case it was promoted.  */
1142   if (value)
1143     {
1144       tree rhs = fold_convert (TREE_TYPE (var), value);
1145       block_stmt_iterator bsi = bsi_last (bb);
1146
1147       if (rhs == error_mark_node)
1148         return;
1149
1150       /* We want to use MODIFY_EXPR, not INIT_EXPR here so that we
1151          keep our trees in gimple form.  */
1152       init_stmt = build2 (MODIFY_EXPR, TREE_TYPE (var), var, rhs);
1153
1154       /* If we did not create a gimple value and we did not create a gimple
1155          cast of a gimple value, then we will need to gimplify INIT_STMTS
1156          at the end.  Note that is_gimple_cast only checks the outer
1157          tree code, not its operand.  Thus the explicit check that its
1158          operand is a gimple value.  */
1159       if (!is_gimple_val (rhs)
1160           && (!is_gimple_cast (rhs)
1161               || !is_gimple_val (TREE_OPERAND (rhs, 0))))
1162         gimplify_stmt (&init_stmt);
1163
1164       /* If VAR represents a zero-sized variable, it's possible that the
1165          assignment statment may result in no gimple statements.  */
1166       if (init_stmt)
1167         bsi_insert_after (&bsi, init_stmt, BSI_NEW_STMT);
1168     }
1169 }
1170
1171 /* Generate code to initialize the parameters of the function at the
1172    top of the stack in ID from the ARGS (presented as a TREE_LIST).  */
1173
1174 static void
1175 initialize_inlined_parameters (inline_data *id, tree args, tree static_chain,
1176                                tree fn, basic_block bb)
1177 {
1178   tree parms;
1179   tree a;
1180   tree p;
1181   tree vars = NULL_TREE;
1182   int argnum = 0;
1183
1184   /* Figure out what the parameters are.  */
1185   parms = DECL_ARGUMENTS (fn);
1186   if (fn == current_function_decl)
1187     parms = cfun->saved_args;
1188
1189   /* Loop through the parameter declarations, replacing each with an
1190      equivalent VAR_DECL, appropriately initialized.  */
1191   for (p = parms, a = args; p;
1192        a = a ? TREE_CHAIN (a) : a, p = TREE_CHAIN (p))
1193     {
1194       tree value;
1195
1196       ++argnum;
1197
1198       /* Find the initializer.  */
1199       value = lang_hooks.tree_inlining.convert_parm_for_inlining
1200               (p, a ? TREE_VALUE (a) : NULL_TREE, fn, argnum);
1201
1202       setup_one_parameter (id, p, value, fn, bb, &vars);
1203     }
1204
1205   /* Initialize the static chain.  */
1206   p = DECL_STRUCT_FUNCTION (fn)->static_chain_decl;
1207   if (fn == current_function_decl)
1208     p = DECL_STRUCT_FUNCTION (fn)->saved_static_chain_decl;
1209   if (p)
1210     {
1211       /* No static chain?  Seems like a bug in tree-nested.c.  */
1212       gcc_assert (static_chain);
1213
1214       setup_one_parameter (id, p, static_chain, fn, bb, &vars);
1215     }
1216
1217   declare_inline_vars (id->block, vars);
1218 }
1219
1220 /* Declare a return variable to replace the RESULT_DECL for the
1221    function we are calling.  An appropriate DECL_STMT is returned.
1222    The USE_STMT is filled to contain a use of the declaration to
1223    indicate the return value of the function.
1224
1225    RETURN_SLOT_ADDR, if non-null, was a fake parameter that
1226    took the address of the result.  MODIFY_DEST, if non-null, was the LHS of
1227    the MODIFY_EXPR to which this call is the RHS.
1228
1229    The return value is a (possibly null) value that is the result of the
1230    function as seen by the callee.  *USE_P is a (possibly null) value that
1231    holds the result as seen by the caller.  */
1232
1233 static tree
1234 declare_return_variable (inline_data *id, tree return_slot_addr,
1235                          tree modify_dest, tree *use_p)
1236 {
1237   tree callee = id->callee;
1238   tree caller = id->caller;
1239   tree result = DECL_RESULT (callee);
1240   tree callee_type = TREE_TYPE (result);
1241   tree caller_type = TREE_TYPE (TREE_TYPE (callee));
1242   tree var, use;
1243
1244   /* We don't need to do anything for functions that don't return
1245      anything.  */
1246   if (!result || VOID_TYPE_P (callee_type))
1247     {
1248       *use_p = NULL_TREE;
1249       return NULL_TREE;
1250     }
1251
1252   /* If there was a return slot, then the return value is the
1253      dereferenced address of that object.  */
1254   if (return_slot_addr)
1255     {
1256       /* The front end shouldn't have used both return_slot_addr and
1257          a modify expression.  */
1258       gcc_assert (!modify_dest);
1259       if (DECL_BY_REFERENCE (result))
1260         var = return_slot_addr;
1261       else
1262         var = build_fold_indirect_ref (return_slot_addr);
1263       use = NULL;
1264       goto done;
1265     }
1266
1267   /* All types requiring non-trivial constructors should have been handled.  */
1268   gcc_assert (!TREE_ADDRESSABLE (callee_type));
1269
1270   /* Attempt to avoid creating a new temporary variable.  */
1271   if (modify_dest)
1272     {
1273       bool use_it = false;
1274
1275       /* We can't use MODIFY_DEST if there's type promotion involved.  */
1276       if (!lang_hooks.types_compatible_p (caller_type, callee_type))
1277         use_it = false;
1278
1279       /* ??? If we're assigning to a variable sized type, then we must
1280          reuse the destination variable, because we've no good way to
1281          create variable sized temporaries at this point.  */
1282       else if (TREE_CODE (TYPE_SIZE_UNIT (caller_type)) != INTEGER_CST)
1283         use_it = true;
1284
1285       /* If the callee cannot possibly modify MODIFY_DEST, then we can
1286          reuse it as the result of the call directly.  Don't do this if
1287          it would promote MODIFY_DEST to addressable.  */
1288       else if (TREE_ADDRESSABLE (result))
1289         use_it = false;
1290       else
1291         {
1292           tree base_m = get_base_address (modify_dest);
1293
1294           /* If the base isn't a decl, then it's a pointer, and we don't
1295              know where that's going to go.  */
1296           if (!DECL_P (base_m))
1297             use_it = false;
1298           else if (is_global_var (base_m))
1299             use_it = false;
1300           else if (!TREE_ADDRESSABLE (base_m))
1301             use_it = true;
1302         }
1303
1304       if (use_it)
1305         {
1306           var = modify_dest;
1307           use = NULL;
1308           goto done;
1309         }
1310     }
1311
1312   gcc_assert (TREE_CODE (TYPE_SIZE_UNIT (callee_type)) == INTEGER_CST);
1313
1314   var = copy_decl_for_dup (result, callee, caller, /*versioning=*/false);
1315
1316   DECL_SEEN_IN_BIND_EXPR_P (var) = 1;
1317   DECL_STRUCT_FUNCTION (caller)->unexpanded_var_list
1318     = tree_cons (NULL_TREE, var,
1319                  DECL_STRUCT_FUNCTION (caller)->unexpanded_var_list);
1320
1321   /* Do not have the rest of GCC warn about this variable as it should
1322      not be visible to the user.  */
1323   TREE_NO_WARNING (var) = 1;
1324
1325   /* Build the use expr.  If the return type of the function was
1326      promoted, convert it back to the expected type.  */
1327   use = var;
1328   if (!lang_hooks.types_compatible_p (TREE_TYPE (var), caller_type))
1329     use = fold_convert (caller_type, var);
1330
1331  done:
1332   /* Register the VAR_DECL as the equivalent for the RESULT_DECL; that
1333      way, when the RESULT_DECL is encountered, it will be
1334      automatically replaced by the VAR_DECL.  */
1335   insert_decl_map (id, result, var);
1336
1337   /* Remember this so we can ignore it in remap_decls.  */
1338   id->retvar = var;
1339
1340   *use_p = use;
1341   return var;
1342 }
1343
1344 /* Returns nonzero if a function can be inlined as a tree.  */
1345
1346 bool
1347 tree_inlinable_function_p (tree fn)
1348 {
1349   return inlinable_function_p (fn);
1350 }
1351
1352 static const char *inline_forbidden_reason;
1353
1354 static tree
1355 inline_forbidden_p_1 (tree *nodep, int *walk_subtrees ATTRIBUTE_UNUSED,
1356                       void *fnp)
1357 {
1358   tree node = *nodep;
1359   tree fn = (tree) fnp;
1360   tree t;
1361
1362   switch (TREE_CODE (node))
1363     {
1364     case CALL_EXPR:
1365       /* Refuse to inline alloca call unless user explicitly forced so as
1366          this may change program's memory overhead drastically when the
1367          function using alloca is called in loop.  In GCC present in
1368          SPEC2000 inlining into schedule_block cause it to require 2GB of
1369          RAM instead of 256MB.  */
1370       if (alloca_call_p (node)
1371           && !lookup_attribute ("always_inline", DECL_ATTRIBUTES (fn)))
1372         {
1373           inline_forbidden_reason
1374             = G_("function %q+F can never be inlined because it uses "
1375                  "alloca (override using the always_inline attribute)");
1376           return node;
1377         }
1378       t = get_callee_fndecl (node);
1379       if (! t)
1380         break;
1381
1382       /* We cannot inline functions that call setjmp.  */
1383       if (setjmp_call_p (t))
1384         {
1385           inline_forbidden_reason
1386             = G_("function %q+F can never be inlined because it uses setjmp");
1387           return node;
1388         }
1389
1390       if (DECL_BUILT_IN_CLASS (t) == BUILT_IN_NORMAL)
1391         switch (DECL_FUNCTION_CODE (t))
1392           {
1393             /* We cannot inline functions that take a variable number of
1394                arguments.  */
1395           case BUILT_IN_VA_START:
1396           case BUILT_IN_STDARG_START:
1397           case BUILT_IN_NEXT_ARG:
1398           case BUILT_IN_VA_END:
1399             inline_forbidden_reason
1400               = G_("function %q+F can never be inlined because it "
1401                    "uses variable argument lists");
1402             return node;
1403
1404           case BUILT_IN_LONGJMP:
1405             /* We can't inline functions that call __builtin_longjmp at
1406                all.  The non-local goto machinery really requires the
1407                destination be in a different function.  If we allow the
1408                function calling __builtin_longjmp to be inlined into the
1409                function calling __builtin_setjmp, Things will Go Awry.  */
1410             inline_forbidden_reason
1411               = G_("function %q+F can never be inlined because "
1412                    "it uses setjmp-longjmp exception handling");
1413             return node;
1414
1415           case BUILT_IN_NONLOCAL_GOTO:
1416             /* Similarly.  */
1417             inline_forbidden_reason
1418               = G_("function %q+F can never be inlined because "
1419                    "it uses non-local goto");
1420             return node;
1421
1422           case BUILT_IN_RETURN:
1423           case BUILT_IN_APPLY_ARGS:
1424             /* If a __builtin_apply_args caller would be inlined,
1425                it would be saving arguments of the function it has
1426                been inlined into.  Similarly __builtin_return would
1427                return from the function the inline has been inlined into.  */
1428             inline_forbidden_reason
1429               = G_("function %q+F can never be inlined because "
1430                    "it uses __builtin_return or __builtin_apply_args");
1431             return node;
1432
1433           default:
1434             break;
1435           }
1436       break;
1437
1438     case GOTO_EXPR:
1439       t = TREE_OPERAND (node, 0);
1440
1441       /* We will not inline a function which uses computed goto.  The
1442          addresses of its local labels, which may be tucked into
1443          global storage, are of course not constant across
1444          instantiations, which causes unexpected behavior.  */
1445       if (TREE_CODE (t) != LABEL_DECL)
1446         {
1447           inline_forbidden_reason
1448             = G_("function %q+F can never be inlined "
1449                  "because it contains a computed goto");
1450           return node;
1451         }
1452       break;
1453
1454     case LABEL_EXPR:
1455       t = TREE_OPERAND (node, 0);
1456       if (DECL_NONLOCAL (t))
1457         {
1458           /* We cannot inline a function that receives a non-local goto
1459              because we cannot remap the destination label used in the
1460              function that is performing the non-local goto.  */
1461           inline_forbidden_reason
1462             = G_("function %q+F can never be inlined "
1463                  "because it receives a non-local goto");
1464           return node;
1465         }
1466       break;
1467
1468     case RECORD_TYPE:
1469     case UNION_TYPE:
1470       /* We cannot inline a function of the form
1471
1472            void F (int i) { struct S { int ar[i]; } s; }
1473
1474          Attempting to do so produces a catch-22.
1475          If walk_tree examines the TYPE_FIELDS chain of RECORD_TYPE/
1476          UNION_TYPE nodes, then it goes into infinite recursion on a
1477          structure containing a pointer to its own type.  If it doesn't,
1478          then the type node for S doesn't get adjusted properly when
1479          F is inlined. 
1480
1481          ??? This is likely no longer true, but it's too late in the 4.0
1482          cycle to try to find out.  This should be checked for 4.1.  */
1483       for (t = TYPE_FIELDS (node); t; t = TREE_CHAIN (t))
1484         if (variably_modified_type_p (TREE_TYPE (t), NULL))
1485           {
1486             inline_forbidden_reason
1487               = G_("function %q+F can never be inlined "
1488                    "because it uses variable sized variables");
1489             return node;
1490           }
1491
1492     default:
1493       break;
1494     }
1495
1496   return NULL_TREE;
1497 }
1498
1499 /* Return subexpression representing possible alloca call, if any.  */
1500 static tree
1501 inline_forbidden_p (tree fndecl)
1502 {
1503   location_t saved_loc = input_location;
1504   block_stmt_iterator bsi;
1505   basic_block bb;
1506   tree ret = NULL_TREE;
1507
1508   FOR_EACH_BB_FN (bb, DECL_STRUCT_FUNCTION (fndecl))
1509     for (bsi = bsi_start (bb); !bsi_end_p (bsi); bsi_next (&bsi))
1510       {
1511         ret = walk_tree_without_duplicates (bsi_stmt_ptr (bsi),
1512                                     inline_forbidden_p_1, fndecl);
1513         if (ret)
1514           goto egress;
1515       }
1516
1517 egress:
1518   input_location = saved_loc;
1519   return ret;
1520 }
1521
1522 /* Returns nonzero if FN is a function that does not have any
1523    fundamental inline blocking properties.  */
1524
1525 static bool
1526 inlinable_function_p (tree fn)
1527 {
1528   bool inlinable = true;
1529
1530   /* If we've already decided this function shouldn't be inlined,
1531      there's no need to check again.  */
1532   if (DECL_UNINLINABLE (fn))
1533     return false;
1534
1535   /* See if there is any language-specific reason it cannot be
1536      inlined.  (It is important that this hook be called early because
1537      in C++ it may result in template instantiation.)
1538      If the function is not inlinable for language-specific reasons,
1539      it is left up to the langhook to explain why.  */
1540   inlinable = !lang_hooks.tree_inlining.cannot_inline_tree_fn (&fn);
1541
1542   /* If we don't have the function body available, we can't inline it.
1543      However, this should not be recorded since we also get here for
1544      forward declared inline functions.  Therefore, return at once.  */
1545   if (!DECL_SAVED_TREE (fn))
1546     return false;
1547
1548   /* If we're not inlining at all, then we cannot inline this function.  */
1549   else if (!flag_inline_trees)
1550     inlinable = false;
1551
1552   /* Only try to inline functions if DECL_INLINE is set.  This should be
1553      true for all functions declared `inline', and for all other functions
1554      as well with -finline-functions.
1555
1556      Don't think of disregarding DECL_INLINE when flag_inline_trees == 2;
1557      it's the front-end that must set DECL_INLINE in this case, because
1558      dwarf2out loses if a function that does not have DECL_INLINE set is
1559      inlined anyway.  That is why we have both DECL_INLINE and
1560      DECL_DECLARED_INLINE_P.  */
1561   /* FIXME: When flag_inline_trees dies, the check for flag_unit_at_a_time
1562             here should be redundant.  */
1563   else if (!DECL_INLINE (fn) && !flag_unit_at_a_time)
1564     inlinable = false;
1565
1566   else if (inline_forbidden_p (fn))
1567     {
1568       /* See if we should warn about uninlinable functions.  Previously,
1569          some of these warnings would be issued while trying to expand
1570          the function inline, but that would cause multiple warnings
1571          about functions that would for example call alloca.  But since
1572          this a property of the function, just one warning is enough.
1573          As a bonus we can now give more details about the reason why a
1574          function is not inlinable.
1575          We only warn for functions declared `inline' by the user.  */
1576       bool do_warning = (warn_inline
1577                          && DECL_INLINE (fn)
1578                          && DECL_DECLARED_INLINE_P (fn)
1579                          && !DECL_IN_SYSTEM_HEADER (fn));
1580
1581       if (lookup_attribute ("always_inline", DECL_ATTRIBUTES (fn)))
1582         sorry (inline_forbidden_reason, fn);
1583       else if (do_warning)
1584         warning (OPT_Winline, inline_forbidden_reason, fn);
1585
1586       inlinable = false;
1587     }
1588
1589   /* Squirrel away the result so that we don't have to check again.  */
1590   DECL_UNINLINABLE (fn) = !inlinable;
1591
1592   return inlinable;
1593 }
1594
1595 /* Estimate the cost of a memory move.  Use machine dependent
1596    word size and take possible memcpy call into account.  */
1597
1598 int
1599 estimate_move_cost (tree type)
1600 {
1601   HOST_WIDE_INT size;
1602
1603   size = int_size_in_bytes (type);
1604
1605   if (size < 0 || size > MOVE_MAX_PIECES * MOVE_RATIO)
1606     /* Cost of a memcpy call, 3 arguments and the call.  */
1607     return 4;
1608   else
1609     return ((size + MOVE_MAX_PIECES - 1) / MOVE_MAX_PIECES);
1610 }
1611
1612 /* Used by estimate_num_insns.  Estimate number of instructions seen
1613    by given statement.  */
1614
1615 static tree
1616 estimate_num_insns_1 (tree *tp, int *walk_subtrees, void *data)
1617 {
1618   int *count = (int *) data;
1619   tree x = *tp;
1620
1621   if (IS_TYPE_OR_DECL_P (x))
1622     {
1623       *walk_subtrees = 0;
1624       return NULL;
1625     }
1626   /* Assume that constants and references counts nothing.  These should
1627      be majorized by amount of operations among them we count later
1628      and are common target of CSE and similar optimizations.  */
1629   else if (CONSTANT_CLASS_P (x) || REFERENCE_CLASS_P (x))
1630     return NULL;
1631
1632   switch (TREE_CODE (x))
1633     {
1634     /* Containers have no cost.  */
1635     case TREE_LIST:
1636     case TREE_VEC:
1637     case BLOCK:
1638     case COMPONENT_REF:
1639     case BIT_FIELD_REF:
1640     case INDIRECT_REF:
1641     case ALIGN_INDIRECT_REF:
1642     case MISALIGNED_INDIRECT_REF:
1643     case ARRAY_REF:
1644     case ARRAY_RANGE_REF:
1645     case OBJ_TYPE_REF:
1646     case EXC_PTR_EXPR: /* ??? */
1647     case FILTER_EXPR: /* ??? */
1648     case COMPOUND_EXPR:
1649     case BIND_EXPR:
1650     case WITH_CLEANUP_EXPR:
1651     case NOP_EXPR:
1652     case VIEW_CONVERT_EXPR:
1653     case SAVE_EXPR:
1654     case ADDR_EXPR:
1655     case COMPLEX_EXPR:
1656     case RANGE_EXPR:
1657     case CASE_LABEL_EXPR:
1658     case SSA_NAME:
1659     case CATCH_EXPR:
1660     case EH_FILTER_EXPR:
1661     case STATEMENT_LIST:
1662     case ERROR_MARK:
1663     case NON_LVALUE_EXPR:
1664     case FDESC_EXPR:
1665     case VA_ARG_EXPR:
1666     case TRY_CATCH_EXPR:
1667     case TRY_FINALLY_EXPR:
1668     case LABEL_EXPR:
1669     case GOTO_EXPR:
1670     case RETURN_EXPR:
1671     case EXIT_EXPR:
1672     case LOOP_EXPR:
1673     case PHI_NODE:
1674     case WITH_SIZE_EXPR:
1675       break;
1676
1677     /* We don't account constants for now.  Assume that the cost is amortized
1678        by operations that do use them.  We may re-consider this decision once
1679        we are able to optimize the tree before estimating its size and break
1680        out static initializers.  */
1681     case IDENTIFIER_NODE:
1682     case INTEGER_CST:
1683     case REAL_CST:
1684     case COMPLEX_CST:
1685     case VECTOR_CST:
1686     case STRING_CST:
1687       *walk_subtrees = 0;
1688       return NULL;
1689
1690     /* Try to estimate the cost of assignments.  We have three cases to
1691        deal with:
1692         1) Simple assignments to registers;
1693         2) Stores to things that must live in memory.  This includes
1694            "normal" stores to scalars, but also assignments of large
1695            structures, or constructors of big arrays;
1696         3) TARGET_EXPRs.
1697
1698        Let us look at the first two cases, assuming we have "a = b + C":
1699        <modify_expr <var_decl "a"> <plus_expr <var_decl "b"> <constant C>>
1700        If "a" is a GIMPLE register, the assignment to it is free on almost
1701        any target, because "a" usually ends up in a real register.  Hence
1702        the only cost of this expression comes from the PLUS_EXPR, and we
1703        can ignore the MODIFY_EXPR.
1704        If "a" is not a GIMPLE register, the assignment to "a" will most
1705        likely be a real store, so the cost of the MODIFY_EXPR is the cost
1706        of moving something into "a", which we compute using the function
1707        estimate_move_cost.
1708
1709        The third case deals with TARGET_EXPRs, for which the semantics are
1710        that a temporary is assigned, unless the TARGET_EXPR itself is being
1711        assigned to something else.  In the latter case we do not need the
1712        temporary.  E.g. in <modify_expr <var_decl "a"> <target_expr>>, the
1713        MODIFY_EXPR is free.  */
1714     case INIT_EXPR:
1715     case MODIFY_EXPR:
1716       /* Is the right and side a TARGET_EXPR?  */
1717       if (TREE_CODE (TREE_OPERAND (x, 1)) == TARGET_EXPR)
1718         break;
1719       /* ... fall through ...  */
1720
1721     case TARGET_EXPR:
1722       x = TREE_OPERAND (x, 0);
1723       /* Is this an assignments to a register?  */
1724       if (is_gimple_reg (x))
1725         break;
1726       /* Otherwise it's a store, so fall through to compute the move cost.  */
1727
1728     case CONSTRUCTOR:
1729       *count += estimate_move_cost (TREE_TYPE (x));
1730       break;
1731
1732     /* Assign cost of 1 to usual operations.
1733        ??? We may consider mapping RTL costs to this.  */
1734     case COND_EXPR:
1735     case VEC_COND_EXPR:
1736
1737     case PLUS_EXPR:
1738     case MINUS_EXPR:
1739     case MULT_EXPR:
1740
1741     case FIX_TRUNC_EXPR:
1742     case FIX_CEIL_EXPR:
1743     case FIX_FLOOR_EXPR:
1744     case FIX_ROUND_EXPR:
1745
1746     case NEGATE_EXPR:
1747     case FLOAT_EXPR:
1748     case MIN_EXPR:
1749     case MAX_EXPR:
1750     case ABS_EXPR:
1751
1752     case LSHIFT_EXPR:
1753     case RSHIFT_EXPR:
1754     case LROTATE_EXPR:
1755     case RROTATE_EXPR:
1756     case VEC_LSHIFT_EXPR:
1757     case VEC_RSHIFT_EXPR:
1758
1759     case BIT_IOR_EXPR:
1760     case BIT_XOR_EXPR:
1761     case BIT_AND_EXPR:
1762     case BIT_NOT_EXPR:
1763
1764     case TRUTH_ANDIF_EXPR:
1765     case TRUTH_ORIF_EXPR:
1766     case TRUTH_AND_EXPR:
1767     case TRUTH_OR_EXPR:
1768     case TRUTH_XOR_EXPR:
1769     case TRUTH_NOT_EXPR:
1770
1771     case LT_EXPR:
1772     case LE_EXPR:
1773     case GT_EXPR:
1774     case GE_EXPR:
1775     case EQ_EXPR:
1776     case NE_EXPR:
1777     case ORDERED_EXPR:
1778     case UNORDERED_EXPR:
1779
1780     case UNLT_EXPR:
1781     case UNLE_EXPR:
1782     case UNGT_EXPR:
1783     case UNGE_EXPR:
1784     case UNEQ_EXPR:
1785     case LTGT_EXPR:
1786
1787     case CONVERT_EXPR:
1788
1789     case CONJ_EXPR:
1790
1791     case PREDECREMENT_EXPR:
1792     case PREINCREMENT_EXPR:
1793     case POSTDECREMENT_EXPR:
1794     case POSTINCREMENT_EXPR:
1795
1796     case SWITCH_EXPR:
1797
1798     case ASM_EXPR:
1799
1800     case REALIGN_LOAD_EXPR:
1801
1802     case REDUC_MAX_EXPR:
1803     case REDUC_MIN_EXPR:
1804     case REDUC_PLUS_EXPR:
1805
1806     case RESX_EXPR:
1807       *count += 1;
1808       break;
1809
1810     /* Few special cases of expensive operations.  This is useful
1811        to avoid inlining on functions having too many of these.  */
1812     case TRUNC_DIV_EXPR:
1813     case CEIL_DIV_EXPR:
1814     case FLOOR_DIV_EXPR:
1815     case ROUND_DIV_EXPR:
1816     case EXACT_DIV_EXPR:
1817     case TRUNC_MOD_EXPR:
1818     case CEIL_MOD_EXPR:
1819     case FLOOR_MOD_EXPR:
1820     case ROUND_MOD_EXPR:
1821     case RDIV_EXPR:
1822       *count += 10;
1823       break;
1824     case CALL_EXPR:
1825       {
1826         tree decl = get_callee_fndecl (x);
1827         tree arg;
1828
1829         if (decl && DECL_BUILT_IN_CLASS (decl) == BUILT_IN_NORMAL)
1830           switch (DECL_FUNCTION_CODE (decl))
1831             {
1832             case BUILT_IN_CONSTANT_P:
1833               *walk_subtrees = 0;
1834               return NULL_TREE;
1835             case BUILT_IN_EXPECT:
1836               return NULL_TREE;
1837             default:
1838               break;
1839             }
1840
1841         /* Our cost must be kept in sync with cgraph_estimate_size_after_inlining
1842            that does use function declaration to figure out the arguments.  */
1843         if (!decl)
1844           {
1845             for (arg = TREE_OPERAND (x, 1); arg; arg = TREE_CHAIN (arg))
1846               *count += estimate_move_cost (TREE_TYPE (TREE_VALUE (arg)));
1847           }
1848         else
1849           {
1850             for (arg = DECL_ARGUMENTS (decl); arg; arg = TREE_CHAIN (arg))
1851               *count += estimate_move_cost (TREE_TYPE (arg));
1852           }
1853
1854         *count += PARAM_VALUE (PARAM_INLINE_CALL_COST);
1855         break;
1856       }
1857     default:
1858       gcc_unreachable ();
1859     }
1860   return NULL;
1861 }
1862
1863 /* Estimate number of instructions that will be created by expanding EXPR.  */
1864
1865 int
1866 estimate_num_insns (tree expr)
1867 {
1868   int num = 0;
1869   struct pointer_set_t *visited_nodes;
1870   basic_block bb;
1871   block_stmt_iterator bsi;
1872   struct function *my_function;
1873
1874   /* If we're given an entire function, walk the CFG.  */
1875   if (TREE_CODE (expr) == FUNCTION_DECL)
1876     {
1877       my_function = DECL_STRUCT_FUNCTION (expr);
1878       gcc_assert (my_function && my_function->cfg);
1879       visited_nodes = pointer_set_create ();
1880       FOR_EACH_BB_FN (bb, my_function)
1881         {
1882           for (bsi = bsi_start (bb);
1883                !bsi_end_p (bsi);
1884                bsi_next (&bsi))
1885             {
1886               walk_tree (bsi_stmt_ptr (bsi), estimate_num_insns_1,
1887                          &num, visited_nodes);
1888             }
1889         }
1890       pointer_set_destroy (visited_nodes);
1891     }
1892   else
1893     walk_tree_without_duplicates (&expr, estimate_num_insns_1, &num);
1894
1895   return num;
1896 }
1897
1898 typedef struct function *function_p;
1899
1900 DEF_VEC_P(function_p);
1901 DEF_VEC_ALLOC_P(function_p,heap);
1902
1903 /* Initialized with NOGC, making this poisonous to the garbage collector.  */
1904 static VEC(function_p,heap) *cfun_stack;
1905
1906 void
1907 push_cfun (struct function *new_cfun)
1908 {
1909   VEC_safe_push (function_p, heap, cfun_stack, cfun);
1910   cfun = new_cfun;
1911 }
1912
1913 void
1914 pop_cfun (void)
1915 {
1916   cfun = VEC_pop (function_p, cfun_stack);
1917 }
1918
1919 /* Install new lexical TREE_BLOCK underneath 'current_block'.  */
1920 static void
1921 add_lexical_block (tree current_block, tree new_block)
1922 {
1923   tree *blk_p;
1924
1925   /* Walk to the last sub-block.  */
1926   for (blk_p = &BLOCK_SUBBLOCKS (current_block);
1927        *blk_p;
1928        blk_p = &TREE_CHAIN (*blk_p))
1929     ;
1930   *blk_p = new_block;
1931   BLOCK_SUPERCONTEXT (new_block) = current_block;
1932 }
1933
1934 /* If *TP is a CALL_EXPR, replace it with its inline expansion.  */
1935
1936 static bool
1937 expand_call_inline (basic_block bb, tree stmt, tree *tp, void *data)
1938 {
1939   inline_data *id;
1940   tree t;
1941   tree use_retvar;
1942   tree fn;
1943   splay_tree st;
1944   tree args;
1945   tree return_slot_addr;
1946   tree modify_dest;
1947   location_t saved_location;
1948   struct cgraph_edge *cg_edge;
1949   const char *reason;
1950   basic_block return_block;
1951   edge e;
1952   block_stmt_iterator bsi, stmt_bsi;
1953   bool successfully_inlined = FALSE;
1954   tree t_step;
1955   tree var;
1956   struct cgraph_node *old_node;
1957   tree decl;
1958
1959   /* See what we've got.  */
1960   id = (inline_data *) data;
1961   t = *tp;
1962
1963   /* Set input_location here so we get the right instantiation context
1964      if we call instantiate_decl from inlinable_function_p.  */
1965   saved_location = input_location;
1966   if (EXPR_HAS_LOCATION (t))
1967     input_location = EXPR_LOCATION (t);
1968
1969   /* From here on, we're only interested in CALL_EXPRs.  */
1970   if (TREE_CODE (t) != CALL_EXPR)
1971     goto egress;
1972
1973   /* First, see if we can figure out what function is being called.
1974      If we cannot, then there is no hope of inlining the function.  */
1975   fn = get_callee_fndecl (t);
1976   if (!fn)
1977     goto egress;
1978
1979   /* Turn forward declarations into real ones.  */
1980   fn = cgraph_node (fn)->decl;
1981
1982   /* If fn is a declaration of a function in a nested scope that was
1983      globally declared inline, we don't set its DECL_INITIAL.
1984      However, we can't blindly follow DECL_ABSTRACT_ORIGIN because the
1985      C++ front-end uses it for cdtors to refer to their internal
1986      declarations, that are not real functions.  Fortunately those
1987      don't have trees to be saved, so we can tell by checking their
1988      DECL_SAVED_TREE.  */
1989   if (! DECL_INITIAL (fn)
1990       && DECL_ABSTRACT_ORIGIN (fn)
1991       && DECL_SAVED_TREE (DECL_ABSTRACT_ORIGIN (fn)))
1992     fn = DECL_ABSTRACT_ORIGIN (fn);
1993
1994   /* Objective C and fortran still calls tree_rest_of_compilation directly.
1995      Kill this check once this is fixed.  */
1996   if (!id->current_node->analyzed)
1997     goto egress;
1998
1999   cg_edge = cgraph_edge (id->current_node, stmt);
2000
2001   /* Constant propagation on argument done during previous inlining
2002      may create new direct call.  Produce an edge for it.  */
2003   if (!cg_edge)
2004     {
2005       struct cgraph_node *dest = cgraph_node (fn);
2006
2007       /* We have missing edge in the callgraph.  This can happen in one case
2008          where previous inlining turned indirect call into direct call by
2009          constant propagating arguments.  In all other cases we hit a bug
2010          (incorrect node sharing is most common reason for missing edges.  */
2011       gcc_assert (dest->needed || !flag_unit_at_a_time);
2012       cgraph_create_edge (id->node, dest, stmt,
2013                           bb->count, bb->loop_depth)->inline_failed
2014         = N_("originally indirect function call not considered for inlining");
2015       goto egress;
2016     }
2017
2018   /* Don't try to inline functions that are not well-suited to
2019      inlining.  */
2020   if (!cgraph_inline_p (cg_edge, &reason))
2021     {
2022       if (lookup_attribute ("always_inline", DECL_ATTRIBUTES (fn))
2023           /* Avoid warnings during early inline pass. */
2024           && (!flag_unit_at_a_time || cgraph_global_info_ready))
2025         {
2026           sorry ("inlining failed in call to %q+F: %s", fn, reason);
2027           sorry ("called from here");
2028         }
2029       else if (warn_inline && DECL_DECLARED_INLINE_P (fn)
2030                && !DECL_IN_SYSTEM_HEADER (fn)
2031                && strlen (reason)
2032                && !lookup_attribute ("noinline", DECL_ATTRIBUTES (fn))
2033                /* Avoid warnings during early inline pass. */
2034                && (!flag_unit_at_a_time || cgraph_global_info_ready))
2035         {
2036           warning (OPT_Winline, "inlining failed in call to %q+F: %s",
2037                    fn, reason);
2038           warning (OPT_Winline, "called from here");
2039         }
2040       goto egress;
2041     }
2042
2043 #ifdef ENABLE_CHECKING
2044   if (cg_edge->callee->decl != id->node->decl)
2045     verify_cgraph_node (cg_edge->callee);
2046 #endif
2047
2048   /* We will be inlining this callee.  */
2049
2050   id->eh_region = lookup_stmt_eh_region (stmt);
2051
2052   /* Split the block holding the CALL_EXPR.  */
2053
2054   e = split_block (bb, stmt);
2055   bb = e->src;
2056   return_block = e->dest;
2057   remove_edge (e);
2058
2059   /* split_block splits before the statement, work around this by moving
2060      the call into the first half_bb.  Not pretty, but seems easier than
2061      doing the CFG manipulation by hand when the CALL_EXPR is in the last
2062      statement in BB.  */
2063   stmt_bsi = bsi_last (bb);
2064   bsi = bsi_start (return_block);
2065   if (!bsi_end_p (bsi))
2066     bsi_move_before (&stmt_bsi, &bsi);
2067   else
2068     {
2069       tree stmt = bsi_stmt (stmt_bsi);
2070       bsi_remove (&stmt_bsi);
2071       bsi_insert_after (&bsi, stmt, BSI_NEW_STMT);
2072     }
2073   stmt_bsi = bsi_start (return_block);
2074
2075   /* Build a block containing code to initialize the arguments, the
2076      actual inline expansion of the body, and a label for the return
2077      statements within the function to jump to.  The type of the
2078      statement expression is the return type of the function call.  */
2079   id->block = make_node (BLOCK);
2080   BLOCK_ABSTRACT_ORIGIN (id->block) = fn;
2081   BLOCK_SOURCE_LOCATION (id->block) = input_location;
2082   add_lexical_block (TREE_BLOCK (stmt), id->block);
2083
2084   /* Local declarations will be replaced by their equivalents in this
2085      map.  */
2086   st = id->decl_map;
2087   id->decl_map = splay_tree_new (splay_tree_compare_pointers,
2088                                  NULL, NULL);
2089
2090   /* Initialize the parameters.  */
2091   args = TREE_OPERAND (t, 1);
2092
2093   initialize_inlined_parameters (id, args, TREE_OPERAND (t, 2), fn, bb);
2094
2095   /* Record the function we are about to inline.  */
2096   id->callee = fn;
2097
2098   if (DECL_STRUCT_FUNCTION (fn)->saved_blocks)
2099     add_lexical_block (id->block, remap_blocks (DECL_STRUCT_FUNCTION (fn)->saved_blocks, id));
2100   else if (DECL_INITIAL (fn))
2101     add_lexical_block (id->block, remap_blocks (DECL_INITIAL (fn), id));
2102
2103   /* Return statements in the function body will be replaced by jumps
2104      to the RET_LABEL.  */
2105
2106   gcc_assert (DECL_INITIAL (fn));
2107   gcc_assert (TREE_CODE (DECL_INITIAL (fn)) == BLOCK);
2108
2109   /* Find the lhs to which the result of this call is assigned.  */
2110   return_slot_addr = NULL;
2111   if (TREE_CODE (stmt) == MODIFY_EXPR)
2112     {
2113       modify_dest = TREE_OPERAND (stmt, 0);
2114
2115       /* The function which we are inlining might not return a value,
2116          in which case we should issue a warning that the function
2117          does not return a value.  In that case the optimizers will
2118          see that the variable to which the value is assigned was not
2119          initialized.  We do not want to issue a warning about that
2120          uninitialized variable.  */
2121       if (DECL_P (modify_dest))
2122         TREE_NO_WARNING (modify_dest) = 1;
2123       if (CALL_EXPR_RETURN_SLOT_OPT (t))
2124         {
2125           return_slot_addr = build_fold_addr_expr (modify_dest);
2126           modify_dest = NULL;
2127         }
2128     }
2129   else
2130     modify_dest = NULL;
2131
2132   /* Declare the return variable for the function.  */
2133   decl = declare_return_variable (id, return_slot_addr,
2134                                   modify_dest, &use_retvar);
2135   /* Do this only if declare_return_variable created a new one.  */
2136   if (decl && !return_slot_addr && decl != modify_dest)
2137     declare_inline_vars (id->block, decl);
2138
2139   /* After we've initialized the parameters, we insert the body of the
2140      function itself.  */
2141   old_node = id->current_node;
2142
2143   /* Anoint the callee-to-be-duplicated as the "current_node."  When
2144      CALL_EXPRs within callee are duplicated, the edges from callee to
2145      callee's callees (caller's grandchildren) will be cloned.  */
2146   id->current_node = cg_edge->callee;
2147
2148   /* This is it.  Duplicate the callee body.  Assume callee is
2149      pre-gimplified.  Note that we must not alter the caller
2150      function in any way before this point, as this CALL_EXPR may be
2151      a self-referential call; if we're calling ourselves, we need to
2152      duplicate our body before altering anything.  */
2153   copy_body (id, bb->count, bb->frequency, bb, return_block);
2154   id->current_node = old_node;
2155
2156   /* Add local vars in this inlined callee to caller.  */
2157   t_step = id->callee_cfun->unexpanded_var_list;
2158   if (id->callee_cfun->saved_unexpanded_var_list)
2159     t_step = id->callee_cfun->saved_unexpanded_var_list;
2160   for (; t_step; t_step = TREE_CHAIN (t_step))
2161     {
2162       var = TREE_VALUE (t_step);
2163       if (TREE_STATIC (var) && !TREE_ASM_WRITTEN (var))
2164         cfun->unexpanded_var_list = tree_cons (NULL_TREE, var,
2165                                                cfun->unexpanded_var_list);
2166       else
2167         cfun->unexpanded_var_list = tree_cons (NULL_TREE, remap_decl (var, id),
2168                                                cfun->unexpanded_var_list);
2169     }
2170
2171   /* Clean up.  */
2172   splay_tree_delete (id->decl_map);
2173   id->decl_map = st;
2174
2175   /* If the inlined function returns a result that we care about,
2176      clobber the CALL_EXPR with a reference to the return variable.  */
2177   if (use_retvar && (TREE_CODE (bsi_stmt (stmt_bsi)) != CALL_EXPR))
2178     {
2179       *tp = use_retvar;
2180       maybe_clean_or_replace_eh_stmt (stmt, stmt);
2181     }
2182   else
2183     /* We're modifying a TSI owned by gimple_expand_calls_inline();
2184        tsi_delink() will leave the iterator in a sane state.  */
2185     bsi_remove (&stmt_bsi);
2186
2187   bsi_next (&bsi);
2188   if (bsi_end_p (bsi))
2189     tree_purge_dead_eh_edges (return_block);
2190
2191   /* If the value of the new expression is ignored, that's OK.  We
2192      don't warn about this for CALL_EXPRs, so we shouldn't warn about
2193      the equivalent inlined version either.  */
2194   TREE_USED (*tp) = 1;
2195
2196   /* Output the inlining info for this abstract function, since it has been
2197      inlined.  If we don't do this now, we can lose the information about the
2198      variables in the function when the blocks get blown away as soon as we
2199      remove the cgraph node.  */
2200   (*debug_hooks->outlining_inline_function) (cg_edge->callee->decl);
2201
2202   /* Update callgraph if needed.  */
2203   cgraph_remove_node (cg_edge->callee);
2204
2205   /* Declare the 'auto' variables added with this inlined body.  */
2206   record_vars (BLOCK_VARS (id->block));
2207   id->block = NULL_TREE;
2208   successfully_inlined = TRUE;
2209
2210  egress:
2211   input_location = saved_location;
2212   return successfully_inlined;
2213 }
2214
2215 /* Expand call statements reachable from STMT_P.
2216    We can only have CALL_EXPRs as the "toplevel" tree code or nested
2217    in a MODIFY_EXPR.  See tree-gimple.c:get_call_expr_in().  We can
2218    unfortunately not use that function here because we need a pointer
2219    to the CALL_EXPR, not the tree itself.  */
2220
2221 static bool
2222 gimple_expand_calls_inline (basic_block bb, inline_data *id)
2223 {
2224   block_stmt_iterator bsi;
2225
2226   /* Register specific tree functions.  */
2227   tree_register_cfg_hooks ();
2228   for (bsi = bsi_start (bb); !bsi_end_p (bsi); bsi_next (&bsi))
2229     {
2230       tree *expr_p = bsi_stmt_ptr (bsi);
2231       tree stmt = *expr_p;
2232
2233       if (TREE_CODE (*expr_p) == MODIFY_EXPR)
2234         expr_p = &TREE_OPERAND (*expr_p, 1);
2235       if (TREE_CODE (*expr_p) == WITH_SIZE_EXPR)
2236         expr_p = &TREE_OPERAND (*expr_p, 0);
2237       if (TREE_CODE (*expr_p) == CALL_EXPR)
2238         if (expand_call_inline (bb, stmt, expr_p, id))
2239           return true;
2240     }
2241   return false;
2242 }
2243
2244 /* Expand calls to inline functions in the body of FN.  */
2245
2246 void
2247 optimize_inline_calls (tree fn)
2248 {
2249   inline_data id;
2250   tree prev_fn;
2251   basic_block bb;
2252   /* There is no point in performing inlining if errors have already
2253      occurred -- and we might crash if we try to inline invalid
2254      code.  */
2255   if (errorcount || sorrycount)
2256     return;
2257
2258   /* Clear out ID.  */
2259   memset (&id, 0, sizeof (id));
2260
2261   id.current_node = id.node = cgraph_node (fn);
2262   id.caller = fn;
2263   /* Or any functions that aren't finished yet.  */
2264   prev_fn = NULL_TREE;
2265   if (current_function_decl)
2266     {
2267       id.caller = current_function_decl;
2268       prev_fn = current_function_decl;
2269     }
2270   push_gimplify_context ();
2271
2272   /* Reach the trees by walking over the CFG, and note the
2273      enclosing basic-blocks in the call edges.  */
2274   /* We walk the blocks going forward, because inlined function bodies
2275      will split id->current_basic_block, and the new blocks will
2276      follow it; we'll trudge through them, processing their CALL_EXPRs
2277      along the way.  */
2278   FOR_EACH_BB (bb)
2279     gimple_expand_calls_inline (bb, &id);
2280
2281
2282   pop_gimplify_context (NULL);
2283   /* Renumber the (code) basic_blocks consecutively.  */
2284   compact_blocks ();
2285   /* Renumber the lexical scoping (non-code) blocks consecutively.  */
2286   number_blocks (fn);
2287
2288 #ifdef ENABLE_CHECKING
2289     {
2290       struct cgraph_edge *e;
2291
2292       verify_cgraph_node (id.node);
2293
2294       /* Double check that we inlined everything we are supposed to inline.  */
2295       for (e = id.node->callees; e; e = e->next_callee)
2296         gcc_assert (e->inline_failed);
2297     }
2298 #endif
2299   /* We need to rescale frequencies again to peak at REG_BR_PROB_BASE
2300      as inlining loops might increase the maximum.  */
2301   if (ENTRY_BLOCK_PTR->count)
2302     counts_to_freqs ();
2303   fold_cond_expr_cond ();
2304 }
2305
2306 /* FN is a function that has a complete body, and CLONE is a function whose
2307    body is to be set to a copy of FN, mapping argument declarations according
2308    to the ARG_MAP splay_tree.  */
2309
2310 void
2311 clone_body (tree clone, tree fn, void *arg_map)
2312 {
2313   inline_data id;
2314
2315   /* Clone the body, as if we were making an inline call.  But, remap the
2316      parameters in the callee to the parameters of caller.  */
2317   memset (&id, 0, sizeof (id));
2318   id.caller = clone;
2319   id.callee = fn;
2320   id.callee_cfun = DECL_STRUCT_FUNCTION (fn);
2321   id.decl_map = (splay_tree)arg_map;
2322
2323   /* Cloning is treated slightly differently from inlining.  Set
2324      CLONING_P so that it's clear which operation we're performing.  */
2325   id.cloning_p = true;
2326
2327   /* We're not inside any EH region.  */
2328   id.eh_region = -1;
2329
2330   /* Actually copy the body.  */
2331   append_to_statement_list_force (copy_generic_body (&id), &DECL_SAVED_TREE (clone));
2332 }
2333
2334 /* Save duplicate body in FN.  MAP is used to pass around splay tree
2335    used to update arguments in restore_body.  */
2336
2337 /* Make and return duplicate of body in FN.  Put copies of DECL_ARGUMENTS
2338    in *arg_copy and of the static chain, if any, in *sc_copy.  */
2339
2340 void
2341 save_body (tree fn, tree *arg_copy, tree *sc_copy)
2342 {
2343   inline_data id;
2344   tree newdecl, *parg;
2345   basic_block fn_entry_block;
2346   tree t_step;
2347
2348   memset (&id, 0, sizeof (id));
2349   id.callee = fn;
2350   id.callee_cfun = DECL_STRUCT_FUNCTION (fn);
2351   id.caller = fn;
2352   id.node = cgraph_node (fn);
2353   id.saving_p = true;
2354   id.decl_map = splay_tree_new (splay_tree_compare_pointers, NULL, NULL);
2355   *arg_copy = DECL_ARGUMENTS (fn);
2356
2357   for (parg = arg_copy; *parg; parg = &TREE_CHAIN (*parg))
2358     {
2359       tree new = copy_node (*parg);
2360
2361       lang_hooks.dup_lang_specific_decl (new);
2362       DECL_ABSTRACT_ORIGIN (new) = DECL_ORIGIN (*parg);
2363       insert_decl_map (&id, *parg, new);
2364       TREE_CHAIN (new) = TREE_CHAIN (*parg);
2365       *parg = new;
2366     }
2367
2368   *sc_copy = DECL_STRUCT_FUNCTION (fn)->static_chain_decl;
2369   if (*sc_copy)
2370     {
2371       tree new = copy_node (*sc_copy);
2372
2373       lang_hooks.dup_lang_specific_decl (new);
2374       DECL_ABSTRACT_ORIGIN (new) = DECL_ORIGIN (*sc_copy);
2375       insert_decl_map (&id, *sc_copy, new);
2376       TREE_CHAIN (new) = TREE_CHAIN (*sc_copy);
2377       *sc_copy = new;
2378     }
2379
2380   /* We're not inside any EH region.  */
2381   id.eh_region = -1;
2382
2383   insert_decl_map (&id, DECL_RESULT (fn), DECL_RESULT (fn));
2384
2385   DECL_STRUCT_FUNCTION (fn)->saved_blocks
2386     = remap_blocks (DECL_INITIAL (fn), &id);
2387   for (t_step = id.callee_cfun->unexpanded_var_list;
2388        t_step;
2389        t_step = TREE_CHAIN (t_step))
2390     {
2391       tree var = TREE_VALUE (t_step);
2392       if (TREE_STATIC (var) && !TREE_ASM_WRITTEN (var))
2393         cfun->saved_unexpanded_var_list
2394           = tree_cons (NULL_TREE, var, cfun->saved_unexpanded_var_list);
2395       else 
2396         cfun->saved_unexpanded_var_list
2397           = tree_cons (NULL_TREE, remap_decl (var, &id),
2398                        cfun->saved_unexpanded_var_list);
2399     }
2400
2401   /* Actually copy the body, including a new (struct function *) and CFG.
2402      EH info is also duplicated so its labels point into the copied
2403      CFG, not the original.  */
2404   fn_entry_block = ENTRY_BLOCK_PTR_FOR_FUNCTION (DECL_STRUCT_FUNCTION (fn));
2405   newdecl = copy_body (&id, fn_entry_block->count, fn_entry_block->frequency,
2406                        NULL, NULL);
2407   DECL_STRUCT_FUNCTION (fn)->saved_cfg = DECL_STRUCT_FUNCTION (newdecl)->cfg;
2408   DECL_STRUCT_FUNCTION (fn)->saved_eh = DECL_STRUCT_FUNCTION (newdecl)->eh;
2409
2410   /* Clean up.  */
2411   splay_tree_delete (id.decl_map);
2412 }
2413
2414 /* Passed to walk_tree.  Copies the node pointed to, if appropriate.  */
2415
2416 tree
2417 copy_tree_r (tree *tp, int *walk_subtrees, void *data ATTRIBUTE_UNUSED)
2418 {
2419   enum tree_code code = TREE_CODE (*tp);
2420   inline_data *id = (inline_data *) data;
2421
2422   /* We make copies of most nodes.  */
2423   if (IS_EXPR_CODE_CLASS (TREE_CODE_CLASS (code))
2424       || code == TREE_LIST
2425       || code == TREE_VEC
2426       || code == TYPE_DECL)
2427     {
2428       /* Because the chain gets clobbered when we make a copy, we save it
2429          here.  */
2430       tree chain = TREE_CHAIN (*tp);
2431       tree new;
2432
2433       if (id && id->versioning_p && replace_ref_tree (id, tp))
2434         {
2435           *walk_subtrees = 0;
2436           return NULL_TREE;
2437         }
2438       /* Copy the node.  */
2439       new = copy_node (*tp);
2440
2441       /* Propagate mudflap marked-ness.  */
2442       if (flag_mudflap && mf_marked_p (*tp))
2443         mf_mark (new);
2444
2445       *tp = new;
2446
2447       /* Now, restore the chain, if appropriate.  That will cause
2448          walk_tree to walk into the chain as well.  */
2449       if (code == PARM_DECL || code == TREE_LIST)
2450         TREE_CHAIN (*tp) = chain;
2451
2452       /* For now, we don't update BLOCKs when we make copies.  So, we
2453          have to nullify all BIND_EXPRs.  */
2454       if (TREE_CODE (*tp) == BIND_EXPR)
2455         BIND_EXPR_BLOCK (*tp) = NULL_TREE;
2456     }
2457   else if (code == CONSTRUCTOR)
2458     {
2459       /* CONSTRUCTOR nodes need special handling because
2460          we need to duplicate the vector of elements.  */
2461       tree new;
2462
2463       new = copy_node (*tp);
2464
2465       /* Propagate mudflap marked-ness.  */
2466       if (flag_mudflap && mf_marked_p (*tp))
2467         mf_mark (new);
2468
2469       CONSTRUCTOR_ELTS (new) = VEC_copy (constructor_elt, gc,
2470                                          CONSTRUCTOR_ELTS (*tp));
2471       *tp = new;
2472     }
2473   else if (TREE_CODE_CLASS (code) == tcc_type)
2474     *walk_subtrees = 0;
2475   else if (TREE_CODE_CLASS (code) == tcc_declaration)
2476     *walk_subtrees = 0;
2477   else if (TREE_CODE_CLASS (code) == tcc_constant)
2478     *walk_subtrees = 0;
2479   else
2480     gcc_assert (code != STATEMENT_LIST);
2481   return NULL_TREE;
2482 }
2483
2484 /* The SAVE_EXPR pointed to by TP is being copied.  If ST contains
2485    information indicating to what new SAVE_EXPR this one should be mapped,
2486    use that one.  Otherwise, create a new node and enter it in ST.  FN is
2487    the function into which the copy will be placed.  */
2488
2489 static void
2490 remap_save_expr (tree *tp, void *st_, int *walk_subtrees)
2491 {
2492   splay_tree st = (splay_tree) st_;
2493   splay_tree_node n;
2494   tree t;
2495
2496   /* See if we already encountered this SAVE_EXPR.  */
2497   n = splay_tree_lookup (st, (splay_tree_key) *tp);
2498
2499   /* If we didn't already remap this SAVE_EXPR, do so now.  */
2500   if (!n)
2501     {
2502       t = copy_node (*tp);
2503
2504       /* Remember this SAVE_EXPR.  */
2505       splay_tree_insert (st, (splay_tree_key) *tp, (splay_tree_value) t);
2506       /* Make sure we don't remap an already-remapped SAVE_EXPR.  */
2507       splay_tree_insert (st, (splay_tree_key) t, (splay_tree_value) t);
2508     }
2509   else
2510     {
2511       /* We've already walked into this SAVE_EXPR; don't do it again.  */
2512       *walk_subtrees = 0;
2513       t = (tree) n->value;
2514     }
2515
2516   /* Replace this SAVE_EXPR with the copy.  */
2517   *tp = t;
2518 }
2519
2520 /* Called via walk_tree.  If *TP points to a DECL_STMT for a local label,
2521    copies the declaration and enters it in the splay_tree in DATA (which is
2522    really an `inline_data *').  */
2523
2524 static tree
2525 mark_local_for_remap_r (tree *tp, int *walk_subtrees ATTRIBUTE_UNUSED,
2526                         void *data)
2527 {
2528   inline_data *id = (inline_data *) data;
2529
2530   /* Don't walk into types.  */
2531   if (TYPE_P (*tp))
2532     *walk_subtrees = 0;
2533
2534   else if (TREE_CODE (*tp) == LABEL_EXPR)
2535     {
2536       tree decl = TREE_OPERAND (*tp, 0);
2537
2538       /* Copy the decl and remember the copy.  */
2539       insert_decl_map (id, decl,
2540                        copy_decl_for_dup (decl, DECL_CONTEXT (decl),
2541                                           DECL_CONTEXT (decl),  /*versioning=*/false));
2542     }
2543
2544   return NULL_TREE;
2545 }
2546
2547 /* Perform any modifications to EXPR required when it is unsaved.  Does
2548    not recurse into EXPR's subtrees.  */
2549
2550 static void
2551 unsave_expr_1 (tree expr)
2552 {
2553   switch (TREE_CODE (expr))
2554     {
2555     case TARGET_EXPR:
2556       /* Don't mess with a TARGET_EXPR that hasn't been expanded.
2557          It's OK for this to happen if it was part of a subtree that
2558          isn't immediately expanded, such as operand 2 of another
2559          TARGET_EXPR.  */
2560       if (TREE_OPERAND (expr, 1))
2561         break;
2562
2563       TREE_OPERAND (expr, 1) = TREE_OPERAND (expr, 3);
2564       TREE_OPERAND (expr, 3) = NULL_TREE;
2565       break;
2566
2567     default:
2568       break;
2569     }
2570 }
2571
2572 /* Called via walk_tree when an expression is unsaved.  Using the
2573    splay_tree pointed to by ST (which is really a `splay_tree'),
2574    remaps all local declarations to appropriate replacements.  */
2575
2576 static tree
2577 unsave_r (tree *tp, int *walk_subtrees, void *data)
2578 {
2579   inline_data *id = (inline_data *) data;
2580   splay_tree st = id->decl_map;
2581   splay_tree_node n;
2582
2583   /* Only a local declaration (variable or label).  */
2584   if ((TREE_CODE (*tp) == VAR_DECL && !TREE_STATIC (*tp))
2585       || TREE_CODE (*tp) == LABEL_DECL)
2586     {
2587       /* Lookup the declaration.  */
2588       n = splay_tree_lookup (st, (splay_tree_key) *tp);
2589
2590       /* If it's there, remap it.  */
2591       if (n)
2592         *tp = (tree) n->value;
2593     }
2594
2595   else if (TREE_CODE (*tp) == STATEMENT_LIST)
2596     copy_statement_list (tp);
2597   else if (TREE_CODE (*tp) == BIND_EXPR)
2598     copy_bind_expr (tp, walk_subtrees, id);
2599   else if (TREE_CODE (*tp) == SAVE_EXPR)
2600     remap_save_expr (tp, st, walk_subtrees);
2601   else
2602     {
2603       copy_tree_r (tp, walk_subtrees, NULL);
2604
2605       /* Do whatever unsaving is required.  */
2606       unsave_expr_1 (*tp);
2607     }
2608
2609   /* Keep iterating.  */
2610   return NULL_TREE;
2611 }
2612
2613 /* Copies everything in EXPR and replaces variables, labels
2614    and SAVE_EXPRs local to EXPR.  */
2615
2616 tree
2617 unsave_expr_now (tree expr)
2618 {
2619   inline_data id;
2620
2621   /* There's nothing to do for NULL_TREE.  */
2622   if (expr == 0)
2623     return expr;
2624
2625   /* Set up ID.  */
2626   memset (&id, 0, sizeof (id));
2627   id.callee = current_function_decl;
2628   id.caller = current_function_decl;
2629   id.decl_map = splay_tree_new (splay_tree_compare_pointers, NULL, NULL);
2630
2631   /* Walk the tree once to find local labels.  */
2632   walk_tree_without_duplicates (&expr, mark_local_for_remap_r, &id);
2633
2634   /* Walk the tree again, copying, remapping, and unsaving.  */
2635   walk_tree (&expr, unsave_r, &id, NULL);
2636
2637   /* Clean up.  */
2638   splay_tree_delete (id.decl_map);
2639
2640   return expr;
2641 }
2642
2643 /* Allow someone to determine if SEARCH is a child of TOP from gdb.  */
2644
2645 static tree
2646 debug_find_tree_1 (tree *tp, int *walk_subtrees ATTRIBUTE_UNUSED, void *data)
2647 {
2648   if (*tp == data)
2649     return (tree) data;
2650   else
2651     return NULL;
2652 }
2653
2654 bool
2655 debug_find_tree (tree top, tree search)
2656 {
2657   return walk_tree_without_duplicates (&top, debug_find_tree_1, search) != 0;
2658 }
2659
2660
2661 /* Declare the variables created by the inliner.  Add all the variables in
2662    VARS to BIND_EXPR.  */
2663
2664 static void
2665 declare_inline_vars (tree block, tree vars)
2666 {
2667   tree t;
2668   for (t = vars; t; t = TREE_CHAIN (t))
2669     DECL_SEEN_IN_BIND_EXPR_P (t) = 1;
2670
2671   if (block)
2672     BLOCK_VARS (block) = chainon (BLOCK_VARS (block), vars);
2673 }
2674
2675
2676 /* Copy NODE (which must be a DECL).  The DECL originally was in the FROM_FN,
2677    but now it will be in the TO_FN.  VERSIONING means that this function 
2678    is used by the versioning utility (not inlining or cloning).  */
2679
2680 tree
2681 copy_decl_for_dup (tree decl, tree from_fn, tree to_fn, bool versioning)
2682 {
2683   tree copy;
2684
2685   gcc_assert (DECL_P (decl));
2686   /* Copy the declaration.  */
2687   if (!versioning
2688       && (TREE_CODE (decl) == PARM_DECL
2689           || TREE_CODE (decl) == RESULT_DECL))
2690     {
2691       tree type = TREE_TYPE (decl);
2692
2693       /* For a parameter or result, we must make an equivalent VAR_DECL,
2694          not a new PARM_DECL.  */
2695       copy = build_decl (VAR_DECL, DECL_NAME (decl), type);
2696       TREE_ADDRESSABLE (copy) = TREE_ADDRESSABLE (decl);
2697       TREE_READONLY (copy) = TREE_READONLY (decl);
2698       TREE_THIS_VOLATILE (copy) = TREE_THIS_VOLATILE (decl);
2699       DECL_COMPLEX_GIMPLE_REG_P (copy) = DECL_COMPLEX_GIMPLE_REG_P (decl);
2700     }
2701   else
2702     {
2703       copy = copy_node (decl);
2704       /* The COPY is not abstract; it will be generated in TO_FN.  */
2705       DECL_ABSTRACT (copy) = 0;
2706       lang_hooks.dup_lang_specific_decl (copy);
2707
2708       /* TREE_ADDRESSABLE isn't used to indicate that a label's
2709          address has been taken; it's for internal bookkeeping in
2710          expand_goto_internal.  */
2711       if (TREE_CODE (copy) == LABEL_DECL)
2712         {
2713           TREE_ADDRESSABLE (copy) = 0;
2714           LABEL_DECL_UID (copy) = -1;
2715         }
2716     }
2717
2718   /* Don't generate debug information for the copy if we wouldn't have
2719      generated it for the copy either.  */
2720   DECL_ARTIFICIAL (copy) = DECL_ARTIFICIAL (decl);
2721   DECL_IGNORED_P (copy) = DECL_IGNORED_P (decl);
2722
2723   /* Set the DECL_ABSTRACT_ORIGIN so the debugging routines know what
2724      declaration inspired this copy.  */ 
2725   DECL_ABSTRACT_ORIGIN (copy) = DECL_ORIGIN (decl);
2726
2727   /* The new variable/label has no RTL, yet.  */
2728   if (CODE_CONTAINS_STRUCT (TREE_CODE (copy), TS_DECL_WRTL)
2729       && !TREE_STATIC (copy) && !DECL_EXTERNAL (copy))
2730     SET_DECL_RTL (copy, NULL_RTX);
2731   
2732   /* These args would always appear unused, if not for this.  */
2733   TREE_USED (copy) = 1;
2734
2735   /* Set the context for the new declaration.  */
2736   if (!DECL_CONTEXT (decl))
2737     /* Globals stay global.  */
2738     ;
2739   else if (DECL_CONTEXT (decl) != from_fn)
2740     /* Things that weren't in the scope of the function we're inlining
2741        from aren't in the scope we're inlining to, either.  */
2742     ;
2743   else if (TREE_STATIC (decl))
2744     /* Function-scoped static variables should stay in the original
2745        function.  */
2746     ;
2747   else
2748     /* Ordinary automatic local variables are now in the scope of the
2749        new function.  */
2750     DECL_CONTEXT (copy) = to_fn;
2751
2752   return copy;
2753 }
2754
2755 /* Return a copy of the function's argument tree.  */
2756 static tree
2757 copy_arguments_for_versioning (tree orig_parm, inline_data * id)
2758 {
2759   tree *arg_copy, *parg;
2760
2761   arg_copy = &orig_parm;
2762   for (parg = arg_copy; *parg; parg = &TREE_CHAIN (*parg))
2763     {
2764       tree new = remap_decl (*parg, id);
2765       lang_hooks.dup_lang_specific_decl (new);
2766       TREE_CHAIN (new) = TREE_CHAIN (*parg);
2767       *parg = new;
2768     }
2769   return orig_parm;
2770 }
2771
2772 /* Return a copy of the function's static chain.  */
2773 static tree
2774 copy_static_chain (tree static_chain, inline_data * id)
2775 {
2776   tree *chain_copy, *pvar;
2777
2778   chain_copy = &static_chain;
2779   for (pvar = chain_copy; *pvar; pvar = &TREE_CHAIN (*pvar))
2780     {
2781       tree new = remap_decl (*pvar, id);
2782       lang_hooks.dup_lang_specific_decl (new);
2783       TREE_CHAIN (new) = TREE_CHAIN (*pvar);
2784       *pvar = new;
2785     }
2786   return static_chain;
2787 }
2788
2789 /* Return true if the function is allowed to be versioned.
2790    This is a guard for the versioning functionality.  */
2791 bool
2792 tree_versionable_function_p (tree fndecl)
2793 {
2794   if (fndecl == NULL_TREE)
2795     return false;
2796   /* ??? There are cases where a function is
2797      uninlinable but can be versioned.  */
2798   if (!tree_inlinable_function_p (fndecl))
2799     return false;
2800   
2801   return true;
2802 }
2803
2804 /* Create a copy of a function's tree.
2805    OLD_DECL and NEW_DECL are FUNCTION_DECL tree nodes
2806    of the original function and the new copied function
2807    respectively.  In case we want to replace a DECL 
2808    tree with another tree while duplicating the function's 
2809    body, TREE_MAP represents the mapping between these 
2810    trees.  */
2811 void
2812 tree_function_versioning (tree old_decl, tree new_decl, varray_type tree_map)
2813 {
2814   struct cgraph_node *old_version_node;
2815   struct cgraph_node *new_version_node;
2816   inline_data id;
2817   tree p, new_fndecl;
2818   unsigned i;
2819   struct ipa_replace_map *replace_info;
2820   basic_block old_entry_block;
2821   tree t_step;
2822
2823   gcc_assert (TREE_CODE (old_decl) == FUNCTION_DECL
2824               && TREE_CODE (new_decl) == FUNCTION_DECL);
2825   DECL_POSSIBLY_INLINED (old_decl) = 1;
2826
2827   old_version_node = cgraph_node (old_decl);
2828   new_version_node = cgraph_node (new_decl);
2829
2830   allocate_struct_function (new_decl);
2831   /* Cfun points to the new allocated function struct at this point.  */
2832   cfun->function_end_locus = DECL_SOURCE_LOCATION (new_decl);
2833
2834   DECL_ARTIFICIAL (new_decl) = 1;
2835   DECL_ABSTRACT_ORIGIN (new_decl) = DECL_ORIGIN (old_decl);
2836
2837   /* Generate a new name for the new version. */
2838   DECL_NAME (new_decl) =
2839     create_tmp_var_name (NULL);
2840   /* Create a new SYMBOL_REF rtx for the new name. */
2841   if (DECL_RTL (old_decl) != NULL)
2842     {
2843       SET_DECL_RTL (new_decl, copy_rtx (DECL_RTL (old_decl)));
2844       XEXP (DECL_RTL (new_decl), 0) =
2845         gen_rtx_SYMBOL_REF (GET_MODE (XEXP (DECL_RTL (old_decl), 0)),
2846                             IDENTIFIER_POINTER (DECL_NAME (new_decl)));
2847     }
2848
2849   /* Prepare the data structures for the tree copy.  */
2850   memset (&id, 0, sizeof (id));
2851   
2852   /* The new version. */
2853   id.node = new_version_node;
2854   
2855   /* The old version. */
2856   id.current_node = cgraph_node (old_decl);
2857   
2858   id.versioning_p = true;
2859   id.decl_map = splay_tree_new (splay_tree_compare_pointers, NULL, NULL);
2860   id.caller = new_decl;
2861   id.callee = old_decl;
2862   id.callee_cfun = DECL_STRUCT_FUNCTION (old_decl);
2863   
2864   current_function_decl = new_decl;
2865   
2866   /* Copy the function's static chain.  */
2867   p = DECL_STRUCT_FUNCTION (old_decl)->static_chain_decl;
2868   if (p)
2869     DECL_STRUCT_FUNCTION (new_decl)->static_chain_decl =
2870       copy_static_chain (DECL_STRUCT_FUNCTION (old_decl)->static_chain_decl,
2871                          &id);
2872   /* Copy the function's arguments.  */
2873   if (DECL_ARGUMENTS (old_decl) != NULL_TREE)
2874     DECL_ARGUMENTS (new_decl) =
2875       copy_arguments_for_versioning (DECL_ARGUMENTS (old_decl), &id);
2876   
2877   /* If there's a tree_map, prepare for substitution.  */
2878   if (tree_map)
2879     for (i = 0; i < VARRAY_ACTIVE_SIZE (tree_map); i++)
2880       {
2881         replace_info = VARRAY_GENERIC_PTR (tree_map, i);
2882         if (replace_info->replace_p && !replace_info->ref_p)
2883           insert_decl_map (&id, replace_info->old_tree,
2884                            replace_info->new_tree);
2885         else if (replace_info->replace_p && replace_info->ref_p)
2886           id.ipa_info = tree_map;
2887       }
2888   
2889   DECL_INITIAL (new_decl) = remap_blocks (DECL_INITIAL (id.callee), &id);
2890   
2891   /* Renumber the lexical scoping (non-code) blocks consecutively.  */
2892   number_blocks (id.caller);
2893   
2894   if (DECL_STRUCT_FUNCTION (old_decl)->unexpanded_var_list != NULL_TREE)
2895     /* Add local vars.  */
2896     for (t_step = DECL_STRUCT_FUNCTION (old_decl)->unexpanded_var_list;
2897          t_step; t_step = TREE_CHAIN (t_step))
2898       {
2899         tree var = TREE_VALUE (t_step);
2900         if (TREE_STATIC (var) && !TREE_ASM_WRITTEN (var))
2901           cfun->unexpanded_var_list = tree_cons (NULL_TREE, var,
2902                                                  cfun->unexpanded_var_list);
2903         else
2904           cfun->unexpanded_var_list =
2905             tree_cons (NULL_TREE, remap_decl (var, &id),
2906                        cfun->unexpanded_var_list);
2907       }
2908   
2909   /* Copy the Function's body.  */
2910   old_entry_block = ENTRY_BLOCK_PTR_FOR_FUNCTION
2911     (DECL_STRUCT_FUNCTION (old_decl));
2912   new_fndecl = copy_body (&id,
2913                           old_entry_block->count,
2914                           old_entry_block->frequency, NULL, NULL);
2915   
2916   DECL_SAVED_TREE (new_decl) = DECL_SAVED_TREE (new_fndecl);
2917
2918   DECL_STRUCT_FUNCTION (new_decl)->cfg =
2919     DECL_STRUCT_FUNCTION (new_fndecl)->cfg;
2920   DECL_STRUCT_FUNCTION (new_decl)->eh = DECL_STRUCT_FUNCTION (new_fndecl)->eh;
2921   DECL_STRUCT_FUNCTION (new_decl)->ib_boundaries_block =
2922     DECL_STRUCT_FUNCTION (new_fndecl)->ib_boundaries_block;
2923   DECL_STRUCT_FUNCTION (new_decl)->last_label_uid =
2924     DECL_STRUCT_FUNCTION (new_fndecl)->last_label_uid;
2925
2926   if (DECL_RESULT (old_decl) != NULL_TREE)
2927     {
2928       tree *res_decl = &DECL_RESULT (old_decl);
2929       DECL_RESULT (new_decl) = remap_decl (*res_decl, &id);
2930       lang_hooks.dup_lang_specific_decl (DECL_RESULT (new_decl));
2931     }
2932   
2933   current_function_decl = NULL;
2934   /* Renumber the lexical scoping (non-code) blocks consecutively.  */
2935   number_blocks (new_decl);
2936
2937   /* Clean up.  */
2938   splay_tree_delete (id.decl_map);
2939   fold_cond_expr_cond ();
2940   return;
2941 }
2942
2943 /*  Replace an INDIRECT_REF tree of a given DECL tree with a new 
2944     given tree.
2945     ID->ipa_info keeps the old tree and the new tree.  
2946     TP points to the INDIRECT REF tree.  Return true if 
2947     the trees were replaced.  */
2948 static bool
2949 replace_ref_tree (inline_data * id, tree * tp)
2950 {
2951   bool replaced = false;
2952   tree new;
2953
2954   if (id->ipa_info && VARRAY_ACTIVE_SIZE (id->ipa_info) > 0)
2955     {
2956       unsigned i;
2957
2958       for (i = 0; i < VARRAY_ACTIVE_SIZE (id->ipa_info); i++)
2959         {
2960           struct ipa_replace_map *replace_info;
2961           replace_info = VARRAY_GENERIC_PTR (id->ipa_info, i);
2962
2963           if (replace_info->replace_p && replace_info->ref_p)
2964             {
2965               tree old_tree = replace_info->old_tree;
2966               tree new_tree = replace_info->new_tree;
2967
2968               if (TREE_CODE (*tp) == INDIRECT_REF
2969                   && TREE_OPERAND (*tp, 0) == old_tree)
2970                 {
2971                   new = copy_node (new_tree);
2972                   *tp = new;
2973                   replaced = true;
2974                 }
2975             }
2976         }
2977     }
2978   return replaced;
2979 }
2980
2981 /* Return true if we are inlining.  */
2982 static inline bool
2983 inlining_p (inline_data * id)
2984 {
2985   return (!id->saving_p && !id->cloning_p && !id->versioning_p);
2986 }
2987
2988 /* Duplicate a type, fields and all.  */
2989
2990 tree
2991 build_duplicate_type (tree type)
2992 {
2993   inline_data id;
2994
2995   memset (&id, 0, sizeof (id));
2996   id.callee = current_function_decl;
2997   id.caller = current_function_decl;
2998   id.callee_cfun = cfun;
2999   id.decl_map = splay_tree_new (splay_tree_compare_pointers, NULL, NULL);
3000
3001   type = remap_type_1 (type, &id);
3002
3003   splay_tree_delete (id.decl_map);
3004
3005   return type;
3006 }