Merge with gcc-4_3-branch up to revision 175516.
[official-gcc.git] / gcc / gimplify.c
bloba02fa5bdd7bc6bfc789c09f4fae4d7faed42b8a7
1 /* Tree lowering pass. This pass converts the GENERIC functions-as-trees
2 tree representation into the GIMPLE form.
3 Copyright (C) 2002, 2003, 2004, 2005, 2006, 2007, 2008
4 Free Software Foundation, Inc.
5 Major work done by Sebastian Pop <s.pop@laposte.net>,
6 Diego Novillo <dnovillo@redhat.com> and Jason Merrill <jason@redhat.com>.
8 This file is part of GCC.
10 GCC is free software; you can redistribute it and/or modify it under
11 the terms of the GNU General Public License as published by the Free
12 Software Foundation; either version 3, or (at your option) any later
13 version.
15 GCC is distributed in the hope that it will be useful, but WITHOUT ANY
16 WARRANTY; without even the implied warranty of MERCHANTABILITY or
17 FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License
18 for more details.
20 You should have received a copy of the GNU General Public License
21 along with GCC; see the file COPYING3. If not see
22 <http://www.gnu.org/licenses/>. */
24 #include "config.h"
25 #include "system.h"
26 #include "coretypes.h"
27 #include "tm.h"
28 #include "tree.h"
29 #include "rtl.h"
30 #include "varray.h"
31 #include "tree-gimple.h"
32 #include "tree-inline.h"
33 #include "diagnostic.h"
34 #include "langhooks.h"
35 #include "langhooks-def.h"
36 #include "tree-flow.h"
37 #include "cgraph.h"
38 #include "timevar.h"
39 #include "except.h"
40 #include "hashtab.h"
41 #include "flags.h"
42 #include "real.h"
43 #include "function.h"
44 #include "output.h"
45 #include "expr.h"
46 #include "ggc.h"
47 #include "toplev.h"
48 #include "target.h"
49 #include "optabs.h"
50 #include "pointer-set.h"
51 #include "splay-tree.h"
54 enum gimplify_omp_var_data
56 GOVD_SEEN = 1,
57 GOVD_EXPLICIT = 2,
58 GOVD_SHARED = 4,
59 GOVD_PRIVATE = 8,
60 GOVD_FIRSTPRIVATE = 16,
61 GOVD_LASTPRIVATE = 32,
62 GOVD_REDUCTION = 64,
63 GOVD_LOCAL = 128,
64 GOVD_DEBUG_PRIVATE = 256,
65 GOVD_DATA_SHARE_CLASS = (GOVD_SHARED | GOVD_PRIVATE | GOVD_FIRSTPRIVATE
66 | GOVD_LASTPRIVATE | GOVD_REDUCTION | GOVD_LOCAL)
69 struct gimplify_omp_ctx
71 struct gimplify_omp_ctx *outer_context;
72 splay_tree variables;
73 struct pointer_set_t *privatized_types;
74 location_t location;
75 enum omp_clause_default_kind default_kind;
76 bool is_parallel;
77 bool is_combined_parallel;
80 struct gimplify_ctx
82 struct gimplify_ctx *prev_context;
84 tree current_bind_expr;
85 tree temps;
86 tree conditional_cleanups;
87 tree exit_label;
88 tree return_temp;
90 VEC(tree,heap) *case_labels;
91 /* The formal temporary table. Should this be persistent? */
92 htab_t temp_htab;
94 int conditions;
95 bool save_stack;
96 bool into_ssa;
97 bool allow_rhs_cond_expr;
100 static struct gimplify_ctx *gimplify_ctxp;
101 static struct gimplify_omp_ctx *gimplify_omp_ctxp;
105 /* Formal (expression) temporary table handling: Multiple occurrences of
106 the same scalar expression are evaluated into the same temporary. */
108 typedef struct gimple_temp_hash_elt
110 tree val; /* Key */
111 tree temp; /* Value */
112 } elt_t;
114 /* Forward declarations. */
115 static enum gimplify_status gimplify_compound_expr (tree *, tree *, bool);
117 /* Mark X addressable. Unlike the langhook we expect X to be in gimple
118 form and we don't do any syntax checking. */
119 static void
120 mark_addressable (tree x)
122 while (handled_component_p (x))
123 x = TREE_OPERAND (x, 0);
124 if (TREE_CODE (x) != VAR_DECL && TREE_CODE (x) != PARM_DECL)
125 return ;
126 TREE_ADDRESSABLE (x) = 1;
129 /* Return a hash value for a formal temporary table entry. */
131 static hashval_t
132 gimple_tree_hash (const void *p)
134 tree t = ((const elt_t *) p)->val;
135 return iterative_hash_expr (t, 0);
138 /* Compare two formal temporary table entries. */
140 static int
141 gimple_tree_eq (const void *p1, const void *p2)
143 tree t1 = ((const elt_t *) p1)->val;
144 tree t2 = ((const elt_t *) p2)->val;
145 enum tree_code code = TREE_CODE (t1);
147 if (TREE_CODE (t2) != code
148 || TREE_TYPE (t1) != TREE_TYPE (t2))
149 return 0;
151 if (!operand_equal_p (t1, t2, 0))
152 return 0;
154 /* Only allow them to compare equal if they also hash equal; otherwise
155 results are nondeterminate, and we fail bootstrap comparison. */
156 gcc_assert (gimple_tree_hash (p1) == gimple_tree_hash (p2));
158 return 1;
161 /* Set up a context for the gimplifier. */
163 void
164 push_gimplify_context (void)
166 struct gimplify_ctx *c;
168 c = (struct gimplify_ctx *) xcalloc (1, sizeof (struct gimplify_ctx));
169 c->prev_context = gimplify_ctxp;
170 if (optimize)
171 c->temp_htab = htab_create (1000, gimple_tree_hash, gimple_tree_eq, free);
173 gimplify_ctxp = c;
176 /* Tear down a context for the gimplifier. If BODY is non-null, then
177 put the temporaries into the outer BIND_EXPR. Otherwise, put them
178 in the unexpanded_var_list. */
180 void
181 pop_gimplify_context (tree body)
183 struct gimplify_ctx *c = gimplify_ctxp;
184 tree t;
186 gcc_assert (c && !c->current_bind_expr);
187 gimplify_ctxp = c->prev_context;
189 for (t = c->temps; t ; t = TREE_CHAIN (t))
190 DECL_GIMPLE_FORMAL_TEMP_P (t) = 0;
192 if (body)
193 declare_vars (c->temps, body, false);
194 else
195 record_vars (c->temps);
197 if (optimize)
198 htab_delete (c->temp_htab);
199 free (c);
202 static void
203 gimple_push_bind_expr (tree bind)
205 TREE_CHAIN (bind) = gimplify_ctxp->current_bind_expr;
206 gimplify_ctxp->current_bind_expr = bind;
209 static void
210 gimple_pop_bind_expr (void)
212 gimplify_ctxp->current_bind_expr
213 = TREE_CHAIN (gimplify_ctxp->current_bind_expr);
216 tree
217 gimple_current_bind_expr (void)
219 return gimplify_ctxp->current_bind_expr;
222 /* Returns true iff there is a COND_EXPR between us and the innermost
223 CLEANUP_POINT_EXPR. This info is used by gimple_push_cleanup. */
225 static bool
226 gimple_conditional_context (void)
228 return gimplify_ctxp->conditions > 0;
231 /* Note that we've entered a COND_EXPR. */
233 static void
234 gimple_push_condition (void)
236 #ifdef ENABLE_CHECKING
237 if (gimplify_ctxp->conditions == 0)
238 gcc_assert (!gimplify_ctxp->conditional_cleanups);
239 #endif
240 ++(gimplify_ctxp->conditions);
243 /* Note that we've left a COND_EXPR. If we're back at unconditional scope
244 now, add any conditional cleanups we've seen to the prequeue. */
246 static void
247 gimple_pop_condition (tree *pre_p)
249 int conds = --(gimplify_ctxp->conditions);
251 gcc_assert (conds >= 0);
252 if (conds == 0)
254 append_to_statement_list (gimplify_ctxp->conditional_cleanups, pre_p);
255 gimplify_ctxp->conditional_cleanups = NULL_TREE;
259 /* A stable comparison routine for use with splay trees and DECLs. */
261 static int
262 splay_tree_compare_decl_uid (splay_tree_key xa, splay_tree_key xb)
264 tree a = (tree) xa;
265 tree b = (tree) xb;
267 return DECL_UID (a) - DECL_UID (b);
270 /* Create a new omp construct that deals with variable remapping. */
272 static struct gimplify_omp_ctx *
273 new_omp_context (bool is_parallel, bool is_combined_parallel)
275 struct gimplify_omp_ctx *c;
277 c = XCNEW (struct gimplify_omp_ctx);
278 c->outer_context = gimplify_omp_ctxp;
279 c->variables = splay_tree_new (splay_tree_compare_decl_uid, 0, 0);
280 c->privatized_types = pointer_set_create ();
281 c->location = input_location;
282 c->is_parallel = is_parallel;
283 c->is_combined_parallel = is_combined_parallel;
284 c->default_kind = OMP_CLAUSE_DEFAULT_SHARED;
286 return c;
289 /* Destroy an omp construct that deals with variable remapping. */
291 static void
292 delete_omp_context (struct gimplify_omp_ctx *c)
294 splay_tree_delete (c->variables);
295 pointer_set_destroy (c->privatized_types);
296 XDELETE (c);
299 static void omp_add_variable (struct gimplify_omp_ctx *, tree, unsigned int);
300 static bool omp_notice_variable (struct gimplify_omp_ctx *, tree, bool);
302 /* A subroutine of append_to_statement_list{,_force}. T is not NULL. */
304 static void
305 append_to_statement_list_1 (tree t, tree *list_p)
307 tree list = *list_p;
308 tree_stmt_iterator i;
310 if (!list)
312 if (t && TREE_CODE (t) == STATEMENT_LIST)
314 *list_p = t;
315 return;
317 *list_p = list = alloc_stmt_list ();
320 i = tsi_last (list);
321 tsi_link_after (&i, t, TSI_CONTINUE_LINKING);
324 /* Add T to the end of the list container pointed to by LIST_P.
325 If T is an expression with no effects, it is ignored. */
327 void
328 append_to_statement_list (tree t, tree *list_p)
330 if (t && TREE_SIDE_EFFECTS (t))
331 append_to_statement_list_1 (t, list_p);
334 /* Similar, but the statement is always added, regardless of side effects. */
336 void
337 append_to_statement_list_force (tree t, tree *list_p)
339 if (t != NULL_TREE)
340 append_to_statement_list_1 (t, list_p);
343 /* Both gimplify the statement T and append it to LIST_P. */
345 void
346 gimplify_and_add (tree t, tree *list_p)
348 gimplify_stmt (&t);
349 append_to_statement_list (t, list_p);
352 /* Strip off a legitimate source ending from the input string NAME of
353 length LEN. Rather than having to know the names used by all of
354 our front ends, we strip off an ending of a period followed by
355 up to five characters. (Java uses ".class".) */
357 static inline void
358 remove_suffix (char *name, int len)
360 int i;
362 for (i = 2; i < 8 && len > i; i++)
364 if (name[len - i] == '.')
366 name[len - i] = '\0';
367 break;
372 /* Create a nameless artificial label and put it in the current function
373 context. Returns the newly created label. */
375 tree
376 create_artificial_label (void)
378 tree lab = build_decl (LABEL_DECL, NULL_TREE, void_type_node);
380 DECL_ARTIFICIAL (lab) = 1;
381 DECL_IGNORED_P (lab) = 1;
382 DECL_CONTEXT (lab) = current_function_decl;
383 return lab;
386 /* Subroutine for find_single_pointer_decl. */
388 static tree
389 find_single_pointer_decl_1 (tree *tp, int *walk_subtrees ATTRIBUTE_UNUSED,
390 void *data)
392 tree *pdecl = (tree *) data;
394 /* We are only looking for pointers at the same level as the
395 original tree; we must not look through any indirections.
396 Returning anything other than NULL_TREE will cause the caller to
397 not find a base. */
398 if (REFERENCE_CLASS_P (*tp))
399 return *tp;
401 if (DECL_P (*tp) && POINTER_TYPE_P (TREE_TYPE (*tp)))
403 if (*pdecl)
405 /* We already found a pointer decl; return anything other
406 than NULL_TREE to unwind from walk_tree signalling that
407 we have a duplicate. */
408 return *tp;
410 *pdecl = *tp;
413 return NULL_TREE;
416 /* Find the single DECL of pointer type in the tree T, used directly
417 rather than via an indirection, and return it. If there are zero
418 or more than one such DECLs, return NULL. */
420 static tree
421 find_single_pointer_decl (tree t)
423 tree decl = NULL_TREE;
425 if (walk_tree (&t, find_single_pointer_decl_1, &decl, NULL))
427 /* find_single_pointer_decl_1 returns a nonzero value, causing
428 walk_tree to return a nonzero value, to indicate that it
429 found more than one pointer DECL or that it found an
430 indirection. */
431 return NULL_TREE;
434 return decl;
437 /* Create a new temporary name with PREFIX. Returns an identifier. */
439 static GTY(()) unsigned int tmp_var_id_num;
441 tree
442 create_tmp_var_name (const char *prefix)
444 char *tmp_name;
446 if (prefix)
448 char *preftmp = ASTRDUP (prefix);
450 remove_suffix (preftmp, strlen (preftmp));
451 prefix = preftmp;
454 ASM_FORMAT_PRIVATE_NAME (tmp_name, prefix ? prefix : "T", tmp_var_id_num++);
455 return get_identifier (tmp_name);
459 /* Create a new temporary variable declaration of type TYPE.
460 Does NOT push it into the current binding. */
462 tree
463 create_tmp_var_raw (tree type, const char *prefix)
465 tree tmp_var;
466 tree new_type;
468 /* Make the type of the variable writable. */
469 new_type = build_type_variant (type, 0, 0);
470 TYPE_ATTRIBUTES (new_type) = TYPE_ATTRIBUTES (type);
472 tmp_var = build_decl (VAR_DECL, prefix ? create_tmp_var_name (prefix) : NULL,
473 type);
475 /* The variable was declared by the compiler. */
476 DECL_ARTIFICIAL (tmp_var) = 1;
477 /* And we don't want debug info for it. */
478 DECL_IGNORED_P (tmp_var) = 1;
480 /* Make the variable writable. */
481 TREE_READONLY (tmp_var) = 0;
483 DECL_EXTERNAL (tmp_var) = 0;
484 TREE_STATIC (tmp_var) = 0;
485 TREE_USED (tmp_var) = 1;
487 return tmp_var;
490 /* Create a new temporary variable declaration of type TYPE. DOES push the
491 variable into the current binding. Further, assume that this is called
492 only from gimplification or optimization, at which point the creation of
493 certain types are bugs. */
495 tree
496 create_tmp_var (tree type, const char *prefix)
498 tree tmp_var;
500 /* We don't allow types that are addressable (meaning we can't make copies),
501 or incomplete. We also used to reject every variable size objects here,
502 but now support those for which a constant upper bound can be obtained.
503 The processing for variable sizes is performed in gimple_add_tmp_var,
504 point at which it really matters and possibly reached via paths not going
505 through this function, e.g. after direct calls to create_tmp_var_raw. */
506 gcc_assert (!TREE_ADDRESSABLE (type) && COMPLETE_TYPE_P (type));
508 tmp_var = create_tmp_var_raw (type, prefix);
509 gimple_add_tmp_var (tmp_var);
510 return tmp_var;
513 /* Given a tree, try to return a useful variable name that we can use
514 to prefix a temporary that is being assigned the value of the tree.
515 I.E. given <temp> = &A, return A. */
517 const char *
518 get_name (const_tree t)
520 const_tree stripped_decl;
522 stripped_decl = t;
523 STRIP_NOPS (stripped_decl);
524 if (DECL_P (stripped_decl) && DECL_NAME (stripped_decl))
525 return IDENTIFIER_POINTER (DECL_NAME (stripped_decl));
526 else
528 switch (TREE_CODE (stripped_decl))
530 case ADDR_EXPR:
531 return get_name (TREE_OPERAND (stripped_decl, 0));
532 default:
533 return NULL;
538 /* Create a temporary with a name derived from VAL. Subroutine of
539 lookup_tmp_var; nobody else should call this function. */
541 static inline tree
542 create_tmp_from_val (tree val)
544 return create_tmp_var (TYPE_MAIN_VARIANT (TREE_TYPE (val)), get_name (val));
547 /* Create a temporary to hold the value of VAL. If IS_FORMAL, try to reuse
548 an existing expression temporary. */
550 static tree
551 lookup_tmp_var (tree val, bool is_formal)
553 tree ret;
555 /* If not optimizing, never really reuse a temporary. local-alloc
556 won't allocate any variable that is used in more than one basic
557 block, which means it will go into memory, causing much extra
558 work in reload and final and poorer code generation, outweighing
559 the extra memory allocation here. */
560 if (!optimize || !is_formal || TREE_SIDE_EFFECTS (val))
561 ret = create_tmp_from_val (val);
562 else
564 elt_t elt, *elt_p;
565 void **slot;
567 elt.val = val;
568 slot = htab_find_slot (gimplify_ctxp->temp_htab, (void *)&elt, INSERT);
569 if (*slot == NULL)
571 elt_p = XNEW (elt_t);
572 elt_p->val = val;
573 elt_p->temp = ret = create_tmp_from_val (val);
574 *slot = (void *) elt_p;
576 else
578 elt_p = (elt_t *) *slot;
579 ret = elt_p->temp;
583 if (is_formal)
584 DECL_GIMPLE_FORMAL_TEMP_P (ret) = 1;
586 return ret;
589 /* Returns a formal temporary variable initialized with VAL. PRE_P is as
590 in gimplify_expr. Only use this function if:
592 1) The value of the unfactored expression represented by VAL will not
593 change between the initialization and use of the temporary, and
594 2) The temporary will not be otherwise modified.
596 For instance, #1 means that this is inappropriate for SAVE_EXPR temps,
597 and #2 means it is inappropriate for && temps.
599 For other cases, use get_initialized_tmp_var instead. */
601 static tree
602 internal_get_tmp_var (tree val, tree *pre_p, tree *post_p, bool is_formal)
604 tree t, mod;
606 gimplify_expr (&val, pre_p, post_p, is_gimple_formal_tmp_rhs, fb_rvalue);
608 t = lookup_tmp_var (val, is_formal);
610 if (is_formal)
612 tree u = find_single_pointer_decl (val);
614 if (u && TREE_CODE (u) == VAR_DECL && DECL_BASED_ON_RESTRICT_P (u))
615 u = DECL_GET_RESTRICT_BASE (u);
616 if (u && TYPE_RESTRICT (TREE_TYPE (u)))
618 if (DECL_BASED_ON_RESTRICT_P (t))
619 gcc_assert (u == DECL_GET_RESTRICT_BASE (t));
620 else
622 DECL_BASED_ON_RESTRICT_P (t) = 1;
623 SET_DECL_RESTRICT_BASE (t, u);
628 if (TREE_CODE (TREE_TYPE (t)) == COMPLEX_TYPE
629 || TREE_CODE (TREE_TYPE (t)) == VECTOR_TYPE)
630 DECL_GIMPLE_REG_P (t) = 1;
632 mod = build2 (INIT_EXPR, TREE_TYPE (t), t, unshare_expr (val));
634 if (EXPR_HAS_LOCATION (val))
635 SET_EXPR_LOCUS (mod, EXPR_LOCUS (val));
636 else
637 SET_EXPR_LOCATION (mod, input_location);
639 /* gimplify_modify_expr might want to reduce this further. */
640 gimplify_and_add (mod, pre_p);
642 /* If we're gimplifying into ssa, gimplify_modify_expr will have
643 given our temporary an ssa name. Find and return it. */
644 if (gimplify_ctxp->into_ssa)
645 t = TREE_OPERAND (mod, 0);
647 return t;
650 /* Returns a formal temporary variable initialized with VAL. PRE_P
651 points to a statement list where side-effects needed to compute VAL
652 should be stored. */
654 tree
655 get_formal_tmp_var (tree val, tree *pre_p)
657 return internal_get_tmp_var (val, pre_p, NULL, true);
660 /* Returns a temporary variable initialized with VAL. PRE_P and POST_P
661 are as in gimplify_expr. */
663 tree
664 get_initialized_tmp_var (tree val, tree *pre_p, tree *post_p)
666 return internal_get_tmp_var (val, pre_p, post_p, false);
669 /* Declares all the variables in VARS in SCOPE. If DEBUG_INFO is
670 true, generate debug info for them; otherwise don't. */
672 void
673 declare_vars (tree vars, tree scope, bool debug_info)
675 tree last = vars;
676 if (last)
678 tree temps, block;
680 /* C99 mode puts the default 'return 0;' for main outside the outer
681 braces. So drill down until we find an actual scope. */
682 while (TREE_CODE (scope) == COMPOUND_EXPR)
683 scope = TREE_OPERAND (scope, 0);
685 gcc_assert (TREE_CODE (scope) == BIND_EXPR);
687 temps = nreverse (last);
689 block = BIND_EXPR_BLOCK (scope);
690 if (!block || !debug_info)
692 TREE_CHAIN (last) = BIND_EXPR_VARS (scope);
693 BIND_EXPR_VARS (scope) = temps;
695 else
697 /* We need to attach the nodes both to the BIND_EXPR and to its
698 associated BLOCK for debugging purposes. The key point here
699 is that the BLOCK_VARS of the BIND_EXPR_BLOCK of a BIND_EXPR
700 is a subchain of the BIND_EXPR_VARS of the BIND_EXPR. */
701 if (BLOCK_VARS (block))
702 BLOCK_VARS (block) = chainon (BLOCK_VARS (block), temps);
703 else
705 BIND_EXPR_VARS (scope) = chainon (BIND_EXPR_VARS (scope), temps);
706 BLOCK_VARS (block) = temps;
712 /* For VAR a VAR_DECL of variable size, try to find a constant upper bound
713 for the size and adjust DECL_SIZE/DECL_SIZE_UNIT accordingly. Abort if
714 no such upper bound can be obtained. */
716 static void
717 force_constant_size (tree var)
719 /* The only attempt we make is by querying the maximum size of objects
720 of the variable's type. */
722 HOST_WIDE_INT max_size;
724 gcc_assert (TREE_CODE (var) == VAR_DECL);
726 max_size = max_int_size_in_bytes (TREE_TYPE (var));
728 gcc_assert (max_size >= 0);
730 DECL_SIZE_UNIT (var)
731 = build_int_cst (TREE_TYPE (DECL_SIZE_UNIT (var)), max_size);
732 DECL_SIZE (var)
733 = build_int_cst (TREE_TYPE (DECL_SIZE (var)), max_size * BITS_PER_UNIT);
736 void
737 gimple_add_tmp_var (tree tmp)
739 gcc_assert (!TREE_CHAIN (tmp) && !DECL_SEEN_IN_BIND_EXPR_P (tmp));
741 /* Later processing assumes that the object size is constant, which might
742 not be true at this point. Force the use of a constant upper bound in
743 this case. */
744 if (!host_integerp (DECL_SIZE_UNIT (tmp), 1))
745 force_constant_size (tmp);
747 DECL_CONTEXT (tmp) = current_function_decl;
748 DECL_SEEN_IN_BIND_EXPR_P (tmp) = 1;
750 if (gimplify_ctxp)
752 TREE_CHAIN (tmp) = gimplify_ctxp->temps;
753 gimplify_ctxp->temps = tmp;
755 /* Mark temporaries local within the nearest enclosing parallel. */
756 if (gimplify_omp_ctxp)
758 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
759 while (ctx && !ctx->is_parallel)
760 ctx = ctx->outer_context;
761 if (ctx)
762 omp_add_variable (ctx, tmp, GOVD_LOCAL | GOVD_SEEN);
765 else if (cfun)
766 record_vars (tmp);
767 else
768 declare_vars (tmp, DECL_SAVED_TREE (current_function_decl), false);
771 /* Determines whether to assign a locus to the statement STMT. */
773 static bool
774 should_carry_locus_p (const_tree stmt)
776 /* Don't emit a line note for a label. We particularly don't want to
777 emit one for the break label, since it doesn't actually correspond
778 to the beginning of the loop/switch. */
779 if (TREE_CODE (stmt) == LABEL_EXPR)
780 return false;
782 /* Do not annotate empty statements, since it confuses gcov. */
783 if (!TREE_SIDE_EFFECTS (stmt))
784 return false;
786 return true;
789 static void
790 annotate_one_with_locus (tree t, location_t locus)
792 if (CAN_HAVE_LOCATION_P (t)
793 && ! EXPR_HAS_LOCATION (t) && should_carry_locus_p (t))
794 SET_EXPR_LOCATION (t, locus);
797 void
798 annotate_all_with_locus (tree *stmt_p, location_t locus)
800 tree_stmt_iterator i;
802 if (!*stmt_p)
803 return;
805 for (i = tsi_start (*stmt_p); !tsi_end_p (i); tsi_next (&i))
807 tree t = tsi_stmt (i);
809 /* Assuming we've already been gimplified, we shouldn't
810 see nested chaining constructs anymore. */
811 gcc_assert (TREE_CODE (t) != STATEMENT_LIST
812 && TREE_CODE (t) != COMPOUND_EXPR);
814 annotate_one_with_locus (t, locus);
818 /* Similar to copy_tree_r() but do not copy SAVE_EXPR or TARGET_EXPR nodes.
819 These nodes model computations that should only be done once. If we
820 were to unshare something like SAVE_EXPR(i++), the gimplification
821 process would create wrong code. */
823 static tree
824 mostly_copy_tree_r (tree *tp, int *walk_subtrees, void *data)
826 enum tree_code code = TREE_CODE (*tp);
827 /* Don't unshare types, decls, constants and SAVE_EXPR nodes. */
828 if (TREE_CODE_CLASS (code) == tcc_type
829 || TREE_CODE_CLASS (code) == tcc_declaration
830 || TREE_CODE_CLASS (code) == tcc_constant
831 || code == SAVE_EXPR || code == TARGET_EXPR
832 /* We can't do anything sensible with a BLOCK used as an expression,
833 but we also can't just die when we see it because of non-expression
834 uses. So just avert our eyes and cross our fingers. Silly Java. */
835 || code == BLOCK)
836 *walk_subtrees = 0;
837 else
839 gcc_assert (code != BIND_EXPR);
840 copy_tree_r (tp, walk_subtrees, data);
843 return NULL_TREE;
846 /* Callback for walk_tree to unshare most of the shared trees rooted at
847 *TP. If *TP has been visited already (i.e., TREE_VISITED (*TP) == 1),
848 then *TP is deep copied by calling copy_tree_r.
850 This unshares the same trees as copy_tree_r with the exception of
851 SAVE_EXPR nodes. These nodes model computations that should only be
852 done once. If we were to unshare something like SAVE_EXPR(i++), the
853 gimplification process would create wrong code. */
855 static tree
856 copy_if_shared_r (tree *tp, int *walk_subtrees ATTRIBUTE_UNUSED,
857 void *data ATTRIBUTE_UNUSED)
859 tree t = *tp;
860 enum tree_code code = TREE_CODE (t);
862 /* Skip types, decls, and constants. But we do want to look at their
863 types and the bounds of types. Mark them as visited so we properly
864 unmark their subtrees on the unmark pass. If we've already seen them,
865 don't look down further. */
866 if (TREE_CODE_CLASS (code) == tcc_type
867 || TREE_CODE_CLASS (code) == tcc_declaration
868 || TREE_CODE_CLASS (code) == tcc_constant)
870 if (TREE_VISITED (t))
871 *walk_subtrees = 0;
872 else
873 TREE_VISITED (t) = 1;
876 /* If this node has been visited already, unshare it and don't look
877 any deeper. */
878 else if (TREE_VISITED (t))
880 walk_tree (tp, mostly_copy_tree_r, NULL, NULL);
881 *walk_subtrees = 0;
884 /* Otherwise, mark the tree as visited and keep looking. */
885 else
886 TREE_VISITED (t) = 1;
888 return NULL_TREE;
891 static tree
892 unmark_visited_r (tree *tp, int *walk_subtrees ATTRIBUTE_UNUSED,
893 void *data ATTRIBUTE_UNUSED)
895 if (TREE_VISITED (*tp))
896 TREE_VISITED (*tp) = 0;
897 else
898 *walk_subtrees = 0;
900 return NULL_TREE;
903 /* Unshare all the trees in BODY_P, a pointer into the body of FNDECL, and the
904 bodies of any nested functions if we are unsharing the entire body of
905 FNDECL. */
907 static void
908 unshare_body (tree *body_p, tree fndecl)
910 struct cgraph_node *cgn = cgraph_node (fndecl);
912 walk_tree (body_p, copy_if_shared_r, NULL, NULL);
913 if (body_p == &DECL_SAVED_TREE (fndecl))
914 for (cgn = cgn->nested; cgn; cgn = cgn->next_nested)
915 unshare_body (&DECL_SAVED_TREE (cgn->decl), cgn->decl);
918 /* Likewise, but mark all trees as not visited. */
920 static void
921 unvisit_body (tree *body_p, tree fndecl)
923 struct cgraph_node *cgn = cgraph_node (fndecl);
925 walk_tree (body_p, unmark_visited_r, NULL, NULL);
926 if (body_p == &DECL_SAVED_TREE (fndecl))
927 for (cgn = cgn->nested; cgn; cgn = cgn->next_nested)
928 unvisit_body (&DECL_SAVED_TREE (cgn->decl), cgn->decl);
931 /* Unshare T and all the trees reached from T via TREE_CHAIN. */
933 static void
934 unshare_all_trees (tree t)
936 walk_tree (&t, copy_if_shared_r, NULL, NULL);
937 walk_tree (&t, unmark_visited_r, NULL, NULL);
940 /* Unconditionally make an unshared copy of EXPR. This is used when using
941 stored expressions which span multiple functions, such as BINFO_VTABLE,
942 as the normal unsharing process can't tell that they're shared. */
944 tree
945 unshare_expr (tree expr)
947 walk_tree (&expr, mostly_copy_tree_r, NULL, NULL);
948 return expr;
951 /* A terser interface for building a representation of an exception
952 specification. */
954 tree
955 gimple_build_eh_filter (tree body, tree allowed, tree failure)
957 tree t;
959 /* FIXME should the allowed types go in TREE_TYPE? */
960 t = build2 (EH_FILTER_EXPR, void_type_node, allowed, NULL_TREE);
961 append_to_statement_list (failure, &EH_FILTER_FAILURE (t));
963 t = build2 (TRY_CATCH_EXPR, void_type_node, NULL_TREE, t);
964 append_to_statement_list (body, &TREE_OPERAND (t, 0));
966 return t;
970 /* WRAPPER is a code such as BIND_EXPR or CLEANUP_POINT_EXPR which can both
971 contain statements and have a value. Assign its value to a temporary
972 and give it void_type_node. Returns the temporary, or NULL_TREE if
973 WRAPPER was already void. */
975 tree
976 voidify_wrapper_expr (tree wrapper, tree temp)
978 tree type = TREE_TYPE (wrapper);
979 if (type && !VOID_TYPE_P (type))
981 tree *p;
983 /* Set p to point to the body of the wrapper. Loop until we find
984 something that isn't a wrapper. */
985 for (p = &wrapper; p && *p; )
987 switch (TREE_CODE (*p))
989 case BIND_EXPR:
990 TREE_SIDE_EFFECTS (*p) = 1;
991 TREE_TYPE (*p) = void_type_node;
992 /* For a BIND_EXPR, the body is operand 1. */
993 p = &BIND_EXPR_BODY (*p);
994 break;
996 case CLEANUP_POINT_EXPR:
997 case TRY_FINALLY_EXPR:
998 case TRY_CATCH_EXPR:
999 TREE_SIDE_EFFECTS (*p) = 1;
1000 TREE_TYPE (*p) = void_type_node;
1001 p = &TREE_OPERAND (*p, 0);
1002 break;
1004 case STATEMENT_LIST:
1006 tree_stmt_iterator i = tsi_last (*p);
1007 TREE_SIDE_EFFECTS (*p) = 1;
1008 TREE_TYPE (*p) = void_type_node;
1009 p = tsi_end_p (i) ? NULL : tsi_stmt_ptr (i);
1011 break;
1013 case COMPOUND_EXPR:
1014 /* Advance to the last statement. Set all container types to void. */
1015 for (; TREE_CODE (*p) == COMPOUND_EXPR; p = &TREE_OPERAND (*p, 1))
1017 TREE_SIDE_EFFECTS (*p) = 1;
1018 TREE_TYPE (*p) = void_type_node;
1020 break;
1022 default:
1023 goto out;
1027 out:
1028 if (p == NULL || IS_EMPTY_STMT (*p))
1029 temp = NULL_TREE;
1030 else if (temp)
1032 /* The wrapper is on the RHS of an assignment that we're pushing
1033 down. */
1034 gcc_assert (TREE_CODE (temp) == INIT_EXPR
1035 || TREE_CODE (temp) == GIMPLE_MODIFY_STMT
1036 || TREE_CODE (temp) == MODIFY_EXPR);
1037 GENERIC_TREE_OPERAND (temp, 1) = *p;
1038 *p = temp;
1040 else
1042 temp = create_tmp_var (type, "retval");
1043 *p = build2 (INIT_EXPR, type, temp, *p);
1046 return temp;
1049 return NULL_TREE;
1052 /* Prepare calls to builtins to SAVE and RESTORE the stack as well as
1053 a temporary through which they communicate. */
1055 static void
1056 build_stack_save_restore (tree *save, tree *restore)
1058 tree save_call, tmp_var;
1060 save_call =
1061 build_call_expr (implicit_built_in_decls[BUILT_IN_STACK_SAVE], 0);
1062 tmp_var = create_tmp_var (ptr_type_node, "saved_stack");
1064 *save = build_gimple_modify_stmt (tmp_var, save_call);
1065 *restore =
1066 build_call_expr (implicit_built_in_decls[BUILT_IN_STACK_RESTORE],
1067 1, tmp_var);
1070 /* Gimplify a BIND_EXPR. Just voidify and recurse. */
1072 static enum gimplify_status
1073 gimplify_bind_expr (tree *expr_p, tree *pre_p)
1075 tree bind_expr = *expr_p;
1076 bool old_save_stack = gimplify_ctxp->save_stack;
1077 tree t;
1079 tree temp = voidify_wrapper_expr (bind_expr, NULL);
1081 /* Mark variables seen in this bind expr. */
1082 for (t = BIND_EXPR_VARS (bind_expr); t ; t = TREE_CHAIN (t))
1084 if (TREE_CODE (t) == VAR_DECL)
1086 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
1088 /* Mark variable as local. */
1089 if (ctx && !is_global_var (t)
1090 && (! DECL_SEEN_IN_BIND_EXPR_P (t)
1091 || splay_tree_lookup (ctx->variables,
1092 (splay_tree_key) t) == NULL))
1093 omp_add_variable (gimplify_omp_ctxp, t, GOVD_LOCAL | GOVD_SEEN);
1095 DECL_SEEN_IN_BIND_EXPR_P (t) = 1;
1098 /* Preliminarily mark non-addressed complex variables as eligible
1099 for promotion to gimple registers. We'll transform their uses
1100 as we find them. */
1101 if ((TREE_CODE (TREE_TYPE (t)) == COMPLEX_TYPE
1102 || TREE_CODE (TREE_TYPE (t)) == VECTOR_TYPE)
1103 && !TREE_THIS_VOLATILE (t)
1104 && (TREE_CODE (t) == VAR_DECL && !DECL_HARD_REGISTER (t))
1105 && !needs_to_live_in_memory (t))
1106 DECL_GIMPLE_REG_P (t) = 1;
1109 gimple_push_bind_expr (bind_expr);
1110 gimplify_ctxp->save_stack = false;
1112 gimplify_to_stmt_list (&BIND_EXPR_BODY (bind_expr));
1114 if (gimplify_ctxp->save_stack)
1116 tree stack_save, stack_restore;
1118 /* Save stack on entry and restore it on exit. Add a try_finally
1119 block to achieve this. Note that mudflap depends on the
1120 format of the emitted code: see mx_register_decls(). */
1121 build_stack_save_restore (&stack_save, &stack_restore);
1123 t = build2 (TRY_FINALLY_EXPR, void_type_node,
1124 BIND_EXPR_BODY (bind_expr), NULL_TREE);
1125 append_to_statement_list (stack_restore, &TREE_OPERAND (t, 1));
1127 BIND_EXPR_BODY (bind_expr) = NULL_TREE;
1128 append_to_statement_list (stack_save, &BIND_EXPR_BODY (bind_expr));
1129 append_to_statement_list (t, &BIND_EXPR_BODY (bind_expr));
1132 gimplify_ctxp->save_stack = old_save_stack;
1133 gimple_pop_bind_expr ();
1135 if (temp)
1137 *expr_p = temp;
1138 append_to_statement_list (bind_expr, pre_p);
1139 return GS_OK;
1141 else
1142 return GS_ALL_DONE;
1145 /* Gimplify a RETURN_EXPR. If the expression to be returned is not a
1146 GIMPLE value, it is assigned to a new temporary and the statement is
1147 re-written to return the temporary.
1149 PRE_P points to the list where side effects that must happen before
1150 STMT should be stored. */
1152 static enum gimplify_status
1153 gimplify_return_expr (tree stmt, tree *pre_p)
1155 tree ret_expr = TREE_OPERAND (stmt, 0);
1156 tree result_decl, result;
1158 if (!ret_expr || TREE_CODE (ret_expr) == RESULT_DECL
1159 || ret_expr == error_mark_node)
1160 return GS_ALL_DONE;
1162 if (VOID_TYPE_P (TREE_TYPE (TREE_TYPE (current_function_decl))))
1163 result_decl = NULL_TREE;
1164 else
1166 result_decl = GENERIC_TREE_OPERAND (ret_expr, 0);
1167 if (TREE_CODE (result_decl) == INDIRECT_REF)
1168 /* See through a return by reference. */
1169 result_decl = TREE_OPERAND (result_decl, 0);
1171 gcc_assert ((TREE_CODE (ret_expr) == MODIFY_EXPR
1172 || TREE_CODE (ret_expr) == GIMPLE_MODIFY_STMT
1173 || TREE_CODE (ret_expr) == INIT_EXPR)
1174 && TREE_CODE (result_decl) == RESULT_DECL);
1177 /* If aggregate_value_p is true, then we can return the bare RESULT_DECL.
1178 Recall that aggregate_value_p is FALSE for any aggregate type that is
1179 returned in registers. If we're returning values in registers, then
1180 we don't want to extend the lifetime of the RESULT_DECL, particularly
1181 across another call. In addition, for those aggregates for which
1182 hard_function_value generates a PARALLEL, we'll die during normal
1183 expansion of structure assignments; there's special code in expand_return
1184 to handle this case that does not exist in expand_expr. */
1185 if (!result_decl
1186 || aggregate_value_p (result_decl, TREE_TYPE (current_function_decl)))
1187 result = result_decl;
1188 else if (gimplify_ctxp->return_temp)
1189 result = gimplify_ctxp->return_temp;
1190 else
1192 result = create_tmp_var (TREE_TYPE (result_decl), NULL);
1193 if (TREE_CODE (TREE_TYPE (result)) == COMPLEX_TYPE
1194 || TREE_CODE (TREE_TYPE (result)) == VECTOR_TYPE)
1195 DECL_GIMPLE_REG_P (result) = 1;
1197 /* ??? With complex control flow (usually involving abnormal edges),
1198 we can wind up warning about an uninitialized value for this. Due
1199 to how this variable is constructed and initialized, this is never
1200 true. Give up and never warn. */
1201 TREE_NO_WARNING (result) = 1;
1203 gimplify_ctxp->return_temp = result;
1206 /* Smash the lhs of the GIMPLE_MODIFY_STMT to the temporary we plan to use.
1207 Then gimplify the whole thing. */
1208 if (result != result_decl)
1209 GENERIC_TREE_OPERAND (ret_expr, 0) = result;
1211 gimplify_and_add (TREE_OPERAND (stmt, 0), pre_p);
1213 /* If we didn't use a temporary, then the result is just the result_decl.
1214 Otherwise we need a simple copy. This should already be gimple. */
1215 if (result == result_decl)
1216 ret_expr = result;
1217 else
1218 ret_expr = build_gimple_modify_stmt (result_decl, result);
1219 TREE_OPERAND (stmt, 0) = ret_expr;
1221 return GS_ALL_DONE;
1224 static void
1225 gimplify_vla_decl (tree decl, tree *stmt_p)
1227 /* This is a variable-sized decl. Simplify its size and mark it
1228 for deferred expansion. Note that mudflap depends on the format
1229 of the emitted code: see mx_register_decls(). */
1230 tree t, addr, ptr_type;
1232 gimplify_one_sizepos (&DECL_SIZE (decl), stmt_p);
1233 gimplify_one_sizepos (&DECL_SIZE_UNIT (decl), stmt_p);
1235 /* All occurrences of this decl in final gimplified code will be
1236 replaced by indirection. Setting DECL_VALUE_EXPR does two
1237 things: First, it lets the rest of the gimplifier know what
1238 replacement to use. Second, it lets the debug info know
1239 where to find the value. */
1240 ptr_type = build_pointer_type (TREE_TYPE (decl));
1241 addr = create_tmp_var (ptr_type, get_name (decl));
1242 DECL_IGNORED_P (addr) = 0;
1243 t = build_fold_indirect_ref (addr);
1244 SET_DECL_VALUE_EXPR (decl, t);
1245 DECL_HAS_VALUE_EXPR_P (decl) = 1;
1247 t = built_in_decls[BUILT_IN_ALLOCA];
1248 t = build_call_expr (t, 1, DECL_SIZE_UNIT (decl));
1249 t = fold_convert (ptr_type, t);
1250 t = build_gimple_modify_stmt (addr, t);
1252 gimplify_and_add (t, stmt_p);
1254 /* Indicate that we need to restore the stack level when the
1255 enclosing BIND_EXPR is exited. */
1256 gimplify_ctxp->save_stack = true;
1259 /* Gimplifies a DECL_EXPR node *STMT_P by making any necessary allocation
1260 and initialization explicit. */
1262 static enum gimplify_status
1263 gimplify_decl_expr (tree *stmt_p)
1265 tree stmt = *stmt_p;
1266 tree decl = DECL_EXPR_DECL (stmt);
1268 *stmt_p = NULL_TREE;
1270 if (TREE_TYPE (decl) == error_mark_node)
1271 return GS_ERROR;
1273 if ((TREE_CODE (decl) == TYPE_DECL
1274 || TREE_CODE (decl) == VAR_DECL)
1275 && !TYPE_SIZES_GIMPLIFIED (TREE_TYPE (decl)))
1276 gimplify_type_sizes (TREE_TYPE (decl), stmt_p);
1278 if (TREE_CODE (decl) == VAR_DECL && !DECL_EXTERNAL (decl))
1280 tree init = DECL_INITIAL (decl);
1282 if (TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
1283 gimplify_vla_decl (decl, stmt_p);
1285 if (init && init != error_mark_node)
1287 if (!TREE_STATIC (decl))
1289 DECL_INITIAL (decl) = NULL_TREE;
1290 init = build2 (INIT_EXPR, void_type_node, decl, init);
1291 gimplify_and_add (init, stmt_p);
1293 else
1294 /* We must still examine initializers for static variables
1295 as they may contain a label address. */
1296 walk_tree (&init, force_labels_r, NULL, NULL);
1299 /* Some front ends do not explicitly declare all anonymous
1300 artificial variables. We compensate here by declaring the
1301 variables, though it would be better if the front ends would
1302 explicitly declare them. */
1303 if (!DECL_SEEN_IN_BIND_EXPR_P (decl)
1304 && DECL_ARTIFICIAL (decl) && DECL_NAME (decl) == NULL_TREE)
1305 gimple_add_tmp_var (decl);
1308 return GS_ALL_DONE;
1311 /* Gimplify a LOOP_EXPR. Normally this just involves gimplifying the body
1312 and replacing the LOOP_EXPR with goto, but if the loop contains an
1313 EXIT_EXPR, we need to append a label for it to jump to. */
1315 static enum gimplify_status
1316 gimplify_loop_expr (tree *expr_p, tree *pre_p)
1318 tree saved_label = gimplify_ctxp->exit_label;
1319 tree start_label = build1 (LABEL_EXPR, void_type_node, NULL_TREE);
1320 tree jump_stmt = build_and_jump (&LABEL_EXPR_LABEL (start_label));
1322 append_to_statement_list (start_label, pre_p);
1324 gimplify_ctxp->exit_label = NULL_TREE;
1326 gimplify_and_add (LOOP_EXPR_BODY (*expr_p), pre_p);
1328 if (gimplify_ctxp->exit_label)
1330 append_to_statement_list (jump_stmt, pre_p);
1331 *expr_p = build1 (LABEL_EXPR, void_type_node, gimplify_ctxp->exit_label);
1333 else
1334 *expr_p = jump_stmt;
1336 gimplify_ctxp->exit_label = saved_label;
1338 return GS_ALL_DONE;
1341 /* Compare two case labels. Because the front end should already have
1342 made sure that case ranges do not overlap, it is enough to only compare
1343 the CASE_LOW values of each case label. */
1345 static int
1346 compare_case_labels (const void *p1, const void *p2)
1348 const_tree const case1 = *(const_tree const*)p1;
1349 const_tree const case2 = *(const_tree const*)p2;
1351 return tree_int_cst_compare (CASE_LOW (case1), CASE_LOW (case2));
1354 /* Sort the case labels in LABEL_VEC in place in ascending order. */
1356 void
1357 sort_case_labels (tree label_vec)
1359 size_t len = TREE_VEC_LENGTH (label_vec);
1360 tree default_case = TREE_VEC_ELT (label_vec, len - 1);
1362 if (CASE_LOW (default_case))
1364 size_t i;
1366 /* The last label in the vector should be the default case
1367 but it is not. */
1368 for (i = 0; i < len; ++i)
1370 tree t = TREE_VEC_ELT (label_vec, i);
1371 if (!CASE_LOW (t))
1373 default_case = t;
1374 TREE_VEC_ELT (label_vec, i) = TREE_VEC_ELT (label_vec, len - 1);
1375 TREE_VEC_ELT (label_vec, len - 1) = default_case;
1376 break;
1381 qsort (&TREE_VEC_ELT (label_vec, 0), len - 1, sizeof (tree),
1382 compare_case_labels);
1385 /* Gimplify a SWITCH_EXPR, and collect a TREE_VEC of the labels it can
1386 branch to. */
1388 static enum gimplify_status
1389 gimplify_switch_expr (tree *expr_p, tree *pre_p)
1391 tree switch_expr = *expr_p;
1392 enum gimplify_status ret;
1394 ret = gimplify_expr (&SWITCH_COND (switch_expr), pre_p, NULL,
1395 is_gimple_val, fb_rvalue);
1397 if (SWITCH_BODY (switch_expr))
1399 VEC(tree,heap) *labels, *saved_labels;
1400 tree label_vec, default_case = NULL_TREE;
1401 size_t i, len;
1403 /* If someone can be bothered to fill in the labels, they can
1404 be bothered to null out the body too. */
1405 gcc_assert (!SWITCH_LABELS (switch_expr));
1407 saved_labels = gimplify_ctxp->case_labels;
1408 gimplify_ctxp->case_labels = VEC_alloc (tree, heap, 8);
1410 gimplify_to_stmt_list (&SWITCH_BODY (switch_expr));
1412 labels = gimplify_ctxp->case_labels;
1413 gimplify_ctxp->case_labels = saved_labels;
1415 i = 0;
1416 while (i < VEC_length (tree, labels))
1418 tree elt = VEC_index (tree, labels, i);
1419 tree low = CASE_LOW (elt);
1420 bool remove_element = FALSE;
1422 if (low)
1424 /* Discard empty ranges. */
1425 tree high = CASE_HIGH (elt);
1426 if (high && tree_int_cst_lt (high, low))
1427 remove_element = TRUE;
1429 else
1431 /* The default case must be the last label in the list. */
1432 gcc_assert (!default_case);
1433 default_case = elt;
1434 remove_element = TRUE;
1437 if (remove_element)
1438 VEC_ordered_remove (tree, labels, i);
1439 else
1440 i++;
1442 len = i;
1444 label_vec = make_tree_vec (len + 1);
1445 SWITCH_LABELS (*expr_p) = label_vec;
1446 append_to_statement_list (switch_expr, pre_p);
1448 if (! default_case)
1450 /* If the switch has no default label, add one, so that we jump
1451 around the switch body. */
1452 default_case = build3 (CASE_LABEL_EXPR, void_type_node, NULL_TREE,
1453 NULL_TREE, create_artificial_label ());
1454 append_to_statement_list (SWITCH_BODY (switch_expr), pre_p);
1455 *expr_p = build1 (LABEL_EXPR, void_type_node,
1456 CASE_LABEL (default_case));
1458 else
1459 *expr_p = SWITCH_BODY (switch_expr);
1461 for (i = 0; i < len; ++i)
1462 TREE_VEC_ELT (label_vec, i) = VEC_index (tree, labels, i);
1463 TREE_VEC_ELT (label_vec, len) = default_case;
1465 VEC_free (tree, heap, labels);
1467 sort_case_labels (label_vec);
1469 SWITCH_BODY (switch_expr) = NULL;
1471 else
1472 gcc_assert (SWITCH_LABELS (switch_expr));
1474 return ret;
1477 static enum gimplify_status
1478 gimplify_case_label_expr (tree *expr_p)
1480 tree expr = *expr_p;
1481 struct gimplify_ctx *ctxp;
1483 /* Invalid OpenMP programs can play Duff's Device type games with
1484 #pragma omp parallel. At least in the C front end, we don't
1485 detect such invalid branches until after gimplification. */
1486 for (ctxp = gimplify_ctxp; ; ctxp = ctxp->prev_context)
1487 if (ctxp->case_labels)
1488 break;
1490 VEC_safe_push (tree, heap, ctxp->case_labels, expr);
1491 *expr_p = build1 (LABEL_EXPR, void_type_node, CASE_LABEL (expr));
1492 return GS_ALL_DONE;
1495 /* Build a GOTO to the LABEL_DECL pointed to by LABEL_P, building it first
1496 if necessary. */
1498 tree
1499 build_and_jump (tree *label_p)
1501 if (label_p == NULL)
1502 /* If there's nowhere to jump, just fall through. */
1503 return NULL_TREE;
1505 if (*label_p == NULL_TREE)
1507 tree label = create_artificial_label ();
1508 *label_p = label;
1511 return build1 (GOTO_EXPR, void_type_node, *label_p);
1514 /* Gimplify an EXIT_EXPR by converting to a GOTO_EXPR inside a COND_EXPR.
1515 This also involves building a label to jump to and communicating it to
1516 gimplify_loop_expr through gimplify_ctxp->exit_label. */
1518 static enum gimplify_status
1519 gimplify_exit_expr (tree *expr_p)
1521 tree cond = TREE_OPERAND (*expr_p, 0);
1522 tree expr;
1524 expr = build_and_jump (&gimplify_ctxp->exit_label);
1525 expr = build3 (COND_EXPR, void_type_node, cond, expr, NULL_TREE);
1526 *expr_p = expr;
1528 return GS_OK;
1531 /* A helper function to be called via walk_tree. Mark all labels under *TP
1532 as being forced. To be called for DECL_INITIAL of static variables. */
1534 tree
1535 force_labels_r (tree *tp, int *walk_subtrees, void *data ATTRIBUTE_UNUSED)
1537 if (TYPE_P (*tp))
1538 *walk_subtrees = 0;
1539 if (TREE_CODE (*tp) == LABEL_DECL)
1540 FORCED_LABEL (*tp) = 1;
1542 return NULL_TREE;
1545 /* *EXPR_P is a COMPONENT_REF being used as an rvalue. If its type is
1546 different from its canonical type, wrap the whole thing inside a
1547 NOP_EXPR and force the type of the COMPONENT_REF to be the canonical
1548 type.
1550 The canonical type of a COMPONENT_REF is the type of the field being
1551 referenced--unless the field is a bit-field which can be read directly
1552 in a smaller mode, in which case the canonical type is the
1553 sign-appropriate type corresponding to that mode. */
1555 static void
1556 canonicalize_component_ref (tree *expr_p)
1558 tree expr = *expr_p;
1559 tree type;
1561 gcc_assert (TREE_CODE (expr) == COMPONENT_REF);
1563 if (INTEGRAL_TYPE_P (TREE_TYPE (expr)))
1564 type = TREE_TYPE (get_unwidened (expr, NULL_TREE));
1565 else
1566 type = TREE_TYPE (TREE_OPERAND (expr, 1));
1568 /* One could argue that all the stuff below is not necessary for
1569 the non-bitfield case and declare it a FE error if type
1570 adjustment would be needed. */
1571 if (TREE_TYPE (expr) != type)
1573 #ifdef ENABLE_TYPES_CHECKING
1574 tree old_type = TREE_TYPE (expr);
1575 #endif
1576 int type_quals;
1578 /* We need to preserve qualifiers and propagate them from
1579 operand 0. */
1580 type_quals = TYPE_QUALS (type)
1581 | TYPE_QUALS (TREE_TYPE (TREE_OPERAND (expr, 0)));
1582 if (TYPE_QUALS (type) != type_quals)
1583 type = build_qualified_type (TYPE_MAIN_VARIANT (type), type_quals);
1585 /* Set the type of the COMPONENT_REF to the underlying type. */
1586 TREE_TYPE (expr) = type;
1588 #ifdef ENABLE_TYPES_CHECKING
1589 /* It is now a FE error, if the conversion from the canonical
1590 type to the original expression type is not useless. */
1591 gcc_assert (useless_type_conversion_p (old_type, type));
1592 #endif
1596 /* If a NOP conversion is changing a pointer to array of foo to a pointer
1597 to foo, embed that change in the ADDR_EXPR by converting
1598 T array[U];
1599 (T *)&array
1601 &array[L]
1602 where L is the lower bound. For simplicity, only do this for constant
1603 lower bound.
1604 The constraint is that the type of &array[L] is trivially convertible
1605 to T *. */
1607 static void
1608 canonicalize_addr_expr (tree *expr_p)
1610 tree expr = *expr_p;
1611 tree addr_expr = TREE_OPERAND (expr, 0);
1612 tree datype, ddatype, pddatype;
1614 /* We simplify only conversions from an ADDR_EXPR to a pointer type. */
1615 if (!POINTER_TYPE_P (TREE_TYPE (expr))
1616 || TREE_CODE (addr_expr) != ADDR_EXPR)
1617 return;
1619 /* The addr_expr type should be a pointer to an array. */
1620 datype = TREE_TYPE (TREE_TYPE (addr_expr));
1621 if (TREE_CODE (datype) != ARRAY_TYPE)
1622 return;
1624 /* The pointer to element type shall be trivially convertible to
1625 the expression pointer type. */
1626 ddatype = TREE_TYPE (datype);
1627 pddatype = build_pointer_type (ddatype);
1628 if (!useless_type_conversion_p (pddatype, ddatype))
1629 return;
1631 /* The lower bound and element sizes must be constant. */
1632 if (!TYPE_SIZE_UNIT (ddatype)
1633 || TREE_CODE (TYPE_SIZE_UNIT (ddatype)) != INTEGER_CST
1634 || !TYPE_DOMAIN (datype) || !TYPE_MIN_VALUE (TYPE_DOMAIN (datype))
1635 || TREE_CODE (TYPE_MIN_VALUE (TYPE_DOMAIN (datype))) != INTEGER_CST)
1636 return;
1638 /* All checks succeeded. Build a new node to merge the cast. */
1639 *expr_p = build4 (ARRAY_REF, ddatype, TREE_OPERAND (addr_expr, 0),
1640 TYPE_MIN_VALUE (TYPE_DOMAIN (datype)),
1641 NULL_TREE, NULL_TREE);
1642 *expr_p = build1 (ADDR_EXPR, pddatype, *expr_p);
1645 /* *EXPR_P is a NOP_EXPR or CONVERT_EXPR. Remove it and/or other conversions
1646 underneath as appropriate. */
1648 static enum gimplify_status
1649 gimplify_conversion (tree *expr_p)
1651 tree tem;
1652 gcc_assert (TREE_CODE (*expr_p) == NOP_EXPR
1653 || TREE_CODE (*expr_p) == CONVERT_EXPR);
1655 /* Then strip away all but the outermost conversion. */
1656 STRIP_SIGN_NOPS (TREE_OPERAND (*expr_p, 0));
1658 /* And remove the outermost conversion if it's useless. */
1659 if (tree_ssa_useless_type_conversion (*expr_p))
1660 *expr_p = TREE_OPERAND (*expr_p, 0);
1662 /* Attempt to avoid NOP_EXPR by producing reference to a subtype.
1663 For example this fold (subclass *)&A into &A->subclass avoiding
1664 a need for statement. */
1665 if (TREE_CODE (*expr_p) == NOP_EXPR
1666 && POINTER_TYPE_P (TREE_TYPE (*expr_p))
1667 && POINTER_TYPE_P (TREE_TYPE (TREE_OPERAND (*expr_p, 0)))
1668 && (tem = maybe_fold_offset_to_reference
1669 (TREE_OPERAND (*expr_p, 0),
1670 integer_zero_node, TREE_TYPE (TREE_TYPE (*expr_p)))))
1672 tree ptr_type = build_pointer_type (TREE_TYPE (tem));
1673 if (useless_type_conversion_p (TREE_TYPE (*expr_p), ptr_type))
1674 *expr_p = build_fold_addr_expr_with_type (tem, ptr_type);
1677 /* If we still have a conversion at the toplevel,
1678 then canonicalize some constructs. */
1679 if (TREE_CODE (*expr_p) == NOP_EXPR || TREE_CODE (*expr_p) == CONVERT_EXPR)
1681 tree sub = TREE_OPERAND (*expr_p, 0);
1683 /* If a NOP conversion is changing the type of a COMPONENT_REF
1684 expression, then canonicalize its type now in order to expose more
1685 redundant conversions. */
1686 if (TREE_CODE (sub) == COMPONENT_REF)
1687 canonicalize_component_ref (&TREE_OPERAND (*expr_p, 0));
1689 /* If a NOP conversion is changing a pointer to array of foo
1690 to a pointer to foo, embed that change in the ADDR_EXPR. */
1691 else if (TREE_CODE (sub) == ADDR_EXPR)
1692 canonicalize_addr_expr (expr_p);
1695 return GS_OK;
1698 /* Gimplify a VAR_DECL or PARM_DECL. Returns GS_OK if we expanded a
1699 DECL_VALUE_EXPR, and it's worth re-examining things. */
1701 static enum gimplify_status
1702 gimplify_var_or_parm_decl (tree *expr_p)
1704 tree decl = *expr_p;
1706 /* ??? If this is a local variable, and it has not been seen in any
1707 outer BIND_EXPR, then it's probably the result of a duplicate
1708 declaration, for which we've already issued an error. It would
1709 be really nice if the front end wouldn't leak these at all.
1710 Currently the only known culprit is C++ destructors, as seen
1711 in g++.old-deja/g++.jason/binding.C. */
1712 if (TREE_CODE (decl) == VAR_DECL
1713 && !DECL_SEEN_IN_BIND_EXPR_P (decl)
1714 && !TREE_STATIC (decl) && !DECL_EXTERNAL (decl)
1715 && decl_function_context (decl) == current_function_decl)
1717 gcc_assert (errorcount || sorrycount);
1718 return GS_ERROR;
1721 /* When within an OpenMP context, notice uses of variables. */
1722 if (gimplify_omp_ctxp && omp_notice_variable (gimplify_omp_ctxp, decl, true))
1723 return GS_ALL_DONE;
1725 /* If the decl is an alias for another expression, substitute it now. */
1726 if (DECL_HAS_VALUE_EXPR_P (decl))
1728 *expr_p = unshare_expr (DECL_VALUE_EXPR (decl));
1729 return GS_OK;
1732 return GS_ALL_DONE;
1736 /* Gimplify the COMPONENT_REF, ARRAY_REF, REALPART_EXPR or IMAGPART_EXPR
1737 node pointed to by EXPR_P.
1739 compound_lval
1740 : min_lval '[' val ']'
1741 | min_lval '.' ID
1742 | compound_lval '[' val ']'
1743 | compound_lval '.' ID
1745 This is not part of the original SIMPLE definition, which separates
1746 array and member references, but it seems reasonable to handle them
1747 together. Also, this way we don't run into problems with union
1748 aliasing; gcc requires that for accesses through a union to alias, the
1749 union reference must be explicit, which was not always the case when we
1750 were splitting up array and member refs.
1752 PRE_P points to the list where side effects that must happen before
1753 *EXPR_P should be stored.
1755 POST_P points to the list where side effects that must happen after
1756 *EXPR_P should be stored. */
1758 static enum gimplify_status
1759 gimplify_compound_lval (tree *expr_p, tree *pre_p,
1760 tree *post_p, fallback_t fallback)
1762 tree *p;
1763 VEC(tree,heap) *stack;
1764 enum gimplify_status ret = GS_OK, tret;
1765 int i;
1767 /* Create a stack of the subexpressions so later we can walk them in
1768 order from inner to outer. */
1769 stack = VEC_alloc (tree, heap, 10);
1771 /* We can handle anything that get_inner_reference can deal with. */
1772 for (p = expr_p; ; p = &TREE_OPERAND (*p, 0))
1774 restart:
1775 /* Fold INDIRECT_REFs now to turn them into ARRAY_REFs. */
1776 if (TREE_CODE (*p) == INDIRECT_REF)
1777 *p = fold_indirect_ref (*p);
1779 if (handled_component_p (*p))
1781 /* Expand DECL_VALUE_EXPR now. In some cases that may expose
1782 additional COMPONENT_REFs. */
1783 else if ((TREE_CODE (*p) == VAR_DECL || TREE_CODE (*p) == PARM_DECL)
1784 && gimplify_var_or_parm_decl (p) == GS_OK)
1785 goto restart;
1786 else
1787 break;
1789 VEC_safe_push (tree, heap, stack, *p);
1792 gcc_assert (VEC_length (tree, stack));
1794 /* Now STACK is a stack of pointers to all the refs we've walked through
1795 and P points to the innermost expression.
1797 Java requires that we elaborated nodes in source order. That
1798 means we must gimplify the inner expression followed by each of
1799 the indices, in order. But we can't gimplify the inner
1800 expression until we deal with any variable bounds, sizes, or
1801 positions in order to deal with PLACEHOLDER_EXPRs.
1803 So we do this in three steps. First we deal with the annotations
1804 for any variables in the components, then we gimplify the base,
1805 then we gimplify any indices, from left to right. */
1806 for (i = VEC_length (tree, stack) - 1; i >= 0; i--)
1808 tree t = VEC_index (tree, stack, i);
1810 if (TREE_CODE (t) == ARRAY_REF || TREE_CODE (t) == ARRAY_RANGE_REF)
1812 /* Gimplify the low bound and element type size and put them into
1813 the ARRAY_REF. If these values are set, they have already been
1814 gimplified. */
1815 if (!TREE_OPERAND (t, 2))
1817 tree low = unshare_expr (array_ref_low_bound (t));
1818 if (!is_gimple_min_invariant (low))
1820 TREE_OPERAND (t, 2) = low;
1821 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p, post_p,
1822 is_gimple_formal_tmp_reg, fb_rvalue);
1823 ret = MIN (ret, tret);
1827 if (!TREE_OPERAND (t, 3))
1829 tree elmt_type = TREE_TYPE (TREE_TYPE (TREE_OPERAND (t, 0)));
1830 tree elmt_size = unshare_expr (array_ref_element_size (t));
1831 tree factor = size_int (TYPE_ALIGN_UNIT (elmt_type));
1833 /* Divide the element size by the alignment of the element
1834 type (above). */
1835 elmt_size = size_binop (EXACT_DIV_EXPR, elmt_size, factor);
1837 if (!is_gimple_min_invariant (elmt_size))
1839 TREE_OPERAND (t, 3) = elmt_size;
1840 tret = gimplify_expr (&TREE_OPERAND (t, 3), pre_p, post_p,
1841 is_gimple_formal_tmp_reg, fb_rvalue);
1842 ret = MIN (ret, tret);
1846 else if (TREE_CODE (t) == COMPONENT_REF)
1848 /* Set the field offset into T and gimplify it. */
1849 if (!TREE_OPERAND (t, 2))
1851 tree offset = unshare_expr (component_ref_field_offset (t));
1852 tree field = TREE_OPERAND (t, 1);
1853 tree factor
1854 = size_int (DECL_OFFSET_ALIGN (field) / BITS_PER_UNIT);
1856 /* Divide the offset by its alignment. */
1857 offset = size_binop (EXACT_DIV_EXPR, offset, factor);
1859 if (!is_gimple_min_invariant (offset))
1861 TREE_OPERAND (t, 2) = offset;
1862 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p, post_p,
1863 is_gimple_formal_tmp_reg, fb_rvalue);
1864 ret = MIN (ret, tret);
1870 /* Step 2 is to gimplify the base expression. Make sure lvalue is set
1871 so as to match the min_lval predicate. Failure to do so may result
1872 in the creation of large aggregate temporaries. */
1873 tret = gimplify_expr (p, pre_p, post_p, is_gimple_min_lval,
1874 fallback | fb_lvalue);
1875 ret = MIN (ret, tret);
1877 /* And finally, the indices and operands to BIT_FIELD_REF. During this
1878 loop we also remove any useless conversions. */
1879 for (; VEC_length (tree, stack) > 0; )
1881 tree t = VEC_pop (tree, stack);
1883 if (TREE_CODE (t) == ARRAY_REF || TREE_CODE (t) == ARRAY_RANGE_REF)
1885 /* Gimplify the dimension.
1886 Temporary fix for gcc.c-torture/execute/20040313-1.c.
1887 Gimplify non-constant array indices into a temporary
1888 variable.
1889 FIXME - The real fix is to gimplify post-modify
1890 expressions into a minimal gimple lvalue. However, that
1891 exposes bugs in alias analysis. The alias analyzer does
1892 not handle &PTR->FIELD very well. Will fix after the
1893 branch is merged into mainline (dnovillo 2004-05-03). */
1894 if (!is_gimple_min_invariant (TREE_OPERAND (t, 1)))
1896 tret = gimplify_expr (&TREE_OPERAND (t, 1), pre_p, post_p,
1897 is_gimple_formal_tmp_reg, fb_rvalue);
1898 ret = MIN (ret, tret);
1901 else if (TREE_CODE (t) == BIT_FIELD_REF)
1903 tret = gimplify_expr (&TREE_OPERAND (t, 1), pre_p, post_p,
1904 is_gimple_val, fb_rvalue);
1905 ret = MIN (ret, tret);
1906 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p, post_p,
1907 is_gimple_val, fb_rvalue);
1908 ret = MIN (ret, tret);
1911 STRIP_USELESS_TYPE_CONVERSION (TREE_OPERAND (t, 0));
1913 /* The innermost expression P may have originally had TREE_SIDE_EFFECTS
1914 set which would have caused all the outer expressions in EXPR_P
1915 leading to P to also have had TREE_SIDE_EFFECTS set. */
1916 recalculate_side_effects (t);
1919 tret = gimplify_expr (p, pre_p, post_p, is_gimple_min_lval, fallback);
1920 ret = MIN (ret, tret);
1922 /* If the outermost expression is a COMPONENT_REF, canonicalize its type. */
1923 if ((fallback & fb_rvalue) && TREE_CODE (*expr_p) == COMPONENT_REF)
1925 canonicalize_component_ref (expr_p);
1926 ret = MIN (ret, GS_OK);
1929 VEC_free (tree, heap, stack);
1931 return ret;
1934 /* Gimplify the self modifying expression pointed to by EXPR_P
1935 (++, --, +=, -=).
1937 PRE_P points to the list where side effects that must happen before
1938 *EXPR_P should be stored.
1940 POST_P points to the list where side effects that must happen after
1941 *EXPR_P should be stored.
1943 WANT_VALUE is nonzero iff we want to use the value of this expression
1944 in another expression. */
1946 static enum gimplify_status
1947 gimplify_self_mod_expr (tree *expr_p, tree *pre_p, tree *post_p,
1948 bool want_value)
1950 enum tree_code code;
1951 tree lhs, lvalue, rhs, t1, post = NULL, *orig_post_p = post_p;
1952 bool postfix;
1953 enum tree_code arith_code;
1954 enum gimplify_status ret;
1956 code = TREE_CODE (*expr_p);
1958 gcc_assert (code == POSTINCREMENT_EXPR || code == POSTDECREMENT_EXPR
1959 || code == PREINCREMENT_EXPR || code == PREDECREMENT_EXPR);
1961 /* Prefix or postfix? */
1962 if (code == POSTINCREMENT_EXPR || code == POSTDECREMENT_EXPR)
1963 /* Faster to treat as prefix if result is not used. */
1964 postfix = want_value;
1965 else
1966 postfix = false;
1968 /* For postfix, make sure the inner expression's post side effects
1969 are executed after side effects from this expression. */
1970 if (postfix)
1971 post_p = &post;
1973 /* Add or subtract? */
1974 if (code == PREINCREMENT_EXPR || code == POSTINCREMENT_EXPR)
1975 arith_code = PLUS_EXPR;
1976 else
1977 arith_code = MINUS_EXPR;
1979 /* Gimplify the LHS into a GIMPLE lvalue. */
1980 lvalue = TREE_OPERAND (*expr_p, 0);
1981 ret = gimplify_expr (&lvalue, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
1982 if (ret == GS_ERROR)
1983 return ret;
1985 /* Extract the operands to the arithmetic operation. */
1986 lhs = lvalue;
1987 rhs = TREE_OPERAND (*expr_p, 1);
1989 /* For postfix operator, we evaluate the LHS to an rvalue and then use
1990 that as the result value and in the postqueue operation. */
1991 if (postfix)
1993 ret = gimplify_expr (&lhs, pre_p, post_p, is_gimple_val, fb_rvalue);
1994 if (ret == GS_ERROR)
1995 return ret;
1998 /* For POINTERs increment, use POINTER_PLUS_EXPR. */
1999 if (POINTER_TYPE_P (TREE_TYPE (lhs)))
2001 rhs = fold_convert (sizetype, rhs);
2002 if (arith_code == MINUS_EXPR)
2003 rhs = fold_build1 (NEGATE_EXPR, TREE_TYPE (rhs), rhs);
2004 arith_code = POINTER_PLUS_EXPR;
2007 t1 = build2 (arith_code, TREE_TYPE (*expr_p), lhs, rhs);
2008 t1 = build_gimple_modify_stmt (lvalue, t1);
2010 if (postfix)
2012 gimplify_and_add (t1, orig_post_p);
2013 append_to_statement_list (post, orig_post_p);
2014 *expr_p = lhs;
2015 return GS_ALL_DONE;
2017 else
2019 *expr_p = t1;
2020 return GS_OK;
2024 /* If *EXPR_P has a variable sized type, wrap it in a WITH_SIZE_EXPR. */
2026 static void
2027 maybe_with_size_expr (tree *expr_p)
2029 tree expr = *expr_p;
2030 tree type = TREE_TYPE (expr);
2031 tree size;
2033 /* If we've already wrapped this or the type is error_mark_node, we can't do
2034 anything. */
2035 if (TREE_CODE (expr) == WITH_SIZE_EXPR
2036 || type == error_mark_node)
2037 return;
2039 /* If the size isn't known or is a constant, we have nothing to do. */
2040 size = TYPE_SIZE_UNIT (type);
2041 if (!size || TREE_CODE (size) == INTEGER_CST)
2042 return;
2044 /* Otherwise, make a WITH_SIZE_EXPR. */
2045 size = unshare_expr (size);
2046 size = SUBSTITUTE_PLACEHOLDER_IN_EXPR (size, expr);
2047 *expr_p = build2 (WITH_SIZE_EXPR, type, expr, size);
2050 /* Subroutine of gimplify_call_expr: Gimplify a single argument. */
2052 static enum gimplify_status
2053 gimplify_arg (tree *expr_p, tree *pre_p)
2055 bool (*test) (tree);
2056 fallback_t fb;
2058 /* In general, we allow lvalues for function arguments to avoid
2059 extra overhead of copying large aggregates out of even larger
2060 aggregates into temporaries only to copy the temporaries to
2061 the argument list. Make optimizers happy by pulling out to
2062 temporaries those types that fit in registers. */
2063 if (is_gimple_reg_type (TREE_TYPE (*expr_p)))
2064 test = is_gimple_val, fb = fb_rvalue;
2065 else
2066 test = is_gimple_lvalue, fb = fb_either;
2068 /* If this is a variable sized type, we must remember the size. */
2069 maybe_with_size_expr (expr_p);
2071 /* There is a sequence point before a function call. Side effects in
2072 the argument list must occur before the actual call. So, when
2073 gimplifying arguments, force gimplify_expr to use an internal
2074 post queue which is then appended to the end of PRE_P. */
2075 return gimplify_expr (expr_p, pre_p, NULL, test, fb);
2078 /* Gimplify the CALL_EXPR node pointed to by EXPR_P. PRE_P points to the
2079 list where side effects that must happen before *EXPR_P should be stored.
2080 WANT_VALUE is true if the result of the call is desired. */
2082 static enum gimplify_status
2083 gimplify_call_expr (tree *expr_p, tree *pre_p, bool want_value)
2085 tree decl, parms, p;
2086 enum gimplify_status ret;
2087 int i, nargs;
2089 gcc_assert (TREE_CODE (*expr_p) == CALL_EXPR);
2091 /* For reliable diagnostics during inlining, it is necessary that
2092 every call_expr be annotated with file and line. */
2093 if (! EXPR_HAS_LOCATION (*expr_p))
2094 SET_EXPR_LOCATION (*expr_p, input_location);
2096 /* This may be a call to a builtin function.
2098 Builtin function calls may be transformed into different
2099 (and more efficient) builtin function calls under certain
2100 circumstances. Unfortunately, gimplification can muck things
2101 up enough that the builtin expanders are not aware that certain
2102 transformations are still valid.
2104 So we attempt transformation/gimplification of the call before
2105 we gimplify the CALL_EXPR. At this time we do not manage to
2106 transform all calls in the same manner as the expanders do, but
2107 we do transform most of them. */
2108 decl = get_callee_fndecl (*expr_p);
2109 if (decl && DECL_BUILT_IN (decl))
2111 tree new = fold_call_expr (*expr_p, !want_value);
2113 if (new && new != *expr_p)
2115 /* There was a transformation of this call which computes the
2116 same value, but in a more efficient way. Return and try
2117 again. */
2118 *expr_p = new;
2119 return GS_OK;
2122 if (DECL_BUILT_IN_CLASS (decl) == BUILT_IN_NORMAL
2123 && DECL_FUNCTION_CODE (decl) == BUILT_IN_VA_START)
2125 if (call_expr_nargs (*expr_p) < 2)
2127 error ("too few arguments to function %<va_start%>");
2128 *expr_p = build_empty_stmt ();
2129 return GS_OK;
2132 if (fold_builtin_next_arg (*expr_p, true))
2134 *expr_p = build_empty_stmt ();
2135 return GS_OK;
2137 /* Avoid gimplifying the second argument to va_start, which needs
2138 to be the plain PARM_DECL. */
2139 return gimplify_arg (&CALL_EXPR_ARG (*expr_p, 0), pre_p);
2143 /* There is a sequence point before the call, so any side effects in
2144 the calling expression must occur before the actual call. Force
2145 gimplify_expr to use an internal post queue. */
2146 ret = gimplify_expr (&CALL_EXPR_FN (*expr_p), pre_p, NULL,
2147 is_gimple_call_addr, fb_rvalue);
2149 nargs = call_expr_nargs (*expr_p);
2151 /* Get argument types for verification. */
2152 decl = get_callee_fndecl (*expr_p);
2153 parms = NULL_TREE;
2154 if (decl)
2155 parms = TYPE_ARG_TYPES (TREE_TYPE (decl));
2156 else if (POINTER_TYPE_P (TREE_TYPE (CALL_EXPR_FN (*expr_p))))
2157 parms = TYPE_ARG_TYPES (TREE_TYPE (TREE_TYPE (CALL_EXPR_FN (*expr_p))));
2159 /* Verify if the type of the argument matches that of the function
2160 declaration. If we cannot verify this or there is a mismatch,
2161 mark the call expression so it doesn't get inlined later. */
2162 if (decl && DECL_ARGUMENTS (decl))
2164 for (i = 0, p = DECL_ARGUMENTS (decl); i < nargs;
2165 i++, p = TREE_CHAIN (p))
2167 /* We cannot distinguish a varargs function from the case
2168 of excess parameters, still deferring the inlining decision
2169 to the callee is possible. */
2170 if (!p)
2171 break;
2172 if (p == error_mark_node
2173 || CALL_EXPR_ARG (*expr_p, i) == error_mark_node
2174 || !fold_convertible_p (DECL_ARG_TYPE (p),
2175 CALL_EXPR_ARG (*expr_p, i)))
2177 CALL_CANNOT_INLINE_P (*expr_p) = 1;
2178 break;
2182 else if (parms)
2184 for (i = 0, p = parms; i < nargs; i++, p = TREE_CHAIN (p))
2186 /* If this is a varargs function defer inlining decision
2187 to callee. */
2188 if (!p)
2189 break;
2190 if (TREE_VALUE (p) == error_mark_node
2191 || CALL_EXPR_ARG (*expr_p, i) == error_mark_node
2192 || TREE_CODE (TREE_VALUE (p)) == VOID_TYPE
2193 || !fold_convertible_p (TREE_VALUE (p),
2194 CALL_EXPR_ARG (*expr_p, i)))
2196 CALL_CANNOT_INLINE_P (*expr_p) = 1;
2197 break;
2201 else
2203 if (nargs != 0)
2204 CALL_CANNOT_INLINE_P (*expr_p) = 1;
2205 i = 0;
2206 p = NULL_TREE;
2209 /* If the last argument is __builtin_va_arg_pack () and it is not
2210 passed as a named argument, decrease the number of CALL_EXPR
2211 arguments and set instead the CALL_EXPR_VA_ARG_PACK flag. */
2212 if (!p
2213 && i < nargs
2214 && TREE_CODE (CALL_EXPR_ARG (*expr_p, nargs - 1)) == CALL_EXPR)
2216 tree last_arg = CALL_EXPR_ARG (*expr_p, nargs - 1);
2217 tree last_arg_fndecl = get_callee_fndecl (last_arg);
2219 if (last_arg_fndecl
2220 && TREE_CODE (last_arg_fndecl) == FUNCTION_DECL
2221 && DECL_BUILT_IN_CLASS (last_arg_fndecl) == BUILT_IN_NORMAL
2222 && DECL_FUNCTION_CODE (last_arg_fndecl) == BUILT_IN_VA_ARG_PACK)
2224 tree call = *expr_p;
2226 --nargs;
2227 *expr_p = build_call_array (TREE_TYPE (call), CALL_EXPR_FN (call),
2228 nargs, CALL_EXPR_ARGP (call));
2229 /* Copy all CALL_EXPR flags, locus and block, except
2230 CALL_EXPR_VA_ARG_PACK flag. */
2231 CALL_EXPR_STATIC_CHAIN (*expr_p) = CALL_EXPR_STATIC_CHAIN (call);
2232 CALL_EXPR_TAILCALL (*expr_p) = CALL_EXPR_TAILCALL (call);
2233 CALL_EXPR_RETURN_SLOT_OPT (*expr_p)
2234 = CALL_EXPR_RETURN_SLOT_OPT (call);
2235 CALL_FROM_THUNK_P (*expr_p) = CALL_FROM_THUNK_P (call);
2236 CALL_CANNOT_INLINE_P (*expr_p)
2237 = CALL_CANNOT_INLINE_P (call);
2238 TREE_NOTHROW (*expr_p) = TREE_NOTHROW (call);
2239 SET_EXPR_LOCUS (*expr_p, EXPR_LOCUS (call));
2240 TREE_BLOCK (*expr_p) = TREE_BLOCK (call);
2241 /* Set CALL_EXPR_VA_ARG_PACK. */
2242 CALL_EXPR_VA_ARG_PACK (*expr_p) = 1;
2246 /* Finally, gimplify the function arguments. */
2247 for (i = (PUSH_ARGS_REVERSED ? nargs - 1 : 0);
2248 PUSH_ARGS_REVERSED ? i >= 0 : i < nargs;
2249 PUSH_ARGS_REVERSED ? i-- : i++)
2251 enum gimplify_status t;
2253 t = gimplify_arg (&CALL_EXPR_ARG (*expr_p, i), pre_p);
2255 if (t == GS_ERROR)
2256 ret = GS_ERROR;
2259 /* Try this again in case gimplification exposed something. */
2260 if (ret != GS_ERROR)
2262 tree new = fold_call_expr (*expr_p, !want_value);
2264 if (new && new != *expr_p)
2266 /* There was a transformation of this call which computes the
2267 same value, but in a more efficient way. Return and try
2268 again. */
2269 *expr_p = new;
2270 return GS_OK;
2274 /* If the function is "const" or "pure", then clear TREE_SIDE_EFFECTS on its
2275 decl. This allows us to eliminate redundant or useless
2276 calls to "const" functions. */
2277 if (TREE_CODE (*expr_p) == CALL_EXPR
2278 && (call_expr_flags (*expr_p) & (ECF_CONST | ECF_PURE)))
2279 TREE_SIDE_EFFECTS (*expr_p) = 0;
2281 return ret;
2284 /* Handle shortcut semantics in the predicate operand of a COND_EXPR by
2285 rewriting it into multiple COND_EXPRs, and possibly GOTO_EXPRs.
2287 TRUE_LABEL_P and FALSE_LABEL_P point to the labels to jump to if the
2288 condition is true or false, respectively. If null, we should generate
2289 our own to skip over the evaluation of this specific expression.
2291 This function is the tree equivalent of do_jump.
2293 shortcut_cond_r should only be called by shortcut_cond_expr. */
2295 static tree
2296 shortcut_cond_r (tree pred, tree *true_label_p, tree *false_label_p)
2298 tree local_label = NULL_TREE;
2299 tree t, expr = NULL;
2301 /* OK, it's not a simple case; we need to pull apart the COND_EXPR to
2302 retain the shortcut semantics. Just insert the gotos here;
2303 shortcut_cond_expr will append the real blocks later. */
2304 if (TREE_CODE (pred) == TRUTH_ANDIF_EXPR)
2306 /* Turn if (a && b) into
2308 if (a); else goto no;
2309 if (b) goto yes; else goto no;
2310 (no:) */
2312 if (false_label_p == NULL)
2313 false_label_p = &local_label;
2315 t = shortcut_cond_r (TREE_OPERAND (pred, 0), NULL, false_label_p);
2316 append_to_statement_list (t, &expr);
2318 t = shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p,
2319 false_label_p);
2320 append_to_statement_list (t, &expr);
2322 else if (TREE_CODE (pred) == TRUTH_ORIF_EXPR)
2324 /* Turn if (a || b) into
2326 if (a) goto yes;
2327 if (b) goto yes; else goto no;
2328 (yes:) */
2330 if (true_label_p == NULL)
2331 true_label_p = &local_label;
2333 t = shortcut_cond_r (TREE_OPERAND (pred, 0), true_label_p, NULL);
2334 append_to_statement_list (t, &expr);
2336 t = shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p,
2337 false_label_p);
2338 append_to_statement_list (t, &expr);
2340 else if (TREE_CODE (pred) == COND_EXPR)
2342 /* As long as we're messing with gotos, turn if (a ? b : c) into
2343 if (a)
2344 if (b) goto yes; else goto no;
2345 else
2346 if (c) goto yes; else goto no; */
2347 expr = build3 (COND_EXPR, void_type_node, TREE_OPERAND (pred, 0),
2348 shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p,
2349 false_label_p),
2350 shortcut_cond_r (TREE_OPERAND (pred, 2), true_label_p,
2351 false_label_p));
2353 else
2355 expr = build3 (COND_EXPR, void_type_node, pred,
2356 build_and_jump (true_label_p),
2357 build_and_jump (false_label_p));
2360 if (local_label)
2362 t = build1 (LABEL_EXPR, void_type_node, local_label);
2363 append_to_statement_list (t, &expr);
2366 return expr;
2369 static tree
2370 shortcut_cond_expr (tree expr)
2372 tree pred = TREE_OPERAND (expr, 0);
2373 tree then_ = TREE_OPERAND (expr, 1);
2374 tree else_ = TREE_OPERAND (expr, 2);
2375 tree true_label, false_label, end_label, t;
2376 tree *true_label_p;
2377 tree *false_label_p;
2378 bool emit_end, emit_false, jump_over_else;
2379 bool then_se = then_ && TREE_SIDE_EFFECTS (then_);
2380 bool else_se = else_ && TREE_SIDE_EFFECTS (else_);
2382 /* First do simple transformations. */
2383 if (!else_se)
2385 /* If there is no 'else', turn (a && b) into if (a) if (b). */
2386 while (TREE_CODE (pred) == TRUTH_ANDIF_EXPR)
2388 TREE_OPERAND (expr, 0) = TREE_OPERAND (pred, 1);
2389 then_ = shortcut_cond_expr (expr);
2390 then_se = then_ && TREE_SIDE_EFFECTS (then_);
2391 pred = TREE_OPERAND (pred, 0);
2392 expr = build3 (COND_EXPR, void_type_node, pred, then_, NULL_TREE);
2395 if (!then_se)
2397 /* If there is no 'then', turn
2398 if (a || b); else d
2399 into
2400 if (a); else if (b); else d. */
2401 while (TREE_CODE (pred) == TRUTH_ORIF_EXPR)
2403 TREE_OPERAND (expr, 0) = TREE_OPERAND (pred, 1);
2404 else_ = shortcut_cond_expr (expr);
2405 else_se = else_ && TREE_SIDE_EFFECTS (else_);
2406 pred = TREE_OPERAND (pred, 0);
2407 expr = build3 (COND_EXPR, void_type_node, pred, NULL_TREE, else_);
2411 /* If we're done, great. */
2412 if (TREE_CODE (pred) != TRUTH_ANDIF_EXPR
2413 && TREE_CODE (pred) != TRUTH_ORIF_EXPR)
2414 return expr;
2416 /* Otherwise we need to mess with gotos. Change
2417 if (a) c; else d;
2419 if (a); else goto no;
2420 c; goto end;
2421 no: d; end:
2422 and recursively gimplify the condition. */
2424 true_label = false_label = end_label = NULL_TREE;
2426 /* If our arms just jump somewhere, hijack those labels so we don't
2427 generate jumps to jumps. */
2429 if (then_
2430 && TREE_CODE (then_) == GOTO_EXPR
2431 && TREE_CODE (GOTO_DESTINATION (then_)) == LABEL_DECL)
2433 true_label = GOTO_DESTINATION (then_);
2434 then_ = NULL;
2435 then_se = false;
2438 if (else_
2439 && TREE_CODE (else_) == GOTO_EXPR
2440 && TREE_CODE (GOTO_DESTINATION (else_)) == LABEL_DECL)
2442 false_label = GOTO_DESTINATION (else_);
2443 else_ = NULL;
2444 else_se = false;
2447 /* If we aren't hijacking a label for the 'then' branch, it falls through. */
2448 if (true_label)
2449 true_label_p = &true_label;
2450 else
2451 true_label_p = NULL;
2453 /* The 'else' branch also needs a label if it contains interesting code. */
2454 if (false_label || else_se)
2455 false_label_p = &false_label;
2456 else
2457 false_label_p = NULL;
2459 /* If there was nothing else in our arms, just forward the label(s). */
2460 if (!then_se && !else_se)
2461 return shortcut_cond_r (pred, true_label_p, false_label_p);
2463 /* If our last subexpression already has a terminal label, reuse it. */
2464 if (else_se)
2465 expr = expr_last (else_);
2466 else if (then_se)
2467 expr = expr_last (then_);
2468 else
2469 expr = NULL;
2470 if (expr && TREE_CODE (expr) == LABEL_EXPR)
2471 end_label = LABEL_EXPR_LABEL (expr);
2473 /* If we don't care about jumping to the 'else' branch, jump to the end
2474 if the condition is false. */
2475 if (!false_label_p)
2476 false_label_p = &end_label;
2478 /* We only want to emit these labels if we aren't hijacking them. */
2479 emit_end = (end_label == NULL_TREE);
2480 emit_false = (false_label == NULL_TREE);
2482 /* We only emit the jump over the else clause if we have to--if the
2483 then clause may fall through. Otherwise we can wind up with a
2484 useless jump and a useless label at the end of gimplified code,
2485 which will cause us to think that this conditional as a whole
2486 falls through even if it doesn't. If we then inline a function
2487 which ends with such a condition, that can cause us to issue an
2488 inappropriate warning about control reaching the end of a
2489 non-void function. */
2490 jump_over_else = block_may_fallthru (then_);
2492 pred = shortcut_cond_r (pred, true_label_p, false_label_p);
2494 expr = NULL;
2495 append_to_statement_list (pred, &expr);
2497 append_to_statement_list (then_, &expr);
2498 if (else_se)
2500 if (jump_over_else)
2502 t = build_and_jump (&end_label);
2503 append_to_statement_list (t, &expr);
2505 if (emit_false)
2507 t = build1 (LABEL_EXPR, void_type_node, false_label);
2508 append_to_statement_list (t, &expr);
2510 append_to_statement_list (else_, &expr);
2512 if (emit_end && end_label)
2514 t = build1 (LABEL_EXPR, void_type_node, end_label);
2515 append_to_statement_list (t, &expr);
2518 return expr;
2521 /* EXPR is used in a boolean context; make sure it has BOOLEAN_TYPE. */
2523 tree
2524 gimple_boolify (tree expr)
2526 tree type = TREE_TYPE (expr);
2528 if (TREE_CODE (type) == BOOLEAN_TYPE)
2529 return expr;
2531 switch (TREE_CODE (expr))
2533 case TRUTH_AND_EXPR:
2534 case TRUTH_OR_EXPR:
2535 case TRUTH_XOR_EXPR:
2536 case TRUTH_ANDIF_EXPR:
2537 case TRUTH_ORIF_EXPR:
2538 /* Also boolify the arguments of truth exprs. */
2539 TREE_OPERAND (expr, 1) = gimple_boolify (TREE_OPERAND (expr, 1));
2540 /* FALLTHRU */
2542 case TRUTH_NOT_EXPR:
2543 TREE_OPERAND (expr, 0) = gimple_boolify (TREE_OPERAND (expr, 0));
2544 /* FALLTHRU */
2546 case EQ_EXPR: case NE_EXPR:
2547 case LE_EXPR: case GE_EXPR: case LT_EXPR: case GT_EXPR:
2548 /* These expressions always produce boolean results. */
2549 TREE_TYPE (expr) = boolean_type_node;
2550 return expr;
2552 default:
2553 /* Other expressions that get here must have boolean values, but
2554 might need to be converted to the appropriate mode. */
2555 return fold_convert (boolean_type_node, expr);
2559 /* Given a conditional expression *EXPR_P without side effects, gimplify
2560 its operands. New statements are inserted to PRE_P. */
2562 static enum gimplify_status
2563 gimplify_pure_cond_expr (tree *expr_p, tree *pre_p)
2565 tree expr = *expr_p, cond;
2566 enum gimplify_status ret, tret;
2567 enum tree_code code;
2569 cond = gimple_boolify (COND_EXPR_COND (expr));
2571 /* We need to handle && and || specially, as their gimplification
2572 creates pure cond_expr, thus leading to an infinite cycle otherwise. */
2573 code = TREE_CODE (cond);
2574 if (code == TRUTH_ANDIF_EXPR)
2575 TREE_SET_CODE (cond, TRUTH_AND_EXPR);
2576 else if (code == TRUTH_ORIF_EXPR)
2577 TREE_SET_CODE (cond, TRUTH_OR_EXPR);
2578 ret = gimplify_expr (&cond, pre_p, NULL,
2579 is_gimple_condexpr, fb_rvalue);
2580 COND_EXPR_COND (*expr_p) = cond;
2582 tret = gimplify_expr (&COND_EXPR_THEN (expr), pre_p, NULL,
2583 is_gimple_val, fb_rvalue);
2584 ret = MIN (ret, tret);
2585 tret = gimplify_expr (&COND_EXPR_ELSE (expr), pre_p, NULL,
2586 is_gimple_val, fb_rvalue);
2588 return MIN (ret, tret);
2591 /* Returns true if evaluating EXPR could trap.
2592 EXPR is GENERIC, while tree_could_trap_p can be called
2593 only on GIMPLE. */
2595 static bool
2596 generic_expr_could_trap_p (tree expr)
2598 unsigned i, n;
2600 if (!expr || is_gimple_val (expr))
2601 return false;
2603 if (!EXPR_P (expr) || tree_could_trap_p (expr))
2604 return true;
2606 n = TREE_OPERAND_LENGTH (expr);
2607 for (i = 0; i < n; i++)
2608 if (generic_expr_could_trap_p (TREE_OPERAND (expr, i)))
2609 return true;
2611 return false;
2614 /* Convert the conditional expression pointed to by EXPR_P '(p) ? a : b;'
2615 into
2617 if (p) if (p)
2618 t1 = a; a;
2619 else or else
2620 t1 = b; b;
2623 The second form is used when *EXPR_P is of type void.
2625 TARGET is the tree for T1 above.
2627 PRE_P points to the list where side effects that must happen before
2628 *EXPR_P should be stored. */
2630 static enum gimplify_status
2631 gimplify_cond_expr (tree *expr_p, tree *pre_p, fallback_t fallback)
2633 tree expr = *expr_p;
2634 tree tmp, tmp2, type;
2635 enum gimplify_status ret;
2637 type = TREE_TYPE (expr);
2639 /* If this COND_EXPR has a value, copy the values into a temporary within
2640 the arms. */
2641 if (! VOID_TYPE_P (type))
2643 tree result;
2645 /* If an rvalue is ok or we do not require an lvalue, avoid creating
2646 an addressable temporary. */
2647 if (((fallback & fb_rvalue)
2648 || !(fallback & fb_lvalue))
2649 && !TREE_ADDRESSABLE (type))
2651 if (gimplify_ctxp->allow_rhs_cond_expr
2652 /* If either branch has side effects or could trap, it can't be
2653 evaluated unconditionally. */
2654 && !TREE_SIDE_EFFECTS (TREE_OPERAND (*expr_p, 1))
2655 && !generic_expr_could_trap_p (TREE_OPERAND (*expr_p, 1))
2656 && !TREE_SIDE_EFFECTS (TREE_OPERAND (*expr_p, 2))
2657 && !generic_expr_could_trap_p (TREE_OPERAND (*expr_p, 2)))
2658 return gimplify_pure_cond_expr (expr_p, pre_p);
2660 result = tmp2 = tmp = create_tmp_var (TREE_TYPE (expr), "iftmp");
2661 ret = GS_ALL_DONE;
2663 else
2665 tree type = build_pointer_type (TREE_TYPE (expr));
2667 if (TREE_TYPE (TREE_OPERAND (expr, 1)) != void_type_node)
2668 TREE_OPERAND (expr, 1) =
2669 build_fold_addr_expr (TREE_OPERAND (expr, 1));
2671 if (TREE_TYPE (TREE_OPERAND (expr, 2)) != void_type_node)
2672 TREE_OPERAND (expr, 2) =
2673 build_fold_addr_expr (TREE_OPERAND (expr, 2));
2675 tmp2 = tmp = create_tmp_var (type, "iftmp");
2677 expr = build3 (COND_EXPR, void_type_node, TREE_OPERAND (expr, 0),
2678 TREE_OPERAND (expr, 1), TREE_OPERAND (expr, 2));
2680 result = build_fold_indirect_ref (tmp);
2681 ret = GS_ALL_DONE;
2684 /* Build the then clause, 't1 = a;'. But don't build an assignment
2685 if this branch is void; in C++ it can be, if it's a throw. */
2686 if (TREE_TYPE (TREE_OPERAND (expr, 1)) != void_type_node)
2687 TREE_OPERAND (expr, 1)
2688 = build_gimple_modify_stmt (tmp, TREE_OPERAND (expr, 1));
2690 /* Build the else clause, 't1 = b;'. */
2691 if (TREE_TYPE (TREE_OPERAND (expr, 2)) != void_type_node)
2692 TREE_OPERAND (expr, 2)
2693 = build_gimple_modify_stmt (tmp2, TREE_OPERAND (expr, 2));
2695 TREE_TYPE (expr) = void_type_node;
2696 recalculate_side_effects (expr);
2698 /* Move the COND_EXPR to the prequeue. */
2699 gimplify_and_add (expr, pre_p);
2701 *expr_p = result;
2702 return ret;
2705 /* Make sure the condition has BOOLEAN_TYPE. */
2706 TREE_OPERAND (expr, 0) = gimple_boolify (TREE_OPERAND (expr, 0));
2708 /* Break apart && and || conditions. */
2709 if (TREE_CODE (TREE_OPERAND (expr, 0)) == TRUTH_ANDIF_EXPR
2710 || TREE_CODE (TREE_OPERAND (expr, 0)) == TRUTH_ORIF_EXPR)
2712 expr = shortcut_cond_expr (expr);
2714 if (expr != *expr_p)
2716 *expr_p = expr;
2718 /* We can't rely on gimplify_expr to re-gimplify the expanded
2719 form properly, as cleanups might cause the target labels to be
2720 wrapped in a TRY_FINALLY_EXPR. To prevent that, we need to
2721 set up a conditional context. */
2722 gimple_push_condition ();
2723 gimplify_stmt (expr_p);
2724 gimple_pop_condition (pre_p);
2726 return GS_ALL_DONE;
2730 /* Now do the normal gimplification. */
2731 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, NULL,
2732 is_gimple_condexpr, fb_rvalue);
2734 gimple_push_condition ();
2736 gimplify_to_stmt_list (&TREE_OPERAND (expr, 1));
2737 gimplify_to_stmt_list (&TREE_OPERAND (expr, 2));
2738 recalculate_side_effects (expr);
2740 gimple_pop_condition (pre_p);
2742 if (ret == GS_ERROR)
2744 else if (TREE_SIDE_EFFECTS (TREE_OPERAND (expr, 1)))
2745 ret = GS_ALL_DONE;
2746 else if (TREE_SIDE_EFFECTS (TREE_OPERAND (expr, 2)))
2747 /* Rewrite "if (a); else b" to "if (!a) b" */
2749 TREE_OPERAND (expr, 0) = invert_truthvalue (TREE_OPERAND (expr, 0));
2750 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, NULL,
2751 is_gimple_condexpr, fb_rvalue);
2753 tmp = TREE_OPERAND (expr, 1);
2754 TREE_OPERAND (expr, 1) = TREE_OPERAND (expr, 2);
2755 TREE_OPERAND (expr, 2) = tmp;
2757 else
2758 /* Both arms are empty; replace the COND_EXPR with its predicate. */
2759 expr = TREE_OPERAND (expr, 0);
2761 *expr_p = expr;
2762 return ret;
2765 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
2766 a call to __builtin_memcpy. */
2768 static enum gimplify_status
2769 gimplify_modify_expr_to_memcpy (tree *expr_p, tree size, bool want_value)
2771 tree t, to, to_ptr, from, from_ptr;
2773 to = GENERIC_TREE_OPERAND (*expr_p, 0);
2774 from = GENERIC_TREE_OPERAND (*expr_p, 1);
2776 from_ptr = build_fold_addr_expr (from);
2778 to_ptr = build_fold_addr_expr (to);
2779 t = implicit_built_in_decls[BUILT_IN_MEMCPY];
2780 t = build_call_expr (t, 3, to_ptr, from_ptr, size);
2782 if (want_value)
2784 t = build1 (NOP_EXPR, TREE_TYPE (to_ptr), t);
2785 t = build1 (INDIRECT_REF, TREE_TYPE (to), t);
2788 *expr_p = t;
2789 return GS_OK;
2792 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
2793 a call to __builtin_memset. In this case we know that the RHS is
2794 a CONSTRUCTOR with an empty element list. */
2796 static enum gimplify_status
2797 gimplify_modify_expr_to_memset (tree *expr_p, tree size, bool want_value)
2799 tree t, to, to_ptr;
2801 to = GENERIC_TREE_OPERAND (*expr_p, 0);
2803 to_ptr = build_fold_addr_expr (to);
2804 t = implicit_built_in_decls[BUILT_IN_MEMSET];
2805 t = build_call_expr (t, 3, to_ptr, integer_zero_node, size);
2807 if (want_value)
2809 t = build1 (NOP_EXPR, TREE_TYPE (to_ptr), t);
2810 t = build1 (INDIRECT_REF, TREE_TYPE (to), t);
2813 *expr_p = t;
2814 return GS_OK;
2817 /* A subroutine of gimplify_init_ctor_preeval. Called via walk_tree,
2818 determine, cautiously, if a CONSTRUCTOR overlaps the lhs of an
2819 assignment. Returns non-null if we detect a potential overlap. */
2821 struct gimplify_init_ctor_preeval_data
2823 /* The base decl of the lhs object. May be NULL, in which case we
2824 have to assume the lhs is indirect. */
2825 tree lhs_base_decl;
2827 /* The alias set of the lhs object. */
2828 alias_set_type lhs_alias_set;
2831 static tree
2832 gimplify_init_ctor_preeval_1 (tree *tp, int *walk_subtrees, void *xdata)
2834 struct gimplify_init_ctor_preeval_data *data
2835 = (struct gimplify_init_ctor_preeval_data *) xdata;
2836 tree t = *tp;
2838 /* If we find the base object, obviously we have overlap. */
2839 if (data->lhs_base_decl == t)
2840 return t;
2842 /* If the constructor component is indirect, determine if we have a
2843 potential overlap with the lhs. The only bits of information we
2844 have to go on at this point are addressability and alias sets. */
2845 if (TREE_CODE (t) == INDIRECT_REF
2846 && (!data->lhs_base_decl || TREE_ADDRESSABLE (data->lhs_base_decl))
2847 && alias_sets_conflict_p (data->lhs_alias_set, get_alias_set (t)))
2848 return t;
2850 /* If the constructor component is a call, determine if it can hide a
2851 potential overlap with the lhs through an INDIRECT_REF like above. */
2852 if (TREE_CODE (t) == CALL_EXPR)
2854 tree type, fntype = TREE_TYPE (TREE_TYPE (CALL_EXPR_FN (t)));
2856 for (type = TYPE_ARG_TYPES (fntype); type; type = TREE_CHAIN (type))
2857 if (POINTER_TYPE_P (TREE_VALUE (type))
2858 && (!data->lhs_base_decl || TREE_ADDRESSABLE (data->lhs_base_decl))
2859 && alias_sets_conflict_p (data->lhs_alias_set,
2860 get_alias_set
2861 (TREE_TYPE (TREE_VALUE (type)))))
2862 return t;
2865 if (IS_TYPE_OR_DECL_P (t))
2866 *walk_subtrees = 0;
2867 return NULL;
2870 /* A subroutine of gimplify_init_constructor. Pre-evaluate *EXPR_P,
2871 force values that overlap with the lhs (as described by *DATA)
2872 into temporaries. */
2874 static void
2875 gimplify_init_ctor_preeval (tree *expr_p, tree *pre_p, tree *post_p,
2876 struct gimplify_init_ctor_preeval_data *data)
2878 enum gimplify_status one;
2880 /* If the value is invariant, then there's nothing to pre-evaluate.
2881 But ensure it doesn't have any side-effects since a SAVE_EXPR is
2882 invariant but has side effects and might contain a reference to
2883 the object we're initializing. */
2884 if (TREE_INVARIANT (*expr_p) && !TREE_SIDE_EFFECTS (*expr_p))
2885 return;
2887 /* If the type has non-trivial constructors, we can't pre-evaluate. */
2888 if (TREE_ADDRESSABLE (TREE_TYPE (*expr_p)))
2889 return;
2891 /* Recurse for nested constructors. */
2892 if (TREE_CODE (*expr_p) == CONSTRUCTOR)
2894 unsigned HOST_WIDE_INT ix;
2895 constructor_elt *ce;
2896 VEC(constructor_elt,gc) *v = CONSTRUCTOR_ELTS (*expr_p);
2898 for (ix = 0; VEC_iterate (constructor_elt, v, ix, ce); ix++)
2899 gimplify_init_ctor_preeval (&ce->value, pre_p, post_p, data);
2900 return;
2903 /* If this is a variable sized type, we must remember the size. */
2904 maybe_with_size_expr (expr_p);
2906 /* Gimplify the constructor element to something appropriate for the rhs
2907 of a MODIFY_EXPR. Given that we know the lhs is an aggregate, we know
2908 the gimplifier will consider this a store to memory. Doing this
2909 gimplification now means that we won't have to deal with complicated
2910 language-specific trees, nor trees like SAVE_EXPR that can induce
2911 exponential search behavior. */
2912 one = gimplify_expr (expr_p, pre_p, post_p, is_gimple_mem_rhs, fb_rvalue);
2913 if (one == GS_ERROR)
2915 *expr_p = NULL;
2916 return;
2919 /* If we gimplified to a bare decl, we can be sure that it doesn't overlap
2920 with the lhs, since "a = { .x=a }" doesn't make sense. This will
2921 always be true for all scalars, since is_gimple_mem_rhs insists on a
2922 temporary variable for them. */
2923 if (DECL_P (*expr_p))
2924 return;
2926 /* If this is of variable size, we have no choice but to assume it doesn't
2927 overlap since we can't make a temporary for it. */
2928 if (TREE_CODE (TYPE_SIZE (TREE_TYPE (*expr_p))) != INTEGER_CST)
2929 return;
2931 /* Otherwise, we must search for overlap ... */
2932 if (!walk_tree (expr_p, gimplify_init_ctor_preeval_1, data, NULL))
2933 return;
2935 /* ... and if found, force the value into a temporary. */
2936 *expr_p = get_formal_tmp_var (*expr_p, pre_p);
2939 /* A subroutine of gimplify_init_ctor_eval. Create a loop for
2940 a RANGE_EXPR in a CONSTRUCTOR for an array.
2942 var = lower;
2943 loop_entry:
2944 object[var] = value;
2945 if (var == upper)
2946 goto loop_exit;
2947 var = var + 1;
2948 goto loop_entry;
2949 loop_exit:
2951 We increment var _after_ the loop exit check because we might otherwise
2952 fail if upper == TYPE_MAX_VALUE (type for upper).
2954 Note that we never have to deal with SAVE_EXPRs here, because this has
2955 already been taken care of for us, in gimplify_init_ctor_preeval(). */
2957 static void gimplify_init_ctor_eval (tree, VEC(constructor_elt,gc) *,
2958 tree *, bool);
2960 static void
2961 gimplify_init_ctor_eval_range (tree object, tree lower, tree upper,
2962 tree value, tree array_elt_type,
2963 tree *pre_p, bool cleared)
2965 tree loop_entry_label, loop_exit_label;
2966 tree var, var_type, cref, tmp;
2968 loop_entry_label = create_artificial_label ();
2969 loop_exit_label = create_artificial_label ();
2971 /* Create and initialize the index variable. */
2972 var_type = TREE_TYPE (upper);
2973 var = create_tmp_var (var_type, NULL);
2974 append_to_statement_list (build_gimple_modify_stmt (var, lower), pre_p);
2976 /* Add the loop entry label. */
2977 append_to_statement_list (build1 (LABEL_EXPR,
2978 void_type_node,
2979 loop_entry_label),
2980 pre_p);
2982 /* Build the reference. */
2983 cref = build4 (ARRAY_REF, array_elt_type, unshare_expr (object),
2984 var, NULL_TREE, NULL_TREE);
2986 /* If we are a constructor, just call gimplify_init_ctor_eval to do
2987 the store. Otherwise just assign value to the reference. */
2989 if (TREE_CODE (value) == CONSTRUCTOR)
2990 /* NB we might have to call ourself recursively through
2991 gimplify_init_ctor_eval if the value is a constructor. */
2992 gimplify_init_ctor_eval (cref, CONSTRUCTOR_ELTS (value),
2993 pre_p, cleared);
2994 else
2995 append_to_statement_list (build_gimple_modify_stmt (cref, value), pre_p);
2997 /* We exit the loop when the index var is equal to the upper bound. */
2998 gimplify_and_add (build3 (COND_EXPR, void_type_node,
2999 build2 (EQ_EXPR, boolean_type_node,
3000 var, upper),
3001 build1 (GOTO_EXPR,
3002 void_type_node,
3003 loop_exit_label),
3004 NULL_TREE),
3005 pre_p);
3007 /* Otherwise, increment the index var... */
3008 tmp = build2 (PLUS_EXPR, var_type, var,
3009 fold_convert (var_type, integer_one_node));
3010 append_to_statement_list (build_gimple_modify_stmt (var, tmp), pre_p);
3012 /* ...and jump back to the loop entry. */
3013 append_to_statement_list (build1 (GOTO_EXPR,
3014 void_type_node,
3015 loop_entry_label),
3016 pre_p);
3018 /* Add the loop exit label. */
3019 append_to_statement_list (build1 (LABEL_EXPR,
3020 void_type_node,
3021 loop_exit_label),
3022 pre_p);
3025 /* Return true if FDECL is accessing a field that is zero sized. */
3027 static bool
3028 zero_sized_field_decl (const_tree fdecl)
3030 if (TREE_CODE (fdecl) == FIELD_DECL && DECL_SIZE (fdecl)
3031 && integer_zerop (DECL_SIZE (fdecl)))
3032 return true;
3033 return false;
3036 /* Return true if TYPE is zero sized. */
3038 static bool
3039 zero_sized_type (const_tree type)
3041 if (AGGREGATE_TYPE_P (type) && TYPE_SIZE (type)
3042 && integer_zerop (TYPE_SIZE (type)))
3043 return true;
3044 return false;
3047 static void tree_to_gimple_tuple (tree *);
3049 /* A subroutine of gimplify_init_constructor. Generate individual
3050 MODIFY_EXPRs for a CONSTRUCTOR. OBJECT is the LHS against which the
3051 assignments should happen. ELTS is the CONSTRUCTOR_ELTS of the
3052 CONSTRUCTOR. CLEARED is true if the entire LHS object has been
3053 zeroed first. */
3055 static void
3056 gimplify_init_ctor_eval (tree object, VEC(constructor_elt,gc) *elts,
3057 tree *pre_p, bool cleared)
3059 tree array_elt_type = NULL;
3060 unsigned HOST_WIDE_INT ix;
3061 tree purpose, value;
3063 if (TREE_CODE (TREE_TYPE (object)) == ARRAY_TYPE)
3064 array_elt_type = TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (object)));
3066 FOR_EACH_CONSTRUCTOR_ELT (elts, ix, purpose, value)
3068 tree cref, init;
3070 /* NULL values are created above for gimplification errors. */
3071 if (value == NULL)
3072 continue;
3074 if (cleared && initializer_zerop (value))
3075 continue;
3077 /* ??? Here's to hoping the front end fills in all of the indices,
3078 so we don't have to figure out what's missing ourselves. */
3079 gcc_assert (purpose);
3081 /* Skip zero-sized fields, unless value has side-effects. This can
3082 happen with calls to functions returning a zero-sized type, which
3083 we shouldn't discard. As a number of downstream passes don't
3084 expect sets of zero-sized fields, we rely on the gimplification of
3085 the MODIFY_EXPR we make below to drop the assignment statement. */
3086 if (! TREE_SIDE_EFFECTS (value) && zero_sized_field_decl (purpose))
3087 continue;
3089 /* If we have a RANGE_EXPR, we have to build a loop to assign the
3090 whole range. */
3091 if (TREE_CODE (purpose) == RANGE_EXPR)
3093 tree lower = TREE_OPERAND (purpose, 0);
3094 tree upper = TREE_OPERAND (purpose, 1);
3096 /* If the lower bound is equal to upper, just treat it as if
3097 upper was the index. */
3098 if (simple_cst_equal (lower, upper))
3099 purpose = upper;
3100 else
3102 gimplify_init_ctor_eval_range (object, lower, upper, value,
3103 array_elt_type, pre_p, cleared);
3104 continue;
3108 if (array_elt_type)
3110 /* Do not use bitsizetype for ARRAY_REF indices. */
3111 if (TYPE_DOMAIN (TREE_TYPE (object)))
3112 purpose = fold_convert (TREE_TYPE (TYPE_DOMAIN (TREE_TYPE (object))),
3113 purpose);
3114 cref = build4 (ARRAY_REF, array_elt_type, unshare_expr (object),
3115 purpose, NULL_TREE, NULL_TREE);
3117 else
3119 gcc_assert (TREE_CODE (purpose) == FIELD_DECL);
3120 cref = build3 (COMPONENT_REF, TREE_TYPE (purpose),
3121 unshare_expr (object), purpose, NULL_TREE);
3124 if (TREE_CODE (value) == CONSTRUCTOR
3125 && TREE_CODE (TREE_TYPE (value)) != VECTOR_TYPE)
3126 gimplify_init_ctor_eval (cref, CONSTRUCTOR_ELTS (value),
3127 pre_p, cleared);
3128 else
3130 init = build2 (INIT_EXPR, TREE_TYPE (cref), cref, value);
3131 gimplify_and_add (init, pre_p);
3136 /* A subroutine of gimplify_modify_expr. Break out elements of a
3137 CONSTRUCTOR used as an initializer into separate MODIFY_EXPRs.
3139 Note that we still need to clear any elements that don't have explicit
3140 initializers, so if not all elements are initialized we keep the
3141 original MODIFY_EXPR, we just remove all of the constructor elements.
3143 If NOTIFY_TEMP_CREATION is true, do not gimplify, just return
3144 GS_ERROR if we would have to create a temporary when gimplifying
3145 this constructor. Otherwise, return GS_OK.
3147 If NOTIFY_TEMP_CREATION is false, just do the gimplification. */
3149 static enum gimplify_status
3150 gimplify_init_constructor (tree *expr_p, tree *pre_p,
3151 tree *post_p, bool want_value,
3152 bool notify_temp_creation)
3154 tree object;
3155 tree ctor = GENERIC_TREE_OPERAND (*expr_p, 1);
3156 tree type = TREE_TYPE (ctor);
3157 enum gimplify_status ret;
3158 VEC(constructor_elt,gc) *elts;
3160 if (TREE_CODE (ctor) != CONSTRUCTOR)
3161 return GS_UNHANDLED;
3163 if (!notify_temp_creation)
3165 ret = gimplify_expr (&GENERIC_TREE_OPERAND (*expr_p, 0), pre_p, post_p,
3166 is_gimple_lvalue, fb_lvalue);
3167 if (ret == GS_ERROR)
3168 return ret;
3170 object = GENERIC_TREE_OPERAND (*expr_p, 0);
3172 elts = CONSTRUCTOR_ELTS (ctor);
3174 ret = GS_ALL_DONE;
3175 switch (TREE_CODE (type))
3177 case RECORD_TYPE:
3178 case UNION_TYPE:
3179 case QUAL_UNION_TYPE:
3180 case ARRAY_TYPE:
3182 struct gimplify_init_ctor_preeval_data preeval_data;
3183 HOST_WIDE_INT num_type_elements, num_ctor_elements;
3184 HOST_WIDE_INT num_nonzero_elements;
3185 bool cleared, valid_const_initializer;
3187 /* Aggregate types must lower constructors to initialization of
3188 individual elements. The exception is that a CONSTRUCTOR node
3189 with no elements indicates zero-initialization of the whole. */
3190 if (VEC_empty (constructor_elt, elts))
3192 if (notify_temp_creation)
3193 return GS_OK;
3194 break;
3197 /* Fetch information about the constructor to direct later processing.
3198 We might want to make static versions of it in various cases, and
3199 can only do so if it known to be a valid constant initializer. */
3200 valid_const_initializer
3201 = categorize_ctor_elements (ctor, &num_nonzero_elements,
3202 &num_ctor_elements, &cleared);
3204 /* If a const aggregate variable is being initialized, then it
3205 should never be a lose to promote the variable to be static. */
3206 if (valid_const_initializer
3207 && num_nonzero_elements > 1
3208 && TREE_READONLY (object)
3209 && TREE_CODE (object) == VAR_DECL
3210 && (flag_merge_constants >= 2 || !TREE_ADDRESSABLE (object)))
3212 if (notify_temp_creation)
3213 return GS_ERROR;
3214 DECL_INITIAL (object) = ctor;
3215 TREE_STATIC (object) = 1;
3216 if (!DECL_NAME (object))
3217 DECL_NAME (object) = create_tmp_var_name ("C");
3218 walk_tree (&DECL_INITIAL (object), force_labels_r, NULL, NULL);
3220 /* ??? C++ doesn't automatically append a .<number> to the
3221 assembler name, and even when it does, it looks a FE private
3222 data structures to figure out what that number should be,
3223 which are not set for this variable. I suppose this is
3224 important for local statics for inline functions, which aren't
3225 "local" in the object file sense. So in order to get a unique
3226 TU-local symbol, we must invoke the lhd version now. */
3227 lhd_set_decl_assembler_name (object);
3229 *expr_p = NULL_TREE;
3230 break;
3233 /* If there are "lots" of initialized elements, even discounting
3234 those that are not address constants (and thus *must* be
3235 computed at runtime), then partition the constructor into
3236 constant and non-constant parts. Block copy the constant
3237 parts in, then generate code for the non-constant parts. */
3238 /* TODO. There's code in cp/typeck.c to do this. */
3240 num_type_elements = count_type_elements (type, true);
3242 /* If count_type_elements could not determine number of type elements
3243 for a constant-sized object, assume clearing is needed.
3244 Don't do this for variable-sized objects, as store_constructor
3245 will ignore the clearing of variable-sized objects. */
3246 if (num_type_elements < 0 && int_size_in_bytes (type) >= 0)
3247 cleared = true;
3248 /* If there are "lots" of zeros, then block clear the object first. */
3249 else if (num_type_elements - num_nonzero_elements > CLEAR_RATIO
3250 && num_nonzero_elements < num_type_elements/4)
3251 cleared = true;
3252 /* ??? This bit ought not be needed. For any element not present
3253 in the initializer, we should simply set them to zero. Except
3254 we'd need to *find* the elements that are not present, and that
3255 requires trickery to avoid quadratic compile-time behavior in
3256 large cases or excessive memory use in small cases. */
3257 else if (num_ctor_elements < num_type_elements)
3258 cleared = true;
3260 /* If there are "lots" of initialized elements, and all of them
3261 are valid address constants, then the entire initializer can
3262 be dropped to memory, and then memcpy'd out. Don't do this
3263 for sparse arrays, though, as it's more efficient to follow
3264 the standard CONSTRUCTOR behavior of memset followed by
3265 individual element initialization. */
3266 if (valid_const_initializer && !cleared)
3268 HOST_WIDE_INT size = int_size_in_bytes (type);
3269 unsigned int align;
3271 /* ??? We can still get unbounded array types, at least
3272 from the C++ front end. This seems wrong, but attempt
3273 to work around it for now. */
3274 if (size < 0)
3276 size = int_size_in_bytes (TREE_TYPE (object));
3277 if (size >= 0)
3278 TREE_TYPE (ctor) = type = TREE_TYPE (object);
3281 /* Find the maximum alignment we can assume for the object. */
3282 /* ??? Make use of DECL_OFFSET_ALIGN. */
3283 if (DECL_P (object))
3284 align = DECL_ALIGN (object);
3285 else
3286 align = TYPE_ALIGN (type);
3288 if (size > 0 && !can_move_by_pieces (size, align))
3290 tree new;
3292 if (notify_temp_creation)
3293 return GS_ERROR;
3295 new = create_tmp_var_raw (type, "C");
3297 gimple_add_tmp_var (new);
3298 TREE_STATIC (new) = 1;
3299 TREE_READONLY (new) = 1;
3300 DECL_INITIAL (new) = ctor;
3301 if (align > DECL_ALIGN (new))
3303 DECL_ALIGN (new) = align;
3304 DECL_USER_ALIGN (new) = 1;
3306 walk_tree (&DECL_INITIAL (new), force_labels_r, NULL, NULL);
3308 GENERIC_TREE_OPERAND (*expr_p, 1) = new;
3310 /* This is no longer an assignment of a CONSTRUCTOR, but
3311 we still may have processing to do on the LHS. So
3312 pretend we didn't do anything here to let that happen. */
3313 return GS_UNHANDLED;
3317 /* If the target is volatile, we have non-zero elements and more than
3318 one field to assign, initialize the target from a temporary. */
3319 if (TREE_THIS_VOLATILE (object)
3320 && !TREE_ADDRESSABLE (type)
3321 && num_nonzero_elements > 0
3322 && VEC_length (constructor_elt, elts) > 1)
3324 tree temp = create_tmp_var (TYPE_MAIN_VARIANT (type), NULL);
3325 TREE_OPERAND (*expr_p, 0) = temp;
3326 *expr_p = build2 (COMPOUND_EXPR, TREE_TYPE (*expr_p),
3327 *expr_p,
3328 build2 (MODIFY_EXPR, void_type_node,
3329 object, temp));
3330 return GS_OK;
3333 if (notify_temp_creation)
3334 return GS_OK;
3336 /* If there are nonzero elements, pre-evaluate to capture elements
3337 overlapping with the lhs into temporaries. We must do this before
3338 clearing to fetch the values before they are zeroed-out. */
3339 if (num_nonzero_elements > 0)
3341 preeval_data.lhs_base_decl = get_base_address (object);
3342 if (!DECL_P (preeval_data.lhs_base_decl))
3343 preeval_data.lhs_base_decl = NULL;
3344 preeval_data.lhs_alias_set = get_alias_set (object);
3346 gimplify_init_ctor_preeval (&GENERIC_TREE_OPERAND (*expr_p, 1),
3347 pre_p, post_p, &preeval_data);
3350 if (cleared)
3352 /* Zap the CONSTRUCTOR element list, which simplifies this case.
3353 Note that we still have to gimplify, in order to handle the
3354 case of variable sized types. Avoid shared tree structures. */
3355 CONSTRUCTOR_ELTS (ctor) = NULL;
3356 object = unshare_expr (object);
3357 gimplify_stmt (expr_p);
3358 append_to_statement_list (*expr_p, pre_p);
3361 /* If we have not block cleared the object, or if there are nonzero
3362 elements in the constructor, add assignments to the individual
3363 scalar fields of the object. */
3364 if (!cleared || num_nonzero_elements > 0)
3365 gimplify_init_ctor_eval (object, elts, pre_p, cleared);
3367 *expr_p = NULL_TREE;
3369 break;
3371 case COMPLEX_TYPE:
3373 tree r, i;
3375 if (notify_temp_creation)
3376 return GS_OK;
3378 /* Extract the real and imaginary parts out of the ctor. */
3379 gcc_assert (VEC_length (constructor_elt, elts) == 2);
3380 r = VEC_index (constructor_elt, elts, 0)->value;
3381 i = VEC_index (constructor_elt, elts, 1)->value;
3382 if (r == NULL || i == NULL)
3384 tree zero = fold_convert (TREE_TYPE (type), integer_zero_node);
3385 if (r == NULL)
3386 r = zero;
3387 if (i == NULL)
3388 i = zero;
3391 /* Complex types have either COMPLEX_CST or COMPLEX_EXPR to
3392 represent creation of a complex value. */
3393 if (TREE_CONSTANT (r) && TREE_CONSTANT (i))
3395 ctor = build_complex (type, r, i);
3396 TREE_OPERAND (*expr_p, 1) = ctor;
3398 else
3400 ctor = build2 (COMPLEX_EXPR, type, r, i);
3401 TREE_OPERAND (*expr_p, 1) = ctor;
3402 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
3403 rhs_predicate_for (TREE_OPERAND (*expr_p, 0)),
3404 fb_rvalue);
3407 break;
3409 case VECTOR_TYPE:
3411 unsigned HOST_WIDE_INT ix;
3412 constructor_elt *ce;
3414 if (notify_temp_creation)
3415 return GS_OK;
3417 /* Go ahead and simplify constant constructors to VECTOR_CST. */
3418 if (TREE_CONSTANT (ctor))
3420 bool constant_p = true;
3421 tree value;
3423 /* Even when ctor is constant, it might contain non-*_CST
3424 elements, such as addresses or trapping values like
3425 1.0/0.0 - 1.0/0.0. Such expressions don't belong
3426 in VECTOR_CST nodes. */
3427 FOR_EACH_CONSTRUCTOR_VALUE (elts, ix, value)
3428 if (!CONSTANT_CLASS_P (value))
3430 constant_p = false;
3431 break;
3434 if (constant_p)
3436 GENERIC_TREE_OPERAND (*expr_p, 1)
3437 = build_vector_from_ctor (type, elts);
3438 break;
3441 /* Don't reduce an initializer constant even if we can't
3442 make a VECTOR_CST. It won't do anything for us, and it'll
3443 prevent us from representing it as a single constant. */
3444 if (initializer_constant_valid_p (ctor, type))
3445 break;
3447 TREE_CONSTANT (ctor) = 0;
3448 TREE_INVARIANT (ctor) = 0;
3451 /* Vector types use CONSTRUCTOR all the way through gimple
3452 compilation as a general initializer. */
3453 for (ix = 0; VEC_iterate (constructor_elt, elts, ix, ce); ix++)
3455 enum gimplify_status tret;
3456 tret = gimplify_expr (&ce->value, pre_p, post_p,
3457 is_gimple_val, fb_rvalue);
3458 if (tret == GS_ERROR)
3459 ret = GS_ERROR;
3461 if (!is_gimple_reg (GENERIC_TREE_OPERAND (*expr_p, 0)))
3462 GENERIC_TREE_OPERAND (*expr_p, 1) = get_formal_tmp_var (ctor, pre_p);
3464 break;
3466 default:
3467 /* So how did we get a CONSTRUCTOR for a scalar type? */
3468 gcc_unreachable ();
3471 if (ret == GS_ERROR)
3472 return GS_ERROR;
3473 else if (want_value)
3475 if (*expr_p)
3476 tree_to_gimple_tuple (expr_p);
3478 append_to_statement_list (*expr_p, pre_p);
3479 *expr_p = object;
3480 return GS_OK;
3482 else
3483 return GS_ALL_DONE;
3486 /* Given a pointer value OP0, return a simplified version of an
3487 indirection through OP0, or NULL_TREE if no simplification is
3488 possible. Note that the resulting type may be different from
3489 the type pointed to in the sense that it is still compatible
3490 from the langhooks point of view. */
3492 tree
3493 gimple_fold_indirect_ref (tree t)
3495 tree type = TREE_TYPE (TREE_TYPE (t));
3496 tree sub = t;
3497 tree subtype;
3499 STRIP_USELESS_TYPE_CONVERSION (sub);
3500 subtype = TREE_TYPE (sub);
3501 if (!POINTER_TYPE_P (subtype))
3502 return NULL_TREE;
3504 if (TREE_CODE (sub) == ADDR_EXPR)
3506 tree op = TREE_OPERAND (sub, 0);
3507 tree optype = TREE_TYPE (op);
3508 /* *&p => p */
3509 if (useless_type_conversion_p (type, optype))
3510 return op;
3512 /* *(foo *)&fooarray => fooarray[0] */
3513 if (TREE_CODE (optype) == ARRAY_TYPE
3514 && useless_type_conversion_p (type, TREE_TYPE (optype)))
3516 tree type_domain = TYPE_DOMAIN (optype);
3517 tree min_val = size_zero_node;
3518 if (type_domain && TYPE_MIN_VALUE (type_domain))
3519 min_val = TYPE_MIN_VALUE (type_domain);
3520 return build4 (ARRAY_REF, type, op, min_val, NULL_TREE, NULL_TREE);
3524 /* *(foo *)fooarrptr => (*fooarrptr)[0] */
3525 if (TREE_CODE (TREE_TYPE (subtype)) == ARRAY_TYPE
3526 && useless_type_conversion_p (type, TREE_TYPE (TREE_TYPE (subtype))))
3528 tree type_domain;
3529 tree min_val = size_zero_node;
3530 tree osub = sub;
3531 sub = gimple_fold_indirect_ref (sub);
3532 if (! sub)
3533 sub = build1 (INDIRECT_REF, TREE_TYPE (subtype), osub);
3534 type_domain = TYPE_DOMAIN (TREE_TYPE (sub));
3535 if (type_domain && TYPE_MIN_VALUE (type_domain))
3536 min_val = TYPE_MIN_VALUE (type_domain);
3537 return build4 (ARRAY_REF, type, sub, min_val, NULL_TREE, NULL_TREE);
3540 return NULL_TREE;
3543 /* Given a pointer value OP0, return a simplified version of an
3544 indirection through OP0, or NULL_TREE if no simplification is
3545 possible. This may only be applied to a rhs of an expression.
3546 Note that the resulting type may be different from the type pointed
3547 to in the sense that it is still compatible from the langhooks
3548 point of view. */
3550 static tree
3551 gimple_fold_indirect_ref_rhs (tree t)
3553 return gimple_fold_indirect_ref (t);
3556 /* Subroutine of gimplify_modify_expr to do simplifications of
3557 MODIFY_EXPRs based on the code of the RHS. We loop for as long as
3558 something changes. */
3560 static enum gimplify_status
3561 gimplify_modify_expr_rhs (tree *expr_p, tree *from_p, tree *to_p, tree *pre_p,
3562 tree *post_p, bool want_value)
3564 enum gimplify_status ret = GS_OK;
3566 while (ret != GS_UNHANDLED)
3567 switch (TREE_CODE (*from_p))
3569 case VAR_DECL:
3570 /* If we're assigning from a read-only variable initialized with
3571 a constructor, do the direct assignment from the constructor,
3572 but only if neither source nor target are volatile since this
3573 latter assignment might end up being done on a per-field basis. */
3574 if (DECL_INITIAL (*from_p)
3575 && TREE_READONLY (*from_p)
3576 && !TREE_THIS_VOLATILE (*from_p)
3577 && !TREE_THIS_VOLATILE (*to_p)
3578 && TREE_CODE (DECL_INITIAL (*from_p)) == CONSTRUCTOR)
3580 tree old_from = *from_p;
3582 /* Move the constructor into the RHS. */
3583 *from_p = unshare_expr (DECL_INITIAL (*from_p));
3585 /* Let's see if gimplify_init_constructor will need to put
3586 it in memory. If so, revert the change. */
3587 ret = gimplify_init_constructor (expr_p, NULL, NULL, false, true);
3588 if (ret == GS_ERROR)
3590 *from_p = old_from;
3591 /* Fall through. */
3593 else
3595 ret = GS_OK;
3596 break;
3599 ret = GS_UNHANDLED;
3600 break;
3601 case INDIRECT_REF:
3603 /* If we have code like
3605 *(const A*)(A*)&x
3607 where the type of "x" is a (possibly cv-qualified variant
3608 of "A"), treat the entire expression as identical to "x".
3609 This kind of code arises in C++ when an object is bound
3610 to a const reference, and if "x" is a TARGET_EXPR we want
3611 to take advantage of the optimization below. */
3612 tree t = gimple_fold_indirect_ref_rhs (TREE_OPERAND (*from_p, 0));
3613 if (t)
3615 *from_p = t;
3616 ret = GS_OK;
3618 else
3619 ret = GS_UNHANDLED;
3620 break;
3623 case TARGET_EXPR:
3625 /* If we are initializing something from a TARGET_EXPR, strip the
3626 TARGET_EXPR and initialize it directly, if possible. This can't
3627 be done if the initializer is void, since that implies that the
3628 temporary is set in some non-trivial way.
3630 ??? What about code that pulls out the temp and uses it
3631 elsewhere? I think that such code never uses the TARGET_EXPR as
3632 an initializer. If I'm wrong, we'll die because the temp won't
3633 have any RTL. In that case, I guess we'll need to replace
3634 references somehow. */
3635 tree init = TARGET_EXPR_INITIAL (*from_p);
3637 if (!VOID_TYPE_P (TREE_TYPE (init)))
3639 *from_p = init;
3640 ret = GS_OK;
3642 else
3643 ret = GS_UNHANDLED;
3645 break;
3647 case COMPOUND_EXPR:
3648 /* Remove any COMPOUND_EXPR in the RHS so the following cases will be
3649 caught. */
3650 gimplify_compound_expr (from_p, pre_p, true);
3651 ret = GS_OK;
3652 break;
3654 case CONSTRUCTOR:
3655 /* If we're initializing from a CONSTRUCTOR, break this into
3656 individual MODIFY_EXPRs. */
3657 return gimplify_init_constructor (expr_p, pre_p, post_p, want_value,
3658 false);
3660 case COND_EXPR:
3661 /* If we're assigning to a non-register type, push the assignment
3662 down into the branches. This is mandatory for ADDRESSABLE types,
3663 since we cannot generate temporaries for such, but it saves a
3664 copy in other cases as well. */
3665 if (!is_gimple_reg_type (TREE_TYPE (*from_p)))
3667 /* This code should mirror the code in gimplify_cond_expr. */
3668 enum tree_code code = TREE_CODE (*expr_p);
3669 tree cond = *from_p;
3670 tree result = *to_p;
3672 ret = gimplify_expr (&result, pre_p, post_p,
3673 is_gimple_min_lval, fb_lvalue);
3674 if (ret != GS_ERROR)
3675 ret = GS_OK;
3677 if (TREE_TYPE (TREE_OPERAND (cond, 1)) != void_type_node)
3678 TREE_OPERAND (cond, 1)
3679 = build2 (code, void_type_node, result,
3680 TREE_OPERAND (cond, 1));
3681 if (TREE_TYPE (TREE_OPERAND (cond, 2)) != void_type_node)
3682 TREE_OPERAND (cond, 2)
3683 = build2 (code, void_type_node, unshare_expr (result),
3684 TREE_OPERAND (cond, 2));
3686 TREE_TYPE (cond) = void_type_node;
3687 recalculate_side_effects (cond);
3689 if (want_value)
3691 gimplify_and_add (cond, pre_p);
3692 *expr_p = unshare_expr (result);
3694 else
3695 *expr_p = cond;
3696 return ret;
3698 else
3699 ret = GS_UNHANDLED;
3700 break;
3702 case CALL_EXPR:
3703 /* For calls that return in memory, give *to_p as the CALL_EXPR's
3704 return slot so that we don't generate a temporary. */
3705 if (!CALL_EXPR_RETURN_SLOT_OPT (*from_p)
3706 && aggregate_value_p (*from_p, *from_p))
3708 bool use_target;
3710 if (!(rhs_predicate_for (*to_p))(*from_p))
3711 /* If we need a temporary, *to_p isn't accurate. */
3712 use_target = false;
3713 else if (TREE_CODE (*to_p) == RESULT_DECL
3714 && DECL_NAME (*to_p) == NULL_TREE
3715 && needs_to_live_in_memory (*to_p))
3716 /* It's OK to use the return slot directly unless it's an NRV. */
3717 use_target = true;
3718 else if (is_gimple_reg_type (TREE_TYPE (*to_p))
3719 || (DECL_P (*to_p) && DECL_REGISTER (*to_p)))
3720 /* Don't force regs into memory. */
3721 use_target = false;
3722 else if (TREE_CODE (*to_p) == VAR_DECL
3723 && DECL_GIMPLE_FORMAL_TEMP_P (*to_p))
3724 /* Don't use the original target if it's a formal temp; we
3725 don't want to take their addresses. */
3726 use_target = false;
3727 else if (TREE_CODE (*expr_p) == INIT_EXPR)
3728 /* It's OK to use the target directly if it's being
3729 initialized. */
3730 use_target = true;
3731 else if (!is_gimple_non_addressable (*to_p))
3732 /* Don't use the original target if it's already addressable;
3733 if its address escapes, and the called function uses the
3734 NRV optimization, a conforming program could see *to_p
3735 change before the called function returns; see c++/19317.
3736 When optimizing, the return_slot pass marks more functions
3737 as safe after we have escape info. */
3738 use_target = false;
3739 else
3740 use_target = true;
3742 if (use_target)
3744 CALL_EXPR_RETURN_SLOT_OPT (*from_p) = 1;
3745 mark_addressable (*to_p);
3749 ret = GS_UNHANDLED;
3750 break;
3752 /* If we're initializing from a container, push the initialization
3753 inside it. */
3754 case CLEANUP_POINT_EXPR:
3755 case BIND_EXPR:
3756 case STATEMENT_LIST:
3758 tree wrap = *from_p;
3759 tree t;
3761 ret = gimplify_expr (to_p, pre_p, post_p,
3762 is_gimple_min_lval, fb_lvalue);
3763 if (ret != GS_ERROR)
3764 ret = GS_OK;
3766 t = voidify_wrapper_expr (wrap, *expr_p);
3767 gcc_assert (t == *expr_p);
3769 if (want_value)
3771 gimplify_and_add (wrap, pre_p);
3772 *expr_p = unshare_expr (*to_p);
3774 else
3775 *expr_p = wrap;
3776 return GS_OK;
3779 default:
3780 ret = GS_UNHANDLED;
3781 break;
3784 return ret;
3787 /* Destructively convert the TREE pointer in TP into a gimple tuple if
3788 appropriate. */
3790 static void
3791 tree_to_gimple_tuple (tree *tp)
3794 switch (TREE_CODE (*tp))
3796 case GIMPLE_MODIFY_STMT:
3797 return;
3798 case MODIFY_EXPR:
3800 struct gimple_stmt *gs;
3801 tree lhs = TREE_OPERAND (*tp, 0);
3802 bool def_stmt_self_p = false;
3804 if (TREE_CODE (lhs) == SSA_NAME)
3806 if (SSA_NAME_DEF_STMT (lhs) == *tp)
3807 def_stmt_self_p = true;
3810 gs = &make_node (GIMPLE_MODIFY_STMT)->gstmt;
3811 gs->base = (*tp)->base;
3812 /* The set to base above overwrites the CODE. */
3813 TREE_SET_CODE ((tree) gs, GIMPLE_MODIFY_STMT);
3815 SET_EXPR_LOCUS ((tree) gs, EXPR_LOCUS (*tp));
3816 gs->operands[0] = TREE_OPERAND (*tp, 0);
3817 gs->operands[1] = TREE_OPERAND (*tp, 1);
3818 gs->block = TREE_BLOCK (*tp);
3819 *tp = (tree)gs;
3821 /* If we re-gimplify a set to an SSA_NAME, we must change the
3822 SSA name's DEF_STMT link. */
3823 if (def_stmt_self_p)
3824 SSA_NAME_DEF_STMT (GIMPLE_STMT_OPERAND (*tp, 0)) = *tp;
3826 return;
3828 default:
3829 break;
3833 /* Promote partial stores to COMPLEX variables to total stores. *EXPR_P is
3834 a MODIFY_EXPR with a lhs of a REAL/IMAGPART_EXPR of a variable with
3835 DECL_GIMPLE_REG_P set.
3837 IMPORTANT NOTE: This promotion is performed by introducing a load of the
3838 other, unmodified part of the complex object just before the total store.
3839 As a consequence, if the object is still uninitialized, an undefined value
3840 will be loaded into a register, which may result in a spurious exception
3841 if the register is floating-point and the value happens to be a signaling
3842 NaN for example. Then the fully-fledged complex operations lowering pass
3843 followed by a DCE pass are necessary in order to fix things up. */
3845 static enum gimplify_status
3846 gimplify_modify_expr_complex_part (tree *expr_p, tree *pre_p, bool want_value)
3848 enum tree_code code, ocode;
3849 tree lhs, rhs, new_rhs, other, realpart, imagpart;
3851 lhs = GENERIC_TREE_OPERAND (*expr_p, 0);
3852 rhs = GENERIC_TREE_OPERAND (*expr_p, 1);
3853 code = TREE_CODE (lhs);
3854 lhs = TREE_OPERAND (lhs, 0);
3856 ocode = code == REALPART_EXPR ? IMAGPART_EXPR : REALPART_EXPR;
3857 other = build1 (ocode, TREE_TYPE (rhs), lhs);
3858 other = get_formal_tmp_var (other, pre_p);
3860 realpart = code == REALPART_EXPR ? rhs : other;
3861 imagpart = code == REALPART_EXPR ? other : rhs;
3863 if (TREE_CONSTANT (realpart) && TREE_CONSTANT (imagpart))
3864 new_rhs = build_complex (TREE_TYPE (lhs), realpart, imagpart);
3865 else
3866 new_rhs = build2 (COMPLEX_EXPR, TREE_TYPE (lhs), realpart, imagpart);
3868 GENERIC_TREE_OPERAND (*expr_p, 0) = lhs;
3869 GENERIC_TREE_OPERAND (*expr_p, 1) = new_rhs;
3871 if (want_value)
3873 tree_to_gimple_tuple (expr_p);
3875 append_to_statement_list (*expr_p, pre_p);
3876 *expr_p = rhs;
3879 return GS_ALL_DONE;
3882 /* Gimplify the MODIFY_EXPR node pointed to by EXPR_P.
3884 modify_expr
3885 : varname '=' rhs
3886 | '*' ID '=' rhs
3888 PRE_P points to the list where side effects that must happen before
3889 *EXPR_P should be stored.
3891 POST_P points to the list where side effects that must happen after
3892 *EXPR_P should be stored.
3894 WANT_VALUE is nonzero iff we want to use the value of this expression
3895 in another expression. */
3897 static enum gimplify_status
3898 gimplify_modify_expr (tree *expr_p, tree *pre_p, tree *post_p, bool want_value)
3900 tree *from_p = &GENERIC_TREE_OPERAND (*expr_p, 1);
3901 tree *to_p = &GENERIC_TREE_OPERAND (*expr_p, 0);
3902 enum gimplify_status ret = GS_UNHANDLED;
3904 gcc_assert (TREE_CODE (*expr_p) == MODIFY_EXPR
3905 || TREE_CODE (*expr_p) == GIMPLE_MODIFY_STMT
3906 || TREE_CODE (*expr_p) == INIT_EXPR);
3908 /* See if any simplifications can be done based on what the RHS is. */
3909 ret = gimplify_modify_expr_rhs (expr_p, from_p, to_p, pre_p, post_p,
3910 want_value);
3911 if (ret != GS_UNHANDLED)
3912 return ret;
3914 /* For zero sized types only gimplify the left hand side and right hand
3915 side as statements and throw away the assignment. Do this after
3916 gimplify_modify_expr_rhs so we handle TARGET_EXPRs of addressable
3917 types properly. */
3918 if (zero_sized_type (TREE_TYPE (*from_p)) && !want_value)
3920 gimplify_stmt (from_p);
3921 gimplify_stmt (to_p);
3922 append_to_statement_list (*from_p, pre_p);
3923 append_to_statement_list (*to_p, pre_p);
3924 *expr_p = NULL_TREE;
3925 return GS_ALL_DONE;
3928 /* If the value being copied is of variable width, compute the length
3929 of the copy into a WITH_SIZE_EXPR. Note that we need to do this
3930 before gimplifying any of the operands so that we can resolve any
3931 PLACEHOLDER_EXPRs in the size. Also note that the RTL expander uses
3932 the size of the expression to be copied, not of the destination, so
3933 that is what we must here. */
3934 maybe_with_size_expr (from_p);
3936 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
3937 if (ret == GS_ERROR)
3938 return ret;
3940 ret = gimplify_expr (from_p, pre_p, post_p,
3941 rhs_predicate_for (*to_p), fb_rvalue);
3942 if (ret == GS_ERROR)
3943 return ret;
3945 /* Now see if the above changed *from_p to something we handle specially. */
3946 ret = gimplify_modify_expr_rhs (expr_p, from_p, to_p, pre_p, post_p,
3947 want_value);
3948 if (ret != GS_UNHANDLED)
3949 return ret;
3951 /* If we've got a variable sized assignment between two lvalues (i.e. does
3952 not involve a call), then we can make things a bit more straightforward
3953 by converting the assignment to memcpy or memset. */
3954 if (TREE_CODE (*from_p) == WITH_SIZE_EXPR)
3956 tree from = TREE_OPERAND (*from_p, 0);
3957 tree size = TREE_OPERAND (*from_p, 1);
3959 if (TREE_CODE (from) == CONSTRUCTOR)
3960 return gimplify_modify_expr_to_memset (expr_p, size, want_value);
3961 if (is_gimple_addressable (from))
3963 *from_p = from;
3964 return gimplify_modify_expr_to_memcpy (expr_p, size, want_value);
3968 /* Transform partial stores to non-addressable complex variables into
3969 total stores. This allows us to use real instead of virtual operands
3970 for these variables, which improves optimization. */
3971 if ((TREE_CODE (*to_p) == REALPART_EXPR
3972 || TREE_CODE (*to_p) == IMAGPART_EXPR)
3973 && is_gimple_reg (TREE_OPERAND (*to_p, 0)))
3974 return gimplify_modify_expr_complex_part (expr_p, pre_p, want_value);
3976 if (gimplify_ctxp->into_ssa && is_gimple_reg (*to_p))
3978 /* If we've somehow already got an SSA_NAME on the LHS, then
3979 we're probably modified it twice. Not good. */
3980 gcc_assert (TREE_CODE (*to_p) != SSA_NAME);
3981 *to_p = make_ssa_name (*to_p, *expr_p);
3984 /* Try to alleviate the effects of the gimplification creating artificial
3985 temporaries (see for example is_gimple_reg_rhs) on the debug info. */
3986 if (!gimplify_ctxp->into_ssa
3987 && DECL_P (*from_p) && DECL_IGNORED_P (*from_p)
3988 && DECL_P (*to_p) && !DECL_IGNORED_P (*to_p))
3990 if (!DECL_NAME (*from_p) && DECL_NAME (*to_p))
3991 DECL_NAME (*from_p)
3992 = create_tmp_var_name (IDENTIFIER_POINTER (DECL_NAME (*to_p)));
3993 DECL_DEBUG_EXPR_IS_FROM (*from_p) = 1;
3994 SET_DECL_DEBUG_EXPR (*from_p, *to_p);
3997 if (want_value)
3999 tree_to_gimple_tuple (expr_p);
4001 append_to_statement_list (*expr_p, pre_p);
4002 *expr_p = *to_p;
4003 return GS_OK;
4006 return GS_ALL_DONE;
4009 /* Gimplify a comparison between two variable-sized objects. Do this
4010 with a call to BUILT_IN_MEMCMP. */
4012 static enum gimplify_status
4013 gimplify_variable_sized_compare (tree *expr_p)
4015 tree op0 = TREE_OPERAND (*expr_p, 0);
4016 tree op1 = TREE_OPERAND (*expr_p, 1);
4017 tree t, arg, dest, src;
4019 arg = TYPE_SIZE_UNIT (TREE_TYPE (op0));
4020 arg = unshare_expr (arg);
4021 arg = SUBSTITUTE_PLACEHOLDER_IN_EXPR (arg, op0);
4022 src = build_fold_addr_expr (op1);
4023 dest = build_fold_addr_expr (op0);
4024 t = implicit_built_in_decls[BUILT_IN_MEMCMP];
4025 t = build_call_expr (t, 3, dest, src, arg);
4026 *expr_p
4027 = build2 (TREE_CODE (*expr_p), TREE_TYPE (*expr_p), t, integer_zero_node);
4029 return GS_OK;
4032 /* Gimplify a comparison between two aggregate objects of integral scalar
4033 mode as a comparison between the bitwise equivalent scalar values. */
4035 static enum gimplify_status
4036 gimplify_scalar_mode_aggregate_compare (tree *expr_p)
4038 tree op0 = TREE_OPERAND (*expr_p, 0);
4039 tree op1 = TREE_OPERAND (*expr_p, 1);
4041 tree type = TREE_TYPE (op0);
4042 tree scalar_type = lang_hooks.types.type_for_mode (TYPE_MODE (type), 1);
4044 op0 = fold_build1 (VIEW_CONVERT_EXPR, scalar_type, op0);
4045 op1 = fold_build1 (VIEW_CONVERT_EXPR, scalar_type, op1);
4047 *expr_p
4048 = fold_build2 (TREE_CODE (*expr_p), TREE_TYPE (*expr_p), op0, op1);
4050 return GS_OK;
4053 /* Gimplify TRUTH_ANDIF_EXPR and TRUTH_ORIF_EXPR expressions. EXPR_P
4054 points to the expression to gimplify.
4056 Expressions of the form 'a && b' are gimplified to:
4058 a && b ? true : false
4060 gimplify_cond_expr will do the rest.
4062 PRE_P points to the list where side effects that must happen before
4063 *EXPR_P should be stored. */
4065 static enum gimplify_status
4066 gimplify_boolean_expr (tree *expr_p)
4068 /* Preserve the original type of the expression. */
4069 tree type = TREE_TYPE (*expr_p);
4071 *expr_p = build3 (COND_EXPR, type, *expr_p,
4072 fold_convert (type, boolean_true_node),
4073 fold_convert (type, boolean_false_node));
4075 return GS_OK;
4078 /* Gimplifies an expression sequence. This function gimplifies each
4079 expression and re-writes the original expression with the last
4080 expression of the sequence in GIMPLE form.
4082 PRE_P points to the list where the side effects for all the
4083 expressions in the sequence will be emitted.
4085 WANT_VALUE is true when the result of the last COMPOUND_EXPR is used. */
4086 /* ??? Should rearrange to share the pre-queue with all the indirect
4087 invocations of gimplify_expr. Would probably save on creations
4088 of statement_list nodes. */
4090 static enum gimplify_status
4091 gimplify_compound_expr (tree *expr_p, tree *pre_p, bool want_value)
4093 tree t = *expr_p;
4097 tree *sub_p = &TREE_OPERAND (t, 0);
4099 if (TREE_CODE (*sub_p) == COMPOUND_EXPR)
4100 gimplify_compound_expr (sub_p, pre_p, false);
4101 else
4102 gimplify_stmt (sub_p);
4103 append_to_statement_list (*sub_p, pre_p);
4105 t = TREE_OPERAND (t, 1);
4107 while (TREE_CODE (t) == COMPOUND_EXPR);
4109 *expr_p = t;
4110 if (want_value)
4111 return GS_OK;
4112 else
4114 gimplify_stmt (expr_p);
4115 return GS_ALL_DONE;
4119 /* Gimplifies a statement list. These may be created either by an
4120 enlightened front-end, or by shortcut_cond_expr. */
4122 static enum gimplify_status
4123 gimplify_statement_list (tree *expr_p, tree *pre_p)
4125 tree temp = voidify_wrapper_expr (*expr_p, NULL);
4127 tree_stmt_iterator i = tsi_start (*expr_p);
4129 while (!tsi_end_p (i))
4131 tree t;
4133 gimplify_stmt (tsi_stmt_ptr (i));
4135 t = tsi_stmt (i);
4136 if (t == NULL)
4137 tsi_delink (&i);
4138 else if (TREE_CODE (t) == STATEMENT_LIST)
4140 tsi_link_before (&i, t, TSI_SAME_STMT);
4141 tsi_delink (&i);
4143 else
4144 tsi_next (&i);
4147 if (temp)
4149 append_to_statement_list (*expr_p, pre_p);
4150 *expr_p = temp;
4151 return GS_OK;
4154 return GS_ALL_DONE;
4157 /* Gimplify a SAVE_EXPR node. EXPR_P points to the expression to
4158 gimplify. After gimplification, EXPR_P will point to a new temporary
4159 that holds the original value of the SAVE_EXPR node.
4161 PRE_P points to the list where side effects that must happen before
4162 *EXPR_P should be stored. */
4164 static enum gimplify_status
4165 gimplify_save_expr (tree *expr_p, tree *pre_p, tree *post_p)
4167 enum gimplify_status ret = GS_ALL_DONE;
4168 tree val;
4170 gcc_assert (TREE_CODE (*expr_p) == SAVE_EXPR);
4171 val = TREE_OPERAND (*expr_p, 0);
4173 /* If the SAVE_EXPR has not been resolved, then evaluate it once. */
4174 if (!SAVE_EXPR_RESOLVED_P (*expr_p))
4176 /* The operand may be a void-valued expression such as SAVE_EXPRs
4177 generated by the Java frontend for class initialization. It is
4178 being executed only for its side-effects. */
4179 if (TREE_TYPE (val) == void_type_node)
4181 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
4182 is_gimple_stmt, fb_none);
4183 append_to_statement_list (TREE_OPERAND (*expr_p, 0), pre_p);
4184 val = NULL;
4186 else
4187 val = get_initialized_tmp_var (val, pre_p, post_p);
4189 TREE_OPERAND (*expr_p, 0) = val;
4190 SAVE_EXPR_RESOLVED_P (*expr_p) = 1;
4193 *expr_p = val;
4195 return ret;
4198 /* Re-write the ADDR_EXPR node pointed to by EXPR_P
4200 unary_expr
4201 : ...
4202 | '&' varname
4205 PRE_P points to the list where side effects that must happen before
4206 *EXPR_P should be stored.
4208 POST_P points to the list where side effects that must happen after
4209 *EXPR_P should be stored. */
4211 static enum gimplify_status
4212 gimplify_addr_expr (tree *expr_p, tree *pre_p, tree *post_p)
4214 tree expr = *expr_p;
4215 tree op0 = TREE_OPERAND (expr, 0);
4216 enum gimplify_status ret;
4218 switch (TREE_CODE (op0))
4220 case INDIRECT_REF:
4221 case MISALIGNED_INDIRECT_REF:
4222 do_indirect_ref:
4223 /* Check if we are dealing with an expression of the form '&*ptr'.
4224 While the front end folds away '&*ptr' into 'ptr', these
4225 expressions may be generated internally by the compiler (e.g.,
4226 builtins like __builtin_va_end). */
4227 /* Caution: the silent array decomposition semantics we allow for
4228 ADDR_EXPR means we can't always discard the pair. */
4229 /* Gimplification of the ADDR_EXPR operand may drop
4230 cv-qualification conversions, so make sure we add them if
4231 needed. */
4233 tree op00 = TREE_OPERAND (op0, 0);
4234 tree t_expr = TREE_TYPE (expr);
4235 tree t_op00 = TREE_TYPE (op00);
4237 if (!useless_type_conversion_p (t_expr, t_op00))
4238 op00 = fold_convert (TREE_TYPE (expr), op00);
4239 *expr_p = op00;
4240 ret = GS_OK;
4242 break;
4244 case VIEW_CONVERT_EXPR:
4245 /* Take the address of our operand and then convert it to the type of
4246 this ADDR_EXPR.
4248 ??? The interactions of VIEW_CONVERT_EXPR and aliasing is not at
4249 all clear. The impact of this transformation is even less clear. */
4251 /* If the operand is a useless conversion, look through it. Doing so
4252 guarantees that the ADDR_EXPR and its operand will remain of the
4253 same type. */
4254 if (tree_ssa_useless_type_conversion (TREE_OPERAND (op0, 0)))
4255 op0 = TREE_OPERAND (op0, 0);
4257 *expr_p = fold_convert (TREE_TYPE (expr),
4258 build_fold_addr_expr (TREE_OPERAND (op0, 0)));
4259 ret = GS_OK;
4260 break;
4262 default:
4263 /* We use fb_either here because the C frontend sometimes takes
4264 the address of a call that returns a struct; see
4265 gcc.dg/c99-array-lval-1.c. The gimplifier will correctly make
4266 the implied temporary explicit. */
4268 /* Mark the RHS addressable. */
4269 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, post_p,
4270 is_gimple_addressable, fb_either);
4271 if (ret != GS_ERROR)
4273 op0 = TREE_OPERAND (expr, 0);
4275 /* For various reasons, the gimplification of the expression
4276 may have made a new INDIRECT_REF. */
4277 if (TREE_CODE (op0) == INDIRECT_REF)
4278 goto do_indirect_ref;
4280 /* Make sure TREE_INVARIANT, TREE_CONSTANT, and TREE_SIDE_EFFECTS
4281 is set properly. */
4282 recompute_tree_invariant_for_addr_expr (expr);
4284 mark_addressable (TREE_OPERAND (expr, 0));
4286 break;
4289 return ret;
4292 /* Gimplify the operands of an ASM_EXPR. Input operands should be a gimple
4293 value; output operands should be a gimple lvalue. */
4295 static enum gimplify_status
4296 gimplify_asm_expr (tree *expr_p, tree *pre_p, tree *post_p)
4298 tree expr = *expr_p;
4299 int noutputs = list_length (ASM_OUTPUTS (expr));
4300 const char **oconstraints
4301 = (const char **) alloca ((noutputs) * sizeof (const char *));
4302 int i;
4303 tree link;
4304 const char *constraint;
4305 bool allows_mem, allows_reg, is_inout;
4306 enum gimplify_status ret, tret;
4308 ret = GS_ALL_DONE;
4309 for (i = 0, link = ASM_OUTPUTS (expr); link; ++i, link = TREE_CHAIN (link))
4311 size_t constraint_len;
4312 oconstraints[i] = constraint
4313 = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link)));
4314 constraint_len = strlen (constraint);
4315 if (constraint_len == 0)
4316 continue;
4318 parse_output_constraint (&constraint, i, 0, 0,
4319 &allows_mem, &allows_reg, &is_inout);
4321 if (!allows_reg && allows_mem)
4322 mark_addressable (TREE_VALUE (link));
4324 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
4325 is_inout ? is_gimple_min_lval : is_gimple_lvalue,
4326 fb_lvalue | fb_mayfail);
4327 if (tret == GS_ERROR)
4329 error ("invalid lvalue in asm output %d", i);
4330 ret = tret;
4333 if (is_inout)
4335 /* An input/output operand. To give the optimizers more
4336 flexibility, split it into separate input and output
4337 operands. */
4338 tree input;
4339 char buf[10];
4341 /* Turn the in/out constraint into an output constraint. */
4342 char *p = xstrdup (constraint);
4343 p[0] = '=';
4344 TREE_VALUE (TREE_PURPOSE (link)) = build_string (constraint_len, p);
4346 /* And add a matching input constraint. */
4347 if (allows_reg)
4349 sprintf (buf, "%d", i);
4351 /* If there are multiple alternatives in the constraint,
4352 handle each of them individually. Those that allow register
4353 will be replaced with operand number, the others will stay
4354 unchanged. */
4355 if (strchr (p, ',') != NULL)
4357 size_t len = 0, buflen = strlen (buf);
4358 char *beg, *end, *str, *dst;
4360 for (beg = p + 1;;)
4362 end = strchr (beg, ',');
4363 if (end == NULL)
4364 end = strchr (beg, '\0');
4365 if ((size_t) (end - beg) < buflen)
4366 len += buflen + 1;
4367 else
4368 len += end - beg + 1;
4369 if (*end)
4370 beg = end + 1;
4371 else
4372 break;
4375 str = (char *) alloca (len);
4376 for (beg = p + 1, dst = str;;)
4378 const char *tem;
4379 bool mem_p, reg_p, inout_p;
4381 end = strchr (beg, ',');
4382 if (end)
4383 *end = '\0';
4384 beg[-1] = '=';
4385 tem = beg - 1;
4386 parse_output_constraint (&tem, i, 0, 0,
4387 &mem_p, &reg_p, &inout_p);
4388 if (dst != str)
4389 *dst++ = ',';
4390 if (reg_p)
4392 memcpy (dst, buf, buflen);
4393 dst += buflen;
4395 else
4397 if (end)
4398 len = end - beg;
4399 else
4400 len = strlen (beg);
4401 memcpy (dst, beg, len);
4402 dst += len;
4404 if (end)
4405 beg = end + 1;
4406 else
4407 break;
4409 *dst = '\0';
4410 input = build_string (dst - str, str);
4412 else
4413 input = build_string (strlen (buf), buf);
4415 else
4416 input = build_string (constraint_len - 1, constraint + 1);
4418 free (p);
4420 input = build_tree_list (build_tree_list (NULL_TREE, input),
4421 unshare_expr (TREE_VALUE (link)));
4422 ASM_INPUTS (expr) = chainon (ASM_INPUTS (expr), input);
4426 for (link = ASM_INPUTS (expr); link; ++i, link = TREE_CHAIN (link))
4428 constraint
4429 = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link)));
4430 parse_input_constraint (&constraint, 0, 0, noutputs, 0,
4431 oconstraints, &allows_mem, &allows_reg);
4433 /* If we can't make copies, we can only accept memory. */
4434 if (TREE_ADDRESSABLE (TREE_TYPE (TREE_VALUE (link))))
4436 if (allows_mem)
4437 allows_reg = 0;
4438 else
4440 error ("impossible constraint in %<asm%>");
4441 error ("non-memory input %d must stay in memory", i);
4442 return GS_ERROR;
4446 /* If the operand is a memory input, it should be an lvalue. */
4447 if (!allows_reg && allows_mem)
4449 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
4450 is_gimple_lvalue, fb_lvalue | fb_mayfail);
4451 mark_addressable (TREE_VALUE (link));
4452 if (tret == GS_ERROR)
4454 error ("memory input %d is not directly addressable", i);
4455 ret = tret;
4458 else
4460 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
4461 is_gimple_asm_val, fb_rvalue);
4462 if (tret == GS_ERROR)
4463 ret = tret;
4467 return ret;
4470 /* Gimplify a CLEANUP_POINT_EXPR. Currently this works by adding
4471 WITH_CLEANUP_EXPRs to the prequeue as we encounter cleanups while
4472 gimplifying the body, and converting them to TRY_FINALLY_EXPRs when we
4473 return to this function.
4475 FIXME should we complexify the prequeue handling instead? Or use flags
4476 for all the cleanups and let the optimizer tighten them up? The current
4477 code seems pretty fragile; it will break on a cleanup within any
4478 non-conditional nesting. But any such nesting would be broken, anyway;
4479 we can't write a TRY_FINALLY_EXPR that starts inside a nesting construct
4480 and continues out of it. We can do that at the RTL level, though, so
4481 having an optimizer to tighten up try/finally regions would be a Good
4482 Thing. */
4484 static enum gimplify_status
4485 gimplify_cleanup_point_expr (tree *expr_p, tree *pre_p)
4487 tree_stmt_iterator iter;
4488 tree body;
4490 tree temp = voidify_wrapper_expr (*expr_p, NULL);
4492 /* We only care about the number of conditions between the innermost
4493 CLEANUP_POINT_EXPR and the cleanup. So save and reset the count and
4494 any cleanups collected outside the CLEANUP_POINT_EXPR. */
4495 int old_conds = gimplify_ctxp->conditions;
4496 tree old_cleanups = gimplify_ctxp->conditional_cleanups;
4497 gimplify_ctxp->conditions = 0;
4498 gimplify_ctxp->conditional_cleanups = NULL_TREE;
4500 body = TREE_OPERAND (*expr_p, 0);
4501 gimplify_to_stmt_list (&body);
4503 gimplify_ctxp->conditions = old_conds;
4504 gimplify_ctxp->conditional_cleanups = old_cleanups;
4506 for (iter = tsi_start (body); !tsi_end_p (iter); )
4508 tree *wce_p = tsi_stmt_ptr (iter);
4509 tree wce = *wce_p;
4511 if (TREE_CODE (wce) == WITH_CLEANUP_EXPR)
4513 if (tsi_one_before_end_p (iter))
4515 tsi_link_before (&iter, TREE_OPERAND (wce, 0), TSI_SAME_STMT);
4516 tsi_delink (&iter);
4517 break;
4519 else
4521 tree sl, tfe;
4522 enum tree_code code;
4524 if (CLEANUP_EH_ONLY (wce))
4525 code = TRY_CATCH_EXPR;
4526 else
4527 code = TRY_FINALLY_EXPR;
4529 sl = tsi_split_statement_list_after (&iter);
4530 tfe = build2 (code, void_type_node, sl, NULL_TREE);
4531 append_to_statement_list (TREE_OPERAND (wce, 0),
4532 &TREE_OPERAND (tfe, 1));
4533 *wce_p = tfe;
4534 iter = tsi_start (sl);
4537 else
4538 tsi_next (&iter);
4541 if (temp)
4543 *expr_p = temp;
4544 append_to_statement_list (body, pre_p);
4545 return GS_OK;
4547 else
4549 *expr_p = body;
4550 return GS_ALL_DONE;
4554 /* Insert a cleanup marker for gimplify_cleanup_point_expr. CLEANUP
4555 is the cleanup action required. */
4557 static void
4558 gimple_push_cleanup (tree var, tree cleanup, bool eh_only, tree *pre_p)
4560 tree wce;
4562 /* Errors can result in improperly nested cleanups. Which results in
4563 confusion when trying to resolve the WITH_CLEANUP_EXPR. */
4564 if (errorcount || sorrycount)
4565 return;
4567 if (gimple_conditional_context ())
4569 /* If we're in a conditional context, this is more complex. We only
4570 want to run the cleanup if we actually ran the initialization that
4571 necessitates it, but we want to run it after the end of the
4572 conditional context. So we wrap the try/finally around the
4573 condition and use a flag to determine whether or not to actually
4574 run the destructor. Thus
4576 test ? f(A()) : 0
4578 becomes (approximately)
4580 flag = 0;
4581 try {
4582 if (test) { A::A(temp); flag = 1; val = f(temp); }
4583 else { val = 0; }
4584 } finally {
4585 if (flag) A::~A(temp);
4590 tree flag = create_tmp_var (boolean_type_node, "cleanup");
4591 tree ffalse = build_gimple_modify_stmt (flag, boolean_false_node);
4592 tree ftrue = build_gimple_modify_stmt (flag, boolean_true_node);
4593 cleanup = build3 (COND_EXPR, void_type_node, flag, cleanup, NULL);
4594 wce = build1 (WITH_CLEANUP_EXPR, void_type_node, cleanup);
4595 append_to_statement_list (ffalse, &gimplify_ctxp->conditional_cleanups);
4596 append_to_statement_list (wce, &gimplify_ctxp->conditional_cleanups);
4597 append_to_statement_list (ftrue, pre_p);
4599 /* Because of this manipulation, and the EH edges that jump
4600 threading cannot redirect, the temporary (VAR) will appear
4601 to be used uninitialized. Don't warn. */
4602 TREE_NO_WARNING (var) = 1;
4604 else
4606 wce = build1 (WITH_CLEANUP_EXPR, void_type_node, cleanup);
4607 CLEANUP_EH_ONLY (wce) = eh_only;
4608 append_to_statement_list (wce, pre_p);
4611 gimplify_stmt (&TREE_OPERAND (wce, 0));
4614 /* Gimplify a TARGET_EXPR which doesn't appear on the rhs of an INIT_EXPR. */
4616 static enum gimplify_status
4617 gimplify_target_expr (tree *expr_p, tree *pre_p, tree *post_p)
4619 tree targ = *expr_p;
4620 tree temp = TARGET_EXPR_SLOT (targ);
4621 tree init = TARGET_EXPR_INITIAL (targ);
4622 enum gimplify_status ret;
4624 if (init)
4626 /* TARGET_EXPR temps aren't part of the enclosing block, so add it
4627 to the temps list. Handle also variable length TARGET_EXPRs. */
4628 if (TREE_CODE (DECL_SIZE (temp)) != INTEGER_CST)
4630 if (!TYPE_SIZES_GIMPLIFIED (TREE_TYPE (temp)))
4631 gimplify_type_sizes (TREE_TYPE (temp), pre_p);
4632 gimplify_vla_decl (temp, pre_p);
4634 else
4635 gimple_add_tmp_var (temp);
4637 /* If TARGET_EXPR_INITIAL is void, then the mere evaluation of the
4638 expression is supposed to initialize the slot. */
4639 if (VOID_TYPE_P (TREE_TYPE (init)))
4640 ret = gimplify_expr (&init, pre_p, post_p, is_gimple_stmt, fb_none);
4641 else
4643 init = build2 (INIT_EXPR, void_type_node, temp, init);
4644 ret = gimplify_expr (&init, pre_p, post_p, is_gimple_stmt,
4645 fb_none);
4647 if (ret == GS_ERROR)
4649 /* PR c++/28266 Make sure this is expanded only once. */
4650 TARGET_EXPR_INITIAL (targ) = NULL_TREE;
4651 return GS_ERROR;
4653 append_to_statement_list (init, pre_p);
4655 /* If needed, push the cleanup for the temp. */
4656 if (TARGET_EXPR_CLEANUP (targ))
4658 gimplify_stmt (&TARGET_EXPR_CLEANUP (targ));
4659 gimple_push_cleanup (temp, TARGET_EXPR_CLEANUP (targ),
4660 CLEANUP_EH_ONLY (targ), pre_p);
4663 /* Only expand this once. */
4664 TREE_OPERAND (targ, 3) = init;
4665 TARGET_EXPR_INITIAL (targ) = NULL_TREE;
4667 else
4668 /* We should have expanded this before. */
4669 gcc_assert (DECL_SEEN_IN_BIND_EXPR_P (temp));
4671 *expr_p = temp;
4672 return GS_OK;
4675 /* Gimplification of expression trees. */
4677 /* Gimplify an expression which appears at statement context; usually, this
4678 means replacing it with a suitably gimple STATEMENT_LIST. */
4680 void
4681 gimplify_stmt (tree *stmt_p)
4683 gimplify_expr (stmt_p, NULL, NULL, is_gimple_stmt, fb_none);
4686 /* Similarly, but force the result to be a STATEMENT_LIST. */
4688 void
4689 gimplify_to_stmt_list (tree *stmt_p)
4691 gimplify_stmt (stmt_p);
4692 if (!*stmt_p)
4693 *stmt_p = alloc_stmt_list ();
4694 else if (TREE_CODE (*stmt_p) != STATEMENT_LIST)
4696 tree t = *stmt_p;
4697 *stmt_p = alloc_stmt_list ();
4698 append_to_statement_list (t, stmt_p);
4703 /* Add FIRSTPRIVATE entries for DECL in the OpenMP the surrounding parallels
4704 to CTX. If entries already exist, force them to be some flavor of private.
4705 If there is no enclosing parallel, do nothing. */
4707 void
4708 omp_firstprivatize_variable (struct gimplify_omp_ctx *ctx, tree decl)
4710 splay_tree_node n;
4712 if (decl == NULL || !DECL_P (decl))
4713 return;
4717 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
4718 if (n != NULL)
4720 if (n->value & GOVD_SHARED)
4721 n->value = GOVD_FIRSTPRIVATE | (n->value & GOVD_SEEN);
4722 else
4723 return;
4725 else if (ctx->is_parallel)
4726 omp_add_variable (ctx, decl, GOVD_FIRSTPRIVATE);
4728 ctx = ctx->outer_context;
4730 while (ctx);
4733 /* Similarly for each of the type sizes of TYPE. */
4735 static void
4736 omp_firstprivatize_type_sizes (struct gimplify_omp_ctx *ctx, tree type)
4738 if (type == NULL || type == error_mark_node)
4739 return;
4740 type = TYPE_MAIN_VARIANT (type);
4742 if (pointer_set_insert (ctx->privatized_types, type))
4743 return;
4745 switch (TREE_CODE (type))
4747 case INTEGER_TYPE:
4748 case ENUMERAL_TYPE:
4749 case BOOLEAN_TYPE:
4750 case REAL_TYPE:
4751 case FIXED_POINT_TYPE:
4752 omp_firstprivatize_variable (ctx, TYPE_MIN_VALUE (type));
4753 omp_firstprivatize_variable (ctx, TYPE_MAX_VALUE (type));
4754 break;
4756 case ARRAY_TYPE:
4757 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (type));
4758 omp_firstprivatize_type_sizes (ctx, TYPE_DOMAIN (type));
4759 break;
4761 case RECORD_TYPE:
4762 case UNION_TYPE:
4763 case QUAL_UNION_TYPE:
4765 tree field;
4766 for (field = TYPE_FIELDS (type); field; field = TREE_CHAIN (field))
4767 if (TREE_CODE (field) == FIELD_DECL)
4769 omp_firstprivatize_variable (ctx, DECL_FIELD_OFFSET (field));
4770 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (field));
4773 break;
4775 case POINTER_TYPE:
4776 case REFERENCE_TYPE:
4777 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (type));
4778 break;
4780 default:
4781 break;
4784 omp_firstprivatize_variable (ctx, TYPE_SIZE (type));
4785 omp_firstprivatize_variable (ctx, TYPE_SIZE_UNIT (type));
4786 lang_hooks.types.omp_firstprivatize_type_sizes (ctx, type);
4789 /* Add an entry for DECL in the OpenMP context CTX with FLAGS. */
4791 static void
4792 omp_add_variable (struct gimplify_omp_ctx *ctx, tree decl, unsigned int flags)
4794 splay_tree_node n;
4795 unsigned int nflags;
4796 tree t;
4798 if (decl == error_mark_node || TREE_TYPE (decl) == error_mark_node)
4799 return;
4801 /* Never elide decls whose type has TREE_ADDRESSABLE set. This means
4802 there are constructors involved somewhere. */
4803 if (TREE_ADDRESSABLE (TREE_TYPE (decl))
4804 || TYPE_NEEDS_CONSTRUCTING (TREE_TYPE (decl)))
4805 flags |= GOVD_SEEN;
4807 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
4808 if (n != NULL)
4810 /* We shouldn't be re-adding the decl with the same data
4811 sharing class. */
4812 gcc_assert ((n->value & GOVD_DATA_SHARE_CLASS & flags) == 0);
4813 /* The only combination of data sharing classes we should see is
4814 FIRSTPRIVATE and LASTPRIVATE. */
4815 nflags = n->value | flags;
4816 gcc_assert ((nflags & GOVD_DATA_SHARE_CLASS)
4817 == (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE));
4818 n->value = nflags;
4819 return;
4822 /* When adding a variable-sized variable, we have to handle all sorts
4823 of additional bits of data: the pointer replacement variable, and
4824 the parameters of the type. */
4825 if (DECL_SIZE (decl) && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
4827 /* Add the pointer replacement variable as PRIVATE if the variable
4828 replacement is private, else FIRSTPRIVATE since we'll need the
4829 address of the original variable either for SHARED, or for the
4830 copy into or out of the context. */
4831 if (!(flags & GOVD_LOCAL))
4833 nflags = flags & GOVD_PRIVATE ? GOVD_PRIVATE : GOVD_FIRSTPRIVATE;
4834 nflags |= flags & GOVD_SEEN;
4835 t = DECL_VALUE_EXPR (decl);
4836 gcc_assert (TREE_CODE (t) == INDIRECT_REF);
4837 t = TREE_OPERAND (t, 0);
4838 gcc_assert (DECL_P (t));
4839 omp_add_variable (ctx, t, nflags);
4842 /* Add all of the variable and type parameters (which should have
4843 been gimplified to a formal temporary) as FIRSTPRIVATE. */
4844 omp_firstprivatize_variable (ctx, DECL_SIZE_UNIT (decl));
4845 omp_firstprivatize_variable (ctx, DECL_SIZE (decl));
4846 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (decl));
4848 /* The variable-sized variable itself is never SHARED, only some form
4849 of PRIVATE. The sharing would take place via the pointer variable
4850 which we remapped above. */
4851 if (flags & GOVD_SHARED)
4852 flags = GOVD_PRIVATE | GOVD_DEBUG_PRIVATE
4853 | (flags & (GOVD_SEEN | GOVD_EXPLICIT));
4855 /* We're going to make use of the TYPE_SIZE_UNIT at least in the
4856 alloca statement we generate for the variable, so make sure it
4857 is available. This isn't automatically needed for the SHARED
4858 case, since we won't be allocating local storage then.
4859 For local variables TYPE_SIZE_UNIT might not be gimplified yet,
4860 in this case omp_notice_variable will be called later
4861 on when it is gimplified. */
4862 else if (! (flags & GOVD_LOCAL))
4863 omp_notice_variable (ctx, TYPE_SIZE_UNIT (TREE_TYPE (decl)), true);
4865 else if (lang_hooks.decls.omp_privatize_by_reference (decl))
4867 gcc_assert ((flags & GOVD_LOCAL) == 0);
4868 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (decl));
4870 /* Similar to the direct variable sized case above, we'll need the
4871 size of references being privatized. */
4872 if ((flags & GOVD_SHARED) == 0)
4874 t = TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl)));
4875 if (TREE_CODE (t) != INTEGER_CST)
4876 omp_notice_variable (ctx, t, true);
4880 splay_tree_insert (ctx->variables, (splay_tree_key)decl, flags);
4883 /* Record the fact that DECL was used within the OpenMP context CTX.
4884 IN_CODE is true when real code uses DECL, and false when we should
4885 merely emit default(none) errors. Return true if DECL is going to
4886 be remapped and thus DECL shouldn't be gimplified into its
4887 DECL_VALUE_EXPR (if any). */
4889 static bool
4890 omp_notice_variable (struct gimplify_omp_ctx *ctx, tree decl, bool in_code)
4892 splay_tree_node n;
4893 unsigned flags = in_code ? GOVD_SEEN : 0;
4894 bool ret = false, shared;
4896 if (decl == error_mark_node || TREE_TYPE (decl) == error_mark_node)
4897 return false;
4899 /* Threadprivate variables are predetermined. */
4900 if (is_global_var (decl))
4902 if (DECL_THREAD_LOCAL_P (decl))
4903 return false;
4905 if (DECL_HAS_VALUE_EXPR_P (decl))
4907 tree value = get_base_address (DECL_VALUE_EXPR (decl));
4909 if (value && DECL_P (value) && DECL_THREAD_LOCAL_P (value))
4910 return false;
4914 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
4915 if (n == NULL)
4917 enum omp_clause_default_kind default_kind, kind;
4919 if (!ctx->is_parallel)
4920 goto do_outer;
4922 /* ??? Some compiler-generated variables (like SAVE_EXPRs) could be
4923 remapped firstprivate instead of shared. To some extent this is
4924 addressed in omp_firstprivatize_type_sizes, but not effectively. */
4925 default_kind = ctx->default_kind;
4926 kind = lang_hooks.decls.omp_predetermined_sharing (decl);
4927 if (kind != OMP_CLAUSE_DEFAULT_UNSPECIFIED)
4928 default_kind = kind;
4930 switch (default_kind)
4932 case OMP_CLAUSE_DEFAULT_NONE:
4933 error ("%qs not specified in enclosing parallel",
4934 IDENTIFIER_POINTER (DECL_NAME (decl)));
4935 error ("%Henclosing parallel", &ctx->location);
4936 /* FALLTHRU */
4937 case OMP_CLAUSE_DEFAULT_SHARED:
4938 flags |= GOVD_SHARED;
4939 break;
4940 case OMP_CLAUSE_DEFAULT_PRIVATE:
4941 flags |= GOVD_PRIVATE;
4942 break;
4943 default:
4944 gcc_unreachable ();
4947 omp_add_variable (ctx, decl, flags);
4949 shared = (flags & GOVD_SHARED) != 0;
4950 ret = lang_hooks.decls.omp_disregard_value_expr (decl, shared);
4951 goto do_outer;
4954 shared = ((flags | n->value) & GOVD_SHARED) != 0;
4955 ret = lang_hooks.decls.omp_disregard_value_expr (decl, shared);
4957 /* If nothing changed, there's nothing left to do. */
4958 if ((n->value & flags) == flags)
4959 return ret;
4960 flags |= n->value;
4961 n->value = flags;
4963 do_outer:
4964 /* If the variable is private in the current context, then we don't
4965 need to propagate anything to an outer context. */
4966 if (flags & GOVD_PRIVATE)
4967 return ret;
4968 if (ctx->outer_context
4969 && omp_notice_variable (ctx->outer_context, decl, in_code))
4970 return true;
4971 return ret;
4974 /* Verify that DECL is private within CTX. If there's specific information
4975 to the contrary in the innermost scope, generate an error. */
4977 static bool
4978 omp_is_private (struct gimplify_omp_ctx *ctx, tree decl)
4980 splay_tree_node n;
4982 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
4983 if (n != NULL)
4985 if (n->value & GOVD_SHARED)
4987 if (ctx == gimplify_omp_ctxp)
4989 error ("iteration variable %qs should be private",
4990 IDENTIFIER_POINTER (DECL_NAME (decl)));
4991 n->value = GOVD_PRIVATE;
4992 return true;
4994 else
4995 return false;
4997 else if ((n->value & GOVD_EXPLICIT) != 0
4998 && (ctx == gimplify_omp_ctxp
4999 || (ctx->is_combined_parallel
5000 && gimplify_omp_ctxp->outer_context == ctx)))
5002 if ((n->value & GOVD_FIRSTPRIVATE) != 0)
5003 error ("iteration variable %qs should not be firstprivate",
5004 IDENTIFIER_POINTER (DECL_NAME (decl)));
5005 else if ((n->value & GOVD_REDUCTION) != 0)
5006 error ("iteration variable %qs should not be reduction",
5007 IDENTIFIER_POINTER (DECL_NAME (decl)));
5009 return true;
5012 if (ctx->is_parallel)
5013 return false;
5014 else if (ctx->outer_context)
5015 return omp_is_private (ctx->outer_context, decl);
5016 else
5017 return !is_global_var (decl);
5020 /* Return true if DECL is private within a parallel region
5021 that binds to the current construct's context or in parallel
5022 region's REDUCTION clause. */
5024 static bool
5025 omp_check_private (struct gimplify_omp_ctx *ctx, tree decl)
5027 splay_tree_node n;
5031 ctx = ctx->outer_context;
5032 if (ctx == NULL)
5033 return !(is_global_var (decl)
5034 /* References might be private, but might be shared too. */
5035 || lang_hooks.decls.omp_privatize_by_reference (decl));
5037 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
5038 if (n != NULL)
5039 return (n->value & GOVD_SHARED) == 0;
5041 while (!ctx->is_parallel);
5042 return false;
5045 /* Scan the OpenMP clauses in *LIST_P, installing mappings into a new
5046 and previous omp contexts. */
5048 static void
5049 gimplify_scan_omp_clauses (tree *list_p, tree *pre_p, bool in_parallel,
5050 bool in_combined_parallel)
5052 struct gimplify_omp_ctx *ctx, *outer_ctx;
5053 tree c;
5055 ctx = new_omp_context (in_parallel, in_combined_parallel);
5056 outer_ctx = ctx->outer_context;
5058 while ((c = *list_p) != NULL)
5060 enum gimplify_status gs;
5061 bool remove = false;
5062 bool notice_outer = true;
5063 const char *check_non_private = NULL;
5064 unsigned int flags;
5065 tree decl;
5067 switch (OMP_CLAUSE_CODE (c))
5069 case OMP_CLAUSE_PRIVATE:
5070 flags = GOVD_PRIVATE | GOVD_EXPLICIT;
5071 notice_outer = false;
5072 goto do_add;
5073 case OMP_CLAUSE_SHARED:
5074 flags = GOVD_SHARED | GOVD_EXPLICIT;
5075 goto do_add;
5076 case OMP_CLAUSE_FIRSTPRIVATE:
5077 flags = GOVD_FIRSTPRIVATE | GOVD_EXPLICIT;
5078 check_non_private = "firstprivate";
5079 goto do_add;
5080 case OMP_CLAUSE_LASTPRIVATE:
5081 flags = GOVD_LASTPRIVATE | GOVD_SEEN | GOVD_EXPLICIT;
5082 check_non_private = "lastprivate";
5083 goto do_add;
5084 case OMP_CLAUSE_REDUCTION:
5085 flags = GOVD_REDUCTION | GOVD_SEEN | GOVD_EXPLICIT;
5086 check_non_private = "reduction";
5087 goto do_add;
5089 do_add:
5090 decl = OMP_CLAUSE_DECL (c);
5091 if (decl == error_mark_node || TREE_TYPE (decl) == error_mark_node)
5093 remove = true;
5094 break;
5096 omp_add_variable (ctx, decl, flags);
5097 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_REDUCTION
5098 && OMP_CLAUSE_REDUCTION_PLACEHOLDER (c))
5100 omp_add_variable (ctx, OMP_CLAUSE_REDUCTION_PLACEHOLDER (c),
5101 GOVD_LOCAL | GOVD_SEEN);
5102 gimplify_omp_ctxp = ctx;
5103 push_gimplify_context ();
5104 gimplify_stmt (&OMP_CLAUSE_REDUCTION_INIT (c));
5105 pop_gimplify_context (OMP_CLAUSE_REDUCTION_INIT (c));
5106 push_gimplify_context ();
5107 gimplify_stmt (&OMP_CLAUSE_REDUCTION_MERGE (c));
5108 pop_gimplify_context (OMP_CLAUSE_REDUCTION_MERGE (c));
5109 gimplify_omp_ctxp = outer_ctx;
5111 if (notice_outer)
5112 goto do_notice;
5113 break;
5115 case OMP_CLAUSE_COPYIN:
5116 case OMP_CLAUSE_COPYPRIVATE:
5117 decl = OMP_CLAUSE_DECL (c);
5118 if (decl == error_mark_node || TREE_TYPE (decl) == error_mark_node)
5120 remove = true;
5121 break;
5123 do_notice:
5124 if (outer_ctx)
5125 omp_notice_variable (outer_ctx, decl, true);
5126 if (check_non_private
5127 && !in_parallel
5128 && omp_check_private (ctx, decl))
5130 error ("%s variable %qs is private in outer context",
5131 check_non_private, IDENTIFIER_POINTER (DECL_NAME (decl)));
5132 remove = true;
5134 break;
5136 case OMP_CLAUSE_IF:
5137 OMP_CLAUSE_OPERAND (c, 0)
5138 = gimple_boolify (OMP_CLAUSE_OPERAND (c, 0));
5139 /* Fall through. */
5141 case OMP_CLAUSE_SCHEDULE:
5142 case OMP_CLAUSE_NUM_THREADS:
5143 gs = gimplify_expr (&OMP_CLAUSE_OPERAND (c, 0), pre_p, NULL,
5144 is_gimple_val, fb_rvalue);
5145 if (gs == GS_ERROR)
5146 remove = true;
5147 break;
5149 case OMP_CLAUSE_NOWAIT:
5150 case OMP_CLAUSE_ORDERED:
5151 break;
5153 case OMP_CLAUSE_DEFAULT:
5154 ctx->default_kind = OMP_CLAUSE_DEFAULT_KIND (c);
5155 break;
5157 default:
5158 gcc_unreachable ();
5161 if (remove)
5162 *list_p = OMP_CLAUSE_CHAIN (c);
5163 else
5164 list_p = &OMP_CLAUSE_CHAIN (c);
5167 gimplify_omp_ctxp = ctx;
5170 /* For all variables that were not actually used within the context,
5171 remove PRIVATE, SHARED, and FIRSTPRIVATE clauses. */
5173 static int
5174 gimplify_adjust_omp_clauses_1 (splay_tree_node n, void *data)
5176 tree *list_p = (tree *) data;
5177 tree decl = (tree) n->key;
5178 unsigned flags = n->value;
5179 enum omp_clause_code code;
5180 tree clause;
5181 bool private_debug;
5183 if (flags & (GOVD_EXPLICIT | GOVD_LOCAL))
5184 return 0;
5185 if ((flags & GOVD_SEEN) == 0)
5186 return 0;
5187 if (flags & GOVD_DEBUG_PRIVATE)
5189 gcc_assert ((flags & GOVD_DATA_SHARE_CLASS) == GOVD_PRIVATE);
5190 private_debug = true;
5192 else
5193 private_debug
5194 = lang_hooks.decls.omp_private_debug_clause (decl,
5195 !!(flags & GOVD_SHARED));
5196 if (private_debug)
5197 code = OMP_CLAUSE_PRIVATE;
5198 else if (flags & GOVD_SHARED)
5200 if (is_global_var (decl))
5202 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp->outer_context;
5203 while (ctx != NULL)
5205 splay_tree_node on
5206 = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
5207 if (on && (on->value & (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE
5208 | GOVD_PRIVATE | GOVD_REDUCTION)) != 0)
5209 break;
5210 ctx = ctx->outer_context;
5212 if (ctx == NULL)
5213 return 0;
5215 code = OMP_CLAUSE_SHARED;
5217 else if (flags & GOVD_PRIVATE)
5218 code = OMP_CLAUSE_PRIVATE;
5219 else if (flags & GOVD_FIRSTPRIVATE)
5220 code = OMP_CLAUSE_FIRSTPRIVATE;
5221 else
5222 gcc_unreachable ();
5224 clause = build_omp_clause (code);
5225 OMP_CLAUSE_DECL (clause) = decl;
5226 OMP_CLAUSE_CHAIN (clause) = *list_p;
5227 if (private_debug)
5228 OMP_CLAUSE_PRIVATE_DEBUG (clause) = 1;
5229 *list_p = clause;
5231 return 0;
5234 static void
5235 gimplify_adjust_omp_clauses (tree *list_p)
5237 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
5238 tree c, decl;
5240 while ((c = *list_p) != NULL)
5242 splay_tree_node n;
5243 bool remove = false;
5245 switch (OMP_CLAUSE_CODE (c))
5247 case OMP_CLAUSE_PRIVATE:
5248 case OMP_CLAUSE_SHARED:
5249 case OMP_CLAUSE_FIRSTPRIVATE:
5250 decl = OMP_CLAUSE_DECL (c);
5251 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
5252 remove = !(n->value & GOVD_SEEN);
5253 if (! remove)
5255 bool shared = OMP_CLAUSE_CODE (c) == OMP_CLAUSE_SHARED;
5256 if ((n->value & GOVD_DEBUG_PRIVATE)
5257 || lang_hooks.decls.omp_private_debug_clause (decl, shared))
5259 gcc_assert ((n->value & GOVD_DEBUG_PRIVATE) == 0
5260 || ((n->value & GOVD_DATA_SHARE_CLASS)
5261 == GOVD_PRIVATE));
5262 OMP_CLAUSE_SET_CODE (c, OMP_CLAUSE_PRIVATE);
5263 OMP_CLAUSE_PRIVATE_DEBUG (c) = 1;
5266 break;
5268 case OMP_CLAUSE_LASTPRIVATE:
5269 /* Make sure OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE is set to
5270 accurately reflect the presence of a FIRSTPRIVATE clause. */
5271 decl = OMP_CLAUSE_DECL (c);
5272 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
5273 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c)
5274 = (n->value & GOVD_FIRSTPRIVATE) != 0;
5275 break;
5277 case OMP_CLAUSE_REDUCTION:
5278 case OMP_CLAUSE_COPYIN:
5279 case OMP_CLAUSE_COPYPRIVATE:
5280 case OMP_CLAUSE_IF:
5281 case OMP_CLAUSE_NUM_THREADS:
5282 case OMP_CLAUSE_SCHEDULE:
5283 case OMP_CLAUSE_NOWAIT:
5284 case OMP_CLAUSE_ORDERED:
5285 case OMP_CLAUSE_DEFAULT:
5286 break;
5288 default:
5289 gcc_unreachable ();
5292 if (remove)
5293 *list_p = OMP_CLAUSE_CHAIN (c);
5294 else
5295 list_p = &OMP_CLAUSE_CHAIN (c);
5298 /* Add in any implicit data sharing. */
5299 splay_tree_foreach (ctx->variables, gimplify_adjust_omp_clauses_1, list_p);
5301 gimplify_omp_ctxp = ctx->outer_context;
5302 delete_omp_context (ctx);
5305 /* Gimplify the contents of an OMP_PARALLEL statement. This involves
5306 gimplification of the body, as well as scanning the body for used
5307 variables. We need to do this scan now, because variable-sized
5308 decls will be decomposed during gimplification. */
5310 static enum gimplify_status
5311 gimplify_omp_parallel (tree *expr_p, tree *pre_p)
5313 tree expr = *expr_p;
5315 gimplify_scan_omp_clauses (&OMP_PARALLEL_CLAUSES (expr), pre_p, true,
5316 OMP_PARALLEL_COMBINED (expr));
5318 push_gimplify_context ();
5320 gimplify_stmt (&OMP_PARALLEL_BODY (expr));
5322 if (TREE_CODE (OMP_PARALLEL_BODY (expr)) == BIND_EXPR)
5323 pop_gimplify_context (OMP_PARALLEL_BODY (expr));
5324 else
5325 pop_gimplify_context (NULL_TREE);
5327 gimplify_adjust_omp_clauses (&OMP_PARALLEL_CLAUSES (expr));
5329 return GS_ALL_DONE;
5332 /* Gimplify the gross structure of an OMP_FOR statement. */
5334 static enum gimplify_status
5335 gimplify_omp_for (tree *expr_p, tree *pre_p)
5337 tree for_stmt, decl, var, t;
5338 enum gimplify_status ret = GS_OK;
5339 tree body, init_decl = NULL_TREE;
5341 for_stmt = *expr_p;
5343 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (for_stmt), pre_p, false, false);
5345 t = OMP_FOR_INIT (for_stmt);
5346 gcc_assert (TREE_CODE (t) == MODIFY_EXPR
5347 || TREE_CODE (t) == GIMPLE_MODIFY_STMT);
5348 decl = GENERIC_TREE_OPERAND (t, 0);
5349 gcc_assert (DECL_P (decl));
5350 gcc_assert (INTEGRAL_TYPE_P (TREE_TYPE (decl)));
5352 /* Make sure the iteration variable is private. */
5353 if (omp_is_private (gimplify_omp_ctxp, decl))
5354 omp_notice_variable (gimplify_omp_ctxp, decl, true);
5355 else
5356 omp_add_variable (gimplify_omp_ctxp, decl, GOVD_PRIVATE | GOVD_SEEN);
5358 /* If DECL is not a gimple register, create a temporary variable to act as an
5359 iteration counter. This is valid, since DECL cannot be modified in the
5360 body of the loop. */
5361 if (!is_gimple_reg (decl))
5363 var = create_tmp_var (TREE_TYPE (decl), get_name (decl));
5364 GENERIC_TREE_OPERAND (t, 0) = var;
5366 init_decl = build_gimple_modify_stmt (decl, var);
5367 omp_add_variable (gimplify_omp_ctxp, var, GOVD_PRIVATE | GOVD_SEEN);
5369 else
5370 var = decl;
5372 /* If OMP_FOR is re-gimplified, ensure all variables in pre-body
5373 are noticed. */
5374 gimplify_stmt (&OMP_FOR_PRE_BODY (for_stmt));
5376 ret |= gimplify_expr (&GENERIC_TREE_OPERAND (t, 1),
5377 &OMP_FOR_PRE_BODY (for_stmt),
5378 NULL, is_gimple_val, fb_rvalue);
5380 tree_to_gimple_tuple (&OMP_FOR_INIT (for_stmt));
5382 t = OMP_FOR_COND (for_stmt);
5383 gcc_assert (COMPARISON_CLASS_P (t));
5384 gcc_assert (GENERIC_TREE_OPERAND (t, 0) == decl);
5385 TREE_OPERAND (t, 0) = var;
5387 ret |= gimplify_expr (&GENERIC_TREE_OPERAND (t, 1),
5388 &OMP_FOR_PRE_BODY (for_stmt),
5389 NULL, is_gimple_val, fb_rvalue);
5391 tree_to_gimple_tuple (&OMP_FOR_INCR (for_stmt));
5392 t = OMP_FOR_INCR (for_stmt);
5393 switch (TREE_CODE (t))
5395 case PREINCREMENT_EXPR:
5396 case POSTINCREMENT_EXPR:
5397 t = build_int_cst (TREE_TYPE (decl), 1);
5398 t = build2 (PLUS_EXPR, TREE_TYPE (decl), var, t);
5399 t = build_gimple_modify_stmt (var, t);
5400 OMP_FOR_INCR (for_stmt) = t;
5401 break;
5403 case PREDECREMENT_EXPR:
5404 case POSTDECREMENT_EXPR:
5405 t = build_int_cst (TREE_TYPE (decl), -1);
5406 t = build2 (PLUS_EXPR, TREE_TYPE (decl), var, t);
5407 t = build_gimple_modify_stmt (var, t);
5408 OMP_FOR_INCR (for_stmt) = t;
5409 break;
5411 case GIMPLE_MODIFY_STMT:
5412 gcc_assert (GIMPLE_STMT_OPERAND (t, 0) == decl);
5413 GIMPLE_STMT_OPERAND (t, 0) = var;
5415 t = GIMPLE_STMT_OPERAND (t, 1);
5416 switch (TREE_CODE (t))
5418 case PLUS_EXPR:
5419 if (TREE_OPERAND (t, 1) == decl)
5421 TREE_OPERAND (t, 1) = TREE_OPERAND (t, 0);
5422 TREE_OPERAND (t, 0) = var;
5423 break;
5426 /* Fallthru. */
5427 case MINUS_EXPR:
5428 gcc_assert (TREE_OPERAND (t, 0) == decl);
5429 TREE_OPERAND (t, 0) = var;
5430 break;
5431 default:
5432 gcc_unreachable ();
5435 ret |= gimplify_expr (&TREE_OPERAND (t, 1), &OMP_FOR_PRE_BODY (for_stmt),
5436 NULL, is_gimple_val, fb_rvalue);
5437 break;
5439 default:
5440 gcc_unreachable ();
5443 body = OMP_FOR_BODY (for_stmt);
5444 gimplify_to_stmt_list (&body);
5445 t = alloc_stmt_list ();
5446 if (init_decl)
5447 append_to_statement_list (init_decl, &t);
5448 append_to_statement_list (body, &t);
5449 OMP_FOR_BODY (for_stmt) = t;
5450 gimplify_adjust_omp_clauses (&OMP_FOR_CLAUSES (for_stmt));
5452 return ret == GS_ALL_DONE ? GS_ALL_DONE : GS_ERROR;
5455 /* Gimplify the gross structure of other OpenMP worksharing constructs.
5456 In particular, OMP_SECTIONS and OMP_SINGLE. */
5458 static enum gimplify_status
5459 gimplify_omp_workshare (tree *expr_p, tree *pre_p)
5461 tree stmt = *expr_p;
5463 gimplify_scan_omp_clauses (&OMP_CLAUSES (stmt), pre_p, false, false);
5464 gimplify_to_stmt_list (&OMP_BODY (stmt));
5465 gimplify_adjust_omp_clauses (&OMP_CLAUSES (stmt));
5467 return GS_ALL_DONE;
5470 /* A subroutine of gimplify_omp_atomic. The front end is supposed to have
5471 stabilized the lhs of the atomic operation as *ADDR. Return true if
5472 EXPR is this stabilized form. */
5474 static bool
5475 goa_lhs_expr_p (tree expr, tree addr)
5477 /* Also include casts to other type variants. The C front end is fond
5478 of adding these for e.g. volatile variables. This is like
5479 STRIP_TYPE_NOPS but includes the main variant lookup. */
5480 while ((TREE_CODE (expr) == NOP_EXPR
5481 || TREE_CODE (expr) == CONVERT_EXPR
5482 || TREE_CODE (expr) == NON_LVALUE_EXPR)
5483 && TREE_OPERAND (expr, 0) != error_mark_node
5484 && (TYPE_MAIN_VARIANT (TREE_TYPE (expr))
5485 == TYPE_MAIN_VARIANT (TREE_TYPE (TREE_OPERAND (expr, 0)))))
5486 expr = TREE_OPERAND (expr, 0);
5488 if (TREE_CODE (expr) == INDIRECT_REF)
5490 expr = TREE_OPERAND (expr, 0);
5491 while (expr != addr
5492 && (TREE_CODE (expr) == NOP_EXPR
5493 || TREE_CODE (expr) == CONVERT_EXPR
5494 || TREE_CODE (expr) == NON_LVALUE_EXPR)
5495 && TREE_CODE (expr) == TREE_CODE (addr)
5496 && TYPE_MAIN_VARIANT (TREE_TYPE (expr))
5497 == TYPE_MAIN_VARIANT (TREE_TYPE (addr)))
5499 expr = TREE_OPERAND (expr, 0);
5500 addr = TREE_OPERAND (addr, 0);
5502 if (expr == addr)
5503 return true;
5504 return (TREE_CODE (addr) == ADDR_EXPR
5505 && TREE_CODE (expr) == ADDR_EXPR
5506 && TREE_OPERAND (addr, 0) == TREE_OPERAND (expr, 0));
5508 if (TREE_CODE (addr) == ADDR_EXPR && expr == TREE_OPERAND (addr, 0))
5509 return true;
5510 return false;
5513 /* Walk *EXPR_P and replace
5514 appearances of *LHS_ADDR with LHS_VAR. If an expression does not involve
5515 the lhs, evaluate it into a temporary. Return 1 if the lhs appeared as
5516 a subexpression, 0 if it did not, or -1 if an error was encountered. */
5518 static int
5519 goa_stabilize_expr (tree *expr_p, tree *pre_p, tree lhs_addr, tree lhs_var)
5521 tree expr = *expr_p;
5522 int saw_lhs;
5524 if (goa_lhs_expr_p (expr, lhs_addr))
5526 *expr_p = lhs_var;
5527 return 1;
5529 if (is_gimple_val (expr))
5530 return 0;
5532 saw_lhs = 0;
5533 switch (TREE_CODE_CLASS (TREE_CODE (expr)))
5535 case tcc_binary:
5536 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 1), pre_p,
5537 lhs_addr, lhs_var);
5538 case tcc_unary:
5539 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 0), pre_p,
5540 lhs_addr, lhs_var);
5541 break;
5542 default:
5543 break;
5546 if (saw_lhs == 0)
5548 enum gimplify_status gs;
5549 gs = gimplify_expr (expr_p, pre_p, NULL, is_gimple_val, fb_rvalue);
5550 if (gs != GS_ALL_DONE)
5551 saw_lhs = -1;
5554 return saw_lhs;
5557 /* Gimplify an OMP_ATOMIC statement. */
5559 static enum gimplify_status
5560 gimplify_omp_atomic (tree *expr_p, tree *pre_p)
5562 tree addr = TREE_OPERAND (*expr_p, 0);
5563 tree rhs = TREE_OPERAND (*expr_p, 1);
5564 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (addr)));
5565 tree tmp_load, load, store;
5567 tmp_load = create_tmp_var (type, NULL);
5568 if (goa_stabilize_expr (&rhs, pre_p, addr, tmp_load) < 0)
5569 return GS_ERROR;
5571 if (gimplify_expr (&addr, pre_p, NULL, is_gimple_val, fb_rvalue)
5572 != GS_ALL_DONE)
5573 return GS_ERROR;
5575 load = build2 (OMP_ATOMIC_LOAD, void_type_node, tmp_load, addr);
5576 append_to_statement_list (load, pre_p);
5577 if (gimplify_expr (&rhs, pre_p, NULL, is_gimple_val, fb_rvalue)
5578 != GS_ALL_DONE)
5579 return GS_ERROR;
5580 store = build1 (OMP_ATOMIC_STORE, void_type_node, rhs);
5581 *expr_p = store;
5583 return GS_ALL_DONE;
5587 /* Gimplifies the expression tree pointed to by EXPR_P. Return 0 if
5588 gimplification failed.
5590 PRE_P points to the list where side effects that must happen before
5591 EXPR should be stored.
5593 POST_P points to the list where side effects that must happen after
5594 EXPR should be stored, or NULL if there is no suitable list. In
5595 that case, we copy the result to a temporary, emit the
5596 post-effects, and then return the temporary.
5598 GIMPLE_TEST_F points to a function that takes a tree T and
5599 returns nonzero if T is in the GIMPLE form requested by the
5600 caller. The GIMPLE predicates are in tree-gimple.c.
5602 This test is used twice. Before gimplification, the test is
5603 invoked to determine whether *EXPR_P is already gimple enough. If
5604 that fails, *EXPR_P is gimplified according to its code and
5605 GIMPLE_TEST_F is called again. If the test still fails, then a new
5606 temporary variable is created and assigned the value of the
5607 gimplified expression.
5609 FALLBACK tells the function what sort of a temporary we want. If the 1
5610 bit is set, an rvalue is OK. If the 2 bit is set, an lvalue is OK.
5611 If both are set, either is OK, but an lvalue is preferable.
5613 The return value is either GS_ERROR or GS_ALL_DONE, since this function
5614 iterates until solution. */
5616 enum gimplify_status
5617 gimplify_expr (tree *expr_p, tree *pre_p, tree *post_p,
5618 bool (* gimple_test_f) (tree), fallback_t fallback)
5620 tree tmp;
5621 tree internal_pre = NULL_TREE;
5622 tree internal_post = NULL_TREE;
5623 tree save_expr;
5624 int is_statement = (pre_p == NULL);
5625 location_t saved_location;
5626 enum gimplify_status ret;
5628 save_expr = *expr_p;
5629 if (save_expr == NULL_TREE)
5630 return GS_ALL_DONE;
5632 /* We used to check the predicate here and return immediately if it
5633 succeeds. This is wrong; the design is for gimplification to be
5634 idempotent, and for the predicates to only test for valid forms, not
5635 whether they are fully simplified. */
5637 /* Set up our internal queues if needed. */
5638 if (pre_p == NULL)
5639 pre_p = &internal_pre;
5640 if (post_p == NULL)
5641 post_p = &internal_post;
5643 saved_location = input_location;
5644 if (save_expr != error_mark_node
5645 && EXPR_HAS_LOCATION (*expr_p))
5646 input_location = EXPR_LOCATION (*expr_p);
5648 /* Loop over the specific gimplifiers until the toplevel node
5649 remains the same. */
5652 /* Strip away as many useless type conversions as possible
5653 at the toplevel. */
5654 STRIP_USELESS_TYPE_CONVERSION (*expr_p);
5656 /* Remember the expr. */
5657 save_expr = *expr_p;
5659 /* Die, die, die, my darling. */
5660 if (save_expr == error_mark_node
5661 || (!GIMPLE_STMT_P (save_expr)
5662 && TREE_TYPE (save_expr)
5663 && TREE_TYPE (save_expr) == error_mark_node))
5665 ret = GS_ERROR;
5666 break;
5669 /* Do any language-specific gimplification. */
5670 ret = lang_hooks.gimplify_expr (expr_p, pre_p, post_p);
5671 if (ret == GS_OK)
5673 if (*expr_p == NULL_TREE)
5674 break;
5675 if (*expr_p != save_expr)
5676 continue;
5678 else if (ret != GS_UNHANDLED)
5679 break;
5681 ret = GS_OK;
5682 switch (TREE_CODE (*expr_p))
5684 /* First deal with the special cases. */
5686 case POSTINCREMENT_EXPR:
5687 case POSTDECREMENT_EXPR:
5688 case PREINCREMENT_EXPR:
5689 case PREDECREMENT_EXPR:
5690 ret = gimplify_self_mod_expr (expr_p, pre_p, post_p,
5691 fallback != fb_none);
5692 break;
5694 case ARRAY_REF:
5695 case ARRAY_RANGE_REF:
5696 case REALPART_EXPR:
5697 case IMAGPART_EXPR:
5698 case COMPONENT_REF:
5699 case VIEW_CONVERT_EXPR:
5700 ret = gimplify_compound_lval (expr_p, pre_p, post_p,
5701 fallback ? fallback : fb_rvalue);
5702 break;
5704 case COND_EXPR:
5705 ret = gimplify_cond_expr (expr_p, pre_p, fallback);
5706 /* C99 code may assign to an array in a structure value of a
5707 conditional expression, and this has undefined behavior
5708 only on execution, so create a temporary if an lvalue is
5709 required. */
5710 if (fallback == fb_lvalue)
5712 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
5713 mark_addressable (*expr_p);
5715 break;
5717 case CALL_EXPR:
5718 ret = gimplify_call_expr (expr_p, pre_p, fallback != fb_none);
5719 /* C99 code may assign to an array in a structure returned
5720 from a function, and this has undefined behavior only on
5721 execution, so create a temporary if an lvalue is
5722 required. */
5723 if (fallback == fb_lvalue)
5725 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
5726 mark_addressable (*expr_p);
5728 break;
5730 case TREE_LIST:
5731 gcc_unreachable ();
5733 case COMPOUND_EXPR:
5734 ret = gimplify_compound_expr (expr_p, pre_p, fallback != fb_none);
5735 break;
5737 case MODIFY_EXPR:
5738 case GIMPLE_MODIFY_STMT:
5739 case INIT_EXPR:
5740 ret = gimplify_modify_expr (expr_p, pre_p, post_p,
5741 fallback != fb_none);
5743 if (*expr_p && ret != GS_ERROR)
5745 /* The distinction between MODIFY_EXPR and INIT_EXPR is no longer
5746 useful. */
5747 if (TREE_CODE (*expr_p) == INIT_EXPR)
5748 TREE_SET_CODE (*expr_p, MODIFY_EXPR);
5750 /* Convert MODIFY_EXPR to GIMPLE_MODIFY_STMT. */
5751 if (TREE_CODE (*expr_p) == MODIFY_EXPR)
5752 tree_to_gimple_tuple (expr_p);
5755 break;
5757 case TRUTH_ANDIF_EXPR:
5758 case TRUTH_ORIF_EXPR:
5759 ret = gimplify_boolean_expr (expr_p);
5760 break;
5762 case TRUTH_NOT_EXPR:
5763 if (TREE_CODE (TREE_TYPE (*expr_p)) != BOOLEAN_TYPE)
5765 tree type = TREE_TYPE (*expr_p);
5766 *expr_p = fold_convert (type, gimple_boolify (*expr_p));
5767 ret = GS_OK;
5768 break;
5771 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
5772 is_gimple_val, fb_rvalue);
5773 recalculate_side_effects (*expr_p);
5774 break;
5776 case ADDR_EXPR:
5777 ret = gimplify_addr_expr (expr_p, pre_p, post_p);
5778 break;
5780 case VA_ARG_EXPR:
5781 ret = gimplify_va_arg_expr (expr_p, pre_p, post_p);
5782 break;
5784 case CONVERT_EXPR:
5785 case NOP_EXPR:
5786 if (IS_EMPTY_STMT (*expr_p))
5788 ret = GS_ALL_DONE;
5789 break;
5792 if (VOID_TYPE_P (TREE_TYPE (*expr_p))
5793 || fallback == fb_none)
5795 /* Just strip a conversion to void (or in void context) and
5796 try again. */
5797 *expr_p = TREE_OPERAND (*expr_p, 0);
5798 break;
5801 ret = gimplify_conversion (expr_p);
5802 if (ret == GS_ERROR)
5803 break;
5804 if (*expr_p != save_expr)
5805 break;
5806 /* FALLTHRU */
5808 case FIX_TRUNC_EXPR:
5809 /* unary_expr: ... | '(' cast ')' val | ... */
5810 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
5811 is_gimple_val, fb_rvalue);
5812 recalculate_side_effects (*expr_p);
5813 break;
5815 case INDIRECT_REF:
5816 *expr_p = fold_indirect_ref (*expr_p);
5817 if (*expr_p != save_expr)
5818 break;
5819 /* else fall through. */
5820 case ALIGN_INDIRECT_REF:
5821 case MISALIGNED_INDIRECT_REF:
5822 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
5823 is_gimple_reg, fb_rvalue);
5824 recalculate_side_effects (*expr_p);
5825 break;
5827 /* Constants need not be gimplified. */
5828 case INTEGER_CST:
5829 case REAL_CST:
5830 case FIXED_CST:
5831 case STRING_CST:
5832 case COMPLEX_CST:
5833 case VECTOR_CST:
5834 ret = GS_ALL_DONE;
5835 break;
5837 case CONST_DECL:
5838 /* If we require an lvalue, such as for ADDR_EXPR, retain the
5839 CONST_DECL node. Otherwise the decl is replaceable by its
5840 value. */
5841 /* ??? Should be == fb_lvalue, but ADDR_EXPR passes fb_either. */
5842 if (fallback & fb_lvalue)
5843 ret = GS_ALL_DONE;
5844 else
5845 *expr_p = DECL_INITIAL (*expr_p);
5846 break;
5848 case DECL_EXPR:
5849 ret = gimplify_decl_expr (expr_p);
5850 break;
5852 case EXC_PTR_EXPR:
5853 /* FIXME make this a decl. */
5854 ret = GS_ALL_DONE;
5855 break;
5857 case BIND_EXPR:
5858 ret = gimplify_bind_expr (expr_p, pre_p);
5859 break;
5861 case LOOP_EXPR:
5862 ret = gimplify_loop_expr (expr_p, pre_p);
5863 break;
5865 case SWITCH_EXPR:
5866 ret = gimplify_switch_expr (expr_p, pre_p);
5867 break;
5869 case EXIT_EXPR:
5870 ret = gimplify_exit_expr (expr_p);
5871 break;
5873 case GOTO_EXPR:
5874 /* If the target is not LABEL, then it is a computed jump
5875 and the target needs to be gimplified. */
5876 if (TREE_CODE (GOTO_DESTINATION (*expr_p)) != LABEL_DECL)
5877 ret = gimplify_expr (&GOTO_DESTINATION (*expr_p), pre_p,
5878 NULL, is_gimple_val, fb_rvalue);
5879 break;
5881 case LABEL_EXPR:
5882 ret = GS_ALL_DONE;
5883 gcc_assert (decl_function_context (LABEL_EXPR_LABEL (*expr_p))
5884 == current_function_decl);
5885 break;
5887 case CASE_LABEL_EXPR:
5888 ret = gimplify_case_label_expr (expr_p);
5889 break;
5891 case RETURN_EXPR:
5892 ret = gimplify_return_expr (*expr_p, pre_p);
5893 break;
5895 case CONSTRUCTOR:
5896 /* Don't reduce this in place; let gimplify_init_constructor work its
5897 magic. Buf if we're just elaborating this for side effects, just
5898 gimplify any element that has side-effects. */
5899 if (fallback == fb_none)
5901 unsigned HOST_WIDE_INT ix;
5902 constructor_elt *ce;
5903 tree temp = NULL_TREE;
5904 for (ix = 0;
5905 VEC_iterate (constructor_elt, CONSTRUCTOR_ELTS (*expr_p),
5906 ix, ce);
5907 ix++)
5908 if (TREE_SIDE_EFFECTS (ce->value))
5909 append_to_statement_list (ce->value, &temp);
5911 *expr_p = temp;
5912 ret = GS_OK;
5914 /* C99 code may assign to an array in a constructed
5915 structure or union, and this has undefined behavior only
5916 on execution, so create a temporary if an lvalue is
5917 required. */
5918 else if (fallback == fb_lvalue)
5920 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
5921 mark_addressable (*expr_p);
5923 else
5924 ret = GS_ALL_DONE;
5925 break;
5927 /* The following are special cases that are not handled by the
5928 original GIMPLE grammar. */
5930 /* SAVE_EXPR nodes are converted into a GIMPLE identifier and
5931 eliminated. */
5932 case SAVE_EXPR:
5933 ret = gimplify_save_expr (expr_p, pre_p, post_p);
5934 break;
5936 case BIT_FIELD_REF:
5938 enum gimplify_status r0, r1, r2;
5940 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
5941 is_gimple_lvalue, fb_either);
5942 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
5943 is_gimple_val, fb_rvalue);
5944 r2 = gimplify_expr (&TREE_OPERAND (*expr_p, 2), pre_p, post_p,
5945 is_gimple_val, fb_rvalue);
5946 recalculate_side_effects (*expr_p);
5948 ret = MIN (r0, MIN (r1, r2));
5950 break;
5952 case NON_LVALUE_EXPR:
5953 /* This should have been stripped above. */
5954 gcc_unreachable ();
5956 case ASM_EXPR:
5957 ret = gimplify_asm_expr (expr_p, pre_p, post_p);
5958 break;
5960 case TRY_FINALLY_EXPR:
5961 case TRY_CATCH_EXPR:
5962 gimplify_to_stmt_list (&TREE_OPERAND (*expr_p, 0));
5963 gimplify_to_stmt_list (&TREE_OPERAND (*expr_p, 1));
5964 ret = GS_ALL_DONE;
5965 break;
5967 case CLEANUP_POINT_EXPR:
5968 ret = gimplify_cleanup_point_expr (expr_p, pre_p);
5969 break;
5971 case TARGET_EXPR:
5972 ret = gimplify_target_expr (expr_p, pre_p, post_p);
5973 break;
5975 case CATCH_EXPR:
5976 gimplify_to_stmt_list (&CATCH_BODY (*expr_p));
5977 ret = GS_ALL_DONE;
5978 break;
5980 case EH_FILTER_EXPR:
5981 gimplify_to_stmt_list (&EH_FILTER_FAILURE (*expr_p));
5982 ret = GS_ALL_DONE;
5983 break;
5985 case CHANGE_DYNAMIC_TYPE_EXPR:
5986 ret = gimplify_expr (&CHANGE_DYNAMIC_TYPE_LOCATION (*expr_p),
5987 pre_p, post_p, is_gimple_reg, fb_lvalue);
5988 break;
5990 case OBJ_TYPE_REF:
5992 enum gimplify_status r0, r1;
5993 r0 = gimplify_expr (&OBJ_TYPE_REF_OBJECT (*expr_p), pre_p, post_p,
5994 is_gimple_val, fb_rvalue);
5995 r1 = gimplify_expr (&OBJ_TYPE_REF_EXPR (*expr_p), pre_p, post_p,
5996 is_gimple_val, fb_rvalue);
5997 ret = MIN (r0, r1);
5999 break;
6001 case LABEL_DECL:
6002 /* We get here when taking the address of a label. We mark
6003 the label as "forced"; meaning it can never be removed and
6004 it is a potential target for any computed goto. */
6005 FORCED_LABEL (*expr_p) = 1;
6006 ret = GS_ALL_DONE;
6007 break;
6009 case STATEMENT_LIST:
6010 ret = gimplify_statement_list (expr_p, pre_p);
6011 break;
6013 case WITH_SIZE_EXPR:
6015 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
6016 post_p == &internal_post ? NULL : post_p,
6017 gimple_test_f, fallback);
6018 gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
6019 is_gimple_val, fb_rvalue);
6021 break;
6023 case VAR_DECL:
6024 case PARM_DECL:
6025 ret = gimplify_var_or_parm_decl (expr_p);
6026 break;
6028 case RESULT_DECL:
6029 /* When within an OpenMP context, notice uses of variables. */
6030 if (gimplify_omp_ctxp)
6031 omp_notice_variable (gimplify_omp_ctxp, *expr_p, true);
6032 ret = GS_ALL_DONE;
6033 break;
6035 case SSA_NAME:
6036 /* Allow callbacks into the gimplifier during optimization. */
6037 ret = GS_ALL_DONE;
6038 break;
6040 case OMP_PARALLEL:
6041 ret = gimplify_omp_parallel (expr_p, pre_p);
6042 break;
6044 case OMP_FOR:
6045 ret = gimplify_omp_for (expr_p, pre_p);
6046 break;
6048 case OMP_SECTIONS:
6049 case OMP_SINGLE:
6050 ret = gimplify_omp_workshare (expr_p, pre_p);
6051 break;
6053 case OMP_SECTION:
6054 case OMP_MASTER:
6055 case OMP_ORDERED:
6056 case OMP_CRITICAL:
6057 gimplify_to_stmt_list (&OMP_BODY (*expr_p));
6058 break;
6060 case OMP_ATOMIC:
6061 ret = gimplify_omp_atomic (expr_p, pre_p);
6062 break;
6064 case OMP_RETURN:
6065 case OMP_CONTINUE:
6066 case OMP_ATOMIC_STORE:
6067 ret = GS_ALL_DONE;
6068 break;
6070 case OMP_ATOMIC_LOAD:
6071 if (gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, NULL,
6072 is_gimple_val, fb_rvalue) != GS_ALL_DONE)
6073 ret = GS_ERROR;
6074 else
6075 ret = GS_ALL_DONE;
6076 break;
6078 case POINTER_PLUS_EXPR:
6079 /* Convert ((type *)A)+offset into &A->field_of_type_and_offset.
6080 The second is gimple immediate saving a need for extra statement.
6082 if (TREE_CODE (TREE_OPERAND (*expr_p, 1)) == INTEGER_CST
6083 && (tmp = maybe_fold_offset_to_reference
6084 (TREE_OPERAND (*expr_p, 0), TREE_OPERAND (*expr_p, 1),
6085 TREE_TYPE (TREE_TYPE (*expr_p)))))
6087 tree ptr_type = build_pointer_type (TREE_TYPE (tmp));
6088 if (useless_type_conversion_p (TREE_TYPE (*expr_p), ptr_type))
6090 *expr_p = build_fold_addr_expr_with_type (tmp, ptr_type);
6091 break;
6094 /* Convert (void *)&a + 4 into (void *)&a[1]. */
6095 if (TREE_CODE (TREE_OPERAND (*expr_p, 0)) == NOP_EXPR
6096 && TREE_CODE (TREE_OPERAND (*expr_p, 1)) == INTEGER_CST
6097 && POINTER_TYPE_P (TREE_TYPE (TREE_OPERAND (TREE_OPERAND (*expr_p,
6098 0),0)))
6099 && (tmp = maybe_fold_offset_to_reference
6100 (TREE_OPERAND (TREE_OPERAND (*expr_p, 0), 0),
6101 TREE_OPERAND (*expr_p, 1),
6102 TREE_TYPE (TREE_TYPE
6103 (TREE_OPERAND (TREE_OPERAND (*expr_p, 0),
6104 0))))))
6106 tmp = build_fold_addr_expr (tmp);
6107 *expr_p = fold_convert (TREE_TYPE (*expr_p), tmp);
6108 break;
6110 /* FALLTHRU */
6111 default:
6112 switch (TREE_CODE_CLASS (TREE_CODE (*expr_p)))
6114 case tcc_comparison:
6115 /* Handle comparison of objects of non scalar mode aggregates
6116 with a call to memcmp. It would be nice to only have to do
6117 this for variable-sized objects, but then we'd have to allow
6118 the same nest of reference nodes we allow for MODIFY_EXPR and
6119 that's too complex.
6121 Compare scalar mode aggregates as scalar mode values. Using
6122 memcmp for them would be very inefficient at best, and is
6123 plain wrong if bitfields are involved. */
6126 tree type = TREE_TYPE (TREE_OPERAND (*expr_p, 1));
6128 if (!AGGREGATE_TYPE_P (type))
6129 goto expr_2;
6130 else if (TYPE_MODE (type) != BLKmode)
6131 ret = gimplify_scalar_mode_aggregate_compare (expr_p);
6132 else
6133 ret = gimplify_variable_sized_compare (expr_p);
6135 break;
6138 /* If *EXPR_P does not need to be special-cased, handle it
6139 according to its class. */
6140 case tcc_unary:
6141 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
6142 post_p, is_gimple_val, fb_rvalue);
6143 break;
6145 case tcc_binary:
6146 expr_2:
6148 enum gimplify_status r0, r1;
6150 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
6151 post_p, is_gimple_val, fb_rvalue);
6152 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
6153 post_p, is_gimple_val, fb_rvalue);
6155 ret = MIN (r0, r1);
6156 break;
6159 case tcc_declaration:
6160 case tcc_constant:
6161 ret = GS_ALL_DONE;
6162 goto dont_recalculate;
6164 default:
6165 gcc_assert (TREE_CODE (*expr_p) == TRUTH_AND_EXPR
6166 || TREE_CODE (*expr_p) == TRUTH_OR_EXPR
6167 || TREE_CODE (*expr_p) == TRUTH_XOR_EXPR);
6168 goto expr_2;
6171 recalculate_side_effects (*expr_p);
6172 dont_recalculate:
6173 break;
6176 /* If we replaced *expr_p, gimplify again. */
6177 if (ret == GS_OK && (*expr_p == NULL || *expr_p == save_expr))
6178 ret = GS_ALL_DONE;
6180 while (ret == GS_OK);
6182 /* If we encountered an error_mark somewhere nested inside, either
6183 stub out the statement or propagate the error back out. */
6184 if (ret == GS_ERROR)
6186 if (is_statement)
6187 *expr_p = NULL;
6188 goto out;
6191 /* This was only valid as a return value from the langhook, which
6192 we handled. Make sure it doesn't escape from any other context. */
6193 gcc_assert (ret != GS_UNHANDLED);
6195 if (fallback == fb_none && *expr_p && !is_gimple_stmt (*expr_p))
6197 /* We aren't looking for a value, and we don't have a valid
6198 statement. If it doesn't have side-effects, throw it away. */
6199 if (!TREE_SIDE_EFFECTS (*expr_p))
6200 *expr_p = NULL;
6201 else if (!TREE_THIS_VOLATILE (*expr_p))
6203 /* This is probably a _REF that contains something nested that
6204 has side effects. Recurse through the operands to find it. */
6205 enum tree_code code = TREE_CODE (*expr_p);
6207 switch (code)
6209 case COMPONENT_REF:
6210 case REALPART_EXPR:
6211 case IMAGPART_EXPR:
6212 case VIEW_CONVERT_EXPR:
6213 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
6214 gimple_test_f, fallback);
6215 break;
6217 case ARRAY_REF:
6218 case ARRAY_RANGE_REF:
6219 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
6220 gimple_test_f, fallback);
6221 gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
6222 gimple_test_f, fallback);
6223 break;
6225 default:
6226 /* Anything else with side-effects must be converted to
6227 a valid statement before we get here. */
6228 gcc_unreachable ();
6231 *expr_p = NULL;
6233 else if (COMPLETE_TYPE_P (TREE_TYPE (*expr_p))
6234 && TYPE_MODE (TREE_TYPE (*expr_p)) != BLKmode)
6236 /* Historically, the compiler has treated a bare reference
6237 to a non-BLKmode volatile lvalue as forcing a load. */
6238 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (*expr_p));
6239 /* Normally, we do not want to create a temporary for a
6240 TREE_ADDRESSABLE type because such a type should not be
6241 copied by bitwise-assignment. However, we make an
6242 exception here, as all we are doing here is ensuring that
6243 we read the bytes that make up the type. We use
6244 create_tmp_var_raw because create_tmp_var will abort when
6245 given a TREE_ADDRESSABLE type. */
6246 tree tmp = create_tmp_var_raw (type, "vol");
6247 gimple_add_tmp_var (tmp);
6248 *expr_p = build_gimple_modify_stmt (tmp, *expr_p);
6250 else
6251 /* We can't do anything useful with a volatile reference to
6252 an incomplete type, so just throw it away. Likewise for
6253 a BLKmode type, since any implicit inner load should
6254 already have been turned into an explicit one by the
6255 gimplification process. */
6256 *expr_p = NULL;
6259 /* If we are gimplifying at the statement level, we're done. Tack
6260 everything together and replace the original statement with the
6261 gimplified form. */
6262 if (fallback == fb_none || is_statement)
6264 if (internal_pre || internal_post)
6266 append_to_statement_list (*expr_p, &internal_pre);
6267 append_to_statement_list (internal_post, &internal_pre);
6268 annotate_all_with_locus (&internal_pre, input_location);
6269 *expr_p = internal_pre;
6271 else if (!*expr_p)
6273 else if (TREE_CODE (*expr_p) == STATEMENT_LIST)
6274 annotate_all_with_locus (expr_p, input_location);
6275 else
6276 annotate_one_with_locus (*expr_p, input_location);
6277 goto out;
6280 /* Otherwise we're gimplifying a subexpression, so the resulting value is
6281 interesting. */
6283 /* If it's sufficiently simple already, we're done. Unless we are
6284 handling some post-effects internally; if that's the case, we need to
6285 copy into a temp before adding the post-effects to the tree. */
6286 if (!internal_post && (*gimple_test_f) (*expr_p))
6287 goto out;
6289 /* Otherwise, we need to create a new temporary for the gimplified
6290 expression. */
6292 /* We can't return an lvalue if we have an internal postqueue. The
6293 object the lvalue refers to would (probably) be modified by the
6294 postqueue; we need to copy the value out first, which means an
6295 rvalue. */
6296 if ((fallback & fb_lvalue) && !internal_post
6297 && is_gimple_addressable (*expr_p))
6299 /* An lvalue will do. Take the address of the expression, store it
6300 in a temporary, and replace the expression with an INDIRECT_REF of
6301 that temporary. */
6302 tmp = build_fold_addr_expr (*expr_p);
6303 gimplify_expr (&tmp, pre_p, post_p, is_gimple_reg, fb_rvalue);
6304 *expr_p = build1 (INDIRECT_REF, TREE_TYPE (TREE_TYPE (tmp)), tmp);
6306 else if ((fallback & fb_rvalue) && is_gimple_formal_tmp_rhs (*expr_p))
6308 gcc_assert (!VOID_TYPE_P (TREE_TYPE (*expr_p)));
6310 /* An rvalue will do. Assign the gimplified expression into a new
6311 temporary TMP and replace the original expression with TMP. */
6313 if (internal_post || (fallback & fb_lvalue))
6314 /* The postqueue might change the value of the expression between
6315 the initialization and use of the temporary, so we can't use a
6316 formal temp. FIXME do we care? */
6317 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
6318 else
6319 *expr_p = get_formal_tmp_var (*expr_p, pre_p);
6321 if (TREE_CODE (*expr_p) != SSA_NAME)
6322 DECL_GIMPLE_FORMAL_TEMP_P (*expr_p) = 1;
6324 else
6326 #ifdef ENABLE_CHECKING
6327 if (!(fallback & fb_mayfail))
6329 fprintf (stderr, "gimplification failed:\n");
6330 print_generic_expr (stderr, *expr_p, 0);
6331 debug_tree (*expr_p);
6332 internal_error ("gimplification failed");
6334 #endif
6335 gcc_assert (fallback & fb_mayfail);
6336 /* If this is an asm statement, and the user asked for the
6337 impossible, don't die. Fail and let gimplify_asm_expr
6338 issue an error. */
6339 ret = GS_ERROR;
6340 goto out;
6343 /* Make sure the temporary matches our predicate. */
6344 gcc_assert ((*gimple_test_f) (*expr_p));
6346 if (internal_post)
6348 annotate_all_with_locus (&internal_post, input_location);
6349 append_to_statement_list (internal_post, pre_p);
6352 out:
6353 input_location = saved_location;
6354 return ret;
6357 /* Look through TYPE for variable-sized objects and gimplify each such
6358 size that we find. Add to LIST_P any statements generated. */
6360 void
6361 gimplify_type_sizes (tree type, tree *list_p)
6363 tree field, t;
6365 if (type == NULL || type == error_mark_node)
6366 return;
6368 /* We first do the main variant, then copy into any other variants. */
6369 type = TYPE_MAIN_VARIANT (type);
6371 /* Avoid infinite recursion. */
6372 if (TYPE_SIZES_GIMPLIFIED (type))
6373 return;
6375 TYPE_SIZES_GIMPLIFIED (type) = 1;
6377 switch (TREE_CODE (type))
6379 case INTEGER_TYPE:
6380 case ENUMERAL_TYPE:
6381 case BOOLEAN_TYPE:
6382 case REAL_TYPE:
6383 case FIXED_POINT_TYPE:
6384 gimplify_one_sizepos (&TYPE_MIN_VALUE (type), list_p);
6385 gimplify_one_sizepos (&TYPE_MAX_VALUE (type), list_p);
6387 for (t = TYPE_NEXT_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
6389 TYPE_MIN_VALUE (t) = TYPE_MIN_VALUE (type);
6390 TYPE_MAX_VALUE (t) = TYPE_MAX_VALUE (type);
6392 break;
6394 case ARRAY_TYPE:
6395 /* These types may not have declarations, so handle them here. */
6396 gimplify_type_sizes (TREE_TYPE (type), list_p);
6397 gimplify_type_sizes (TYPE_DOMAIN (type), list_p);
6398 break;
6400 case RECORD_TYPE:
6401 case UNION_TYPE:
6402 case QUAL_UNION_TYPE:
6403 for (field = TYPE_FIELDS (type); field; field = TREE_CHAIN (field))
6404 if (TREE_CODE (field) == FIELD_DECL)
6406 gimplify_one_sizepos (&DECL_FIELD_OFFSET (field), list_p);
6407 gimplify_type_sizes (TREE_TYPE (field), list_p);
6409 break;
6411 case POINTER_TYPE:
6412 case REFERENCE_TYPE:
6413 /* We used to recurse on the pointed-to type here, which turned out to
6414 be incorrect because its definition might refer to variables not
6415 yet initialized at this point if a forward declaration is involved.
6417 It was actually useful for anonymous pointed-to types to ensure
6418 that the sizes evaluation dominates every possible later use of the
6419 values. Restricting to such types here would be safe since there
6420 is no possible forward declaration around, but would introduce an
6421 undesirable middle-end semantic to anonymity. We then defer to
6422 front-ends the responsibility of ensuring that the sizes are
6423 evaluated both early and late enough, e.g. by attaching artificial
6424 type declarations to the tree. */
6425 break;
6427 default:
6428 break;
6431 gimplify_one_sizepos (&TYPE_SIZE (type), list_p);
6432 gimplify_one_sizepos (&TYPE_SIZE_UNIT (type), list_p);
6434 for (t = TYPE_NEXT_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
6436 TYPE_SIZE (t) = TYPE_SIZE (type);
6437 TYPE_SIZE_UNIT (t) = TYPE_SIZE_UNIT (type);
6438 TYPE_SIZES_GIMPLIFIED (t) = 1;
6442 /* A subroutine of gimplify_type_sizes to make sure that *EXPR_P,
6443 a size or position, has had all of its SAVE_EXPRs evaluated.
6444 We add any required statements to STMT_P. */
6446 void
6447 gimplify_one_sizepos (tree *expr_p, tree *stmt_p)
6449 tree type, expr = *expr_p;
6451 /* We don't do anything if the value isn't there, is constant, or contains
6452 A PLACEHOLDER_EXPR. We also don't want to do anything if it's already
6453 a VAR_DECL. If it's a VAR_DECL from another function, the gimplifier
6454 will want to replace it with a new variable, but that will cause problems
6455 if this type is from outside the function. It's OK to have that here. */
6456 if (expr == NULL_TREE || TREE_CONSTANT (expr)
6457 || TREE_CODE (expr) == VAR_DECL
6458 || CONTAINS_PLACEHOLDER_P (expr))
6459 return;
6461 type = TREE_TYPE (expr);
6462 *expr_p = unshare_expr (expr);
6464 gimplify_expr (expr_p, stmt_p, NULL, is_gimple_val, fb_rvalue);
6465 expr = *expr_p;
6467 /* Verify that we've an exact type match with the original expression.
6468 In particular, we do not wish to drop a "sizetype" in favour of a
6469 type of similar dimensions. We don't want to pollute the generic
6470 type-stripping code with this knowledge because it doesn't matter
6471 for the bulk of GENERIC/GIMPLE. It only matters that TYPE_SIZE_UNIT
6472 and friends retain their "sizetype-ness". */
6473 if (TREE_TYPE (expr) != type
6474 && TREE_CODE (type) == INTEGER_TYPE
6475 && TYPE_IS_SIZETYPE (type))
6477 tree tmp;
6479 *expr_p = create_tmp_var (type, NULL);
6480 tmp = build1 (NOP_EXPR, type, expr);
6481 tmp = build_gimple_modify_stmt (*expr_p, tmp);
6482 if (EXPR_HAS_LOCATION (expr))
6483 SET_EXPR_LOCUS (tmp, EXPR_LOCUS (expr));
6484 else
6485 SET_EXPR_LOCATION (tmp, input_location);
6487 gimplify_and_add (tmp, stmt_p);
6492 /* Gimplify the body of statements pointed to by BODY_P. FNDECL is the
6493 function decl containing BODY. */
6495 void
6496 gimplify_body (tree *body_p, tree fndecl, bool do_parms)
6498 location_t saved_location = input_location;
6499 tree body, parm_stmts;
6501 timevar_push (TV_TREE_GIMPLIFY);
6503 gcc_assert (gimplify_ctxp == NULL);
6504 push_gimplify_context ();
6506 /* Unshare most shared trees in the body and in that of any nested functions.
6507 It would seem we don't have to do this for nested functions because
6508 they are supposed to be output and then the outer function gimplified
6509 first, but the g++ front end doesn't always do it that way. */
6510 unshare_body (body_p, fndecl);
6511 unvisit_body (body_p, fndecl);
6513 /* Make sure input_location isn't set to something wierd. */
6514 input_location = DECL_SOURCE_LOCATION (fndecl);
6516 /* Resolve callee-copies. This has to be done before processing
6517 the body so that DECL_VALUE_EXPR gets processed correctly. */
6518 parm_stmts = do_parms ? gimplify_parameters () : NULL;
6520 /* Gimplify the function's body. */
6521 gimplify_stmt (body_p);
6522 body = *body_p;
6524 if (!body)
6525 body = alloc_stmt_list ();
6526 else if (TREE_CODE (body) == STATEMENT_LIST)
6528 tree t = expr_only (*body_p);
6529 if (t)
6530 body = t;
6533 /* If there isn't an outer BIND_EXPR, add one. */
6534 if (TREE_CODE (body) != BIND_EXPR)
6536 tree b = build3 (BIND_EXPR, void_type_node, NULL_TREE,
6537 NULL_TREE, NULL_TREE);
6538 TREE_SIDE_EFFECTS (b) = 1;
6539 append_to_statement_list_force (body, &BIND_EXPR_BODY (b));
6540 body = b;
6543 /* If we had callee-copies statements, insert them at the beginning
6544 of the function. */
6545 if (parm_stmts)
6547 append_to_statement_list_force (BIND_EXPR_BODY (body), &parm_stmts);
6548 BIND_EXPR_BODY (body) = parm_stmts;
6551 /* Unshare again, in case gimplification was sloppy. */
6552 unshare_all_trees (body);
6554 *body_p = body;
6556 pop_gimplify_context (body);
6557 gcc_assert (gimplify_ctxp == NULL);
6559 #ifdef ENABLE_TYPES_CHECKING
6560 if (!errorcount && !sorrycount)
6561 verify_gimple_1 (BIND_EXPR_BODY (*body_p));
6562 #endif
6564 timevar_pop (TV_TREE_GIMPLIFY);
6565 input_location = saved_location;
6568 /* Entry point to the gimplification pass. FNDECL is the FUNCTION_DECL
6569 node for the function we want to gimplify. */
6571 void
6572 gimplify_function_tree (tree fndecl)
6574 tree oldfn, parm, ret;
6576 oldfn = current_function_decl;
6577 current_function_decl = fndecl;
6578 if (DECL_STRUCT_FUNCTION (fndecl))
6579 push_cfun (DECL_STRUCT_FUNCTION (fndecl));
6580 else
6581 push_struct_function (fndecl);
6583 for (parm = DECL_ARGUMENTS (fndecl); parm ; parm = TREE_CHAIN (parm))
6585 /* Preliminarily mark non-addressed complex variables as eligible
6586 for promotion to gimple registers. We'll transform their uses
6587 as we find them. */
6588 if ((TREE_CODE (TREE_TYPE (parm)) == COMPLEX_TYPE
6589 || TREE_CODE (TREE_TYPE (parm)) == VECTOR_TYPE)
6590 && !TREE_THIS_VOLATILE (parm)
6591 && !needs_to_live_in_memory (parm))
6592 DECL_GIMPLE_REG_P (parm) = 1;
6595 ret = DECL_RESULT (fndecl);
6596 if ((TREE_CODE (TREE_TYPE (ret)) == COMPLEX_TYPE
6597 || TREE_CODE (TREE_TYPE (ret)) == VECTOR_TYPE)
6598 && !needs_to_live_in_memory (ret))
6599 DECL_GIMPLE_REG_P (ret) = 1;
6601 gimplify_body (&DECL_SAVED_TREE (fndecl), fndecl, true);
6603 /* If we're instrumenting function entry/exit, then prepend the call to
6604 the entry hook and wrap the whole function in a TRY_FINALLY_EXPR to
6605 catch the exit hook. */
6606 /* ??? Add some way to ignore exceptions for this TFE. */
6607 if (flag_instrument_function_entry_exit
6608 && !DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (fndecl)
6609 && !flag_instrument_functions_exclude_p (fndecl))
6611 tree tf, x, bind;
6613 tf = build2 (TRY_FINALLY_EXPR, void_type_node, NULL, NULL);
6614 TREE_SIDE_EFFECTS (tf) = 1;
6615 x = DECL_SAVED_TREE (fndecl);
6616 append_to_statement_list (x, &TREE_OPERAND (tf, 0));
6617 x = implicit_built_in_decls[BUILT_IN_PROFILE_FUNC_EXIT];
6618 x = build_call_expr (x, 0);
6619 append_to_statement_list (x, &TREE_OPERAND (tf, 1));
6621 bind = build3 (BIND_EXPR, void_type_node, NULL, NULL, NULL);
6622 TREE_SIDE_EFFECTS (bind) = 1;
6623 x = implicit_built_in_decls[BUILT_IN_PROFILE_FUNC_ENTER];
6624 x = build_call_expr (x, 0);
6625 append_to_statement_list (x, &BIND_EXPR_BODY (bind));
6626 append_to_statement_list (tf, &BIND_EXPR_BODY (bind));
6628 DECL_SAVED_TREE (fndecl) = bind;
6631 cfun->gimplified = true;
6632 current_function_decl = oldfn;
6633 pop_cfun ();
6636 /* Expands EXPR to list of gimple statements STMTS. If SIMPLE is true,
6637 force the result to be either ssa_name or an invariant, otherwise
6638 just force it to be a rhs expression. If VAR is not NULL, make the
6639 base variable of the final destination be VAR if suitable. */
6641 tree
6642 force_gimple_operand (tree expr, tree *stmts, bool simple, tree var)
6644 tree t;
6645 enum gimplify_status ret;
6646 gimple_predicate gimple_test_f;
6648 *stmts = NULL_TREE;
6650 if (is_gimple_val (expr))
6651 return expr;
6653 gimple_test_f = simple ? is_gimple_val : is_gimple_reg_rhs;
6655 push_gimplify_context ();
6656 gimplify_ctxp->into_ssa = gimple_in_ssa_p (cfun);
6657 gimplify_ctxp->allow_rhs_cond_expr = true;
6659 if (var)
6660 expr = build_gimple_modify_stmt (var, expr);
6662 if (TREE_CODE (expr) != GIMPLE_MODIFY_STMT
6663 && TREE_TYPE (expr) == void_type_node)
6665 gimplify_and_add (expr, stmts);
6666 expr = NULL_TREE;
6668 else
6670 ret = gimplify_expr (&expr, stmts, NULL,
6671 gimple_test_f, fb_rvalue);
6672 gcc_assert (ret != GS_ERROR);
6675 if (gimple_referenced_vars (cfun))
6677 for (t = gimplify_ctxp->temps; t ; t = TREE_CHAIN (t))
6678 add_referenced_var (t);
6681 pop_gimplify_context (NULL);
6683 return expr;
6686 /* Invokes force_gimple_operand for EXPR with parameters SIMPLE_P and VAR. If
6687 some statements are produced, emits them at BSI. If BEFORE is true.
6688 the statements are appended before BSI, otherwise they are appended after
6689 it. M specifies the way BSI moves after insertion (BSI_SAME_STMT or
6690 BSI_CONTINUE_LINKING are the usual values). */
6692 tree
6693 force_gimple_operand_bsi (block_stmt_iterator *bsi, tree expr,
6694 bool simple_p, tree var, bool before,
6695 enum bsi_iterator_update m)
6697 tree stmts;
6699 expr = force_gimple_operand (expr, &stmts, simple_p, var);
6700 if (stmts)
6702 if (gimple_in_ssa_p (cfun))
6704 tree_stmt_iterator tsi;
6706 for (tsi = tsi_start (stmts); !tsi_end_p (tsi); tsi_next (&tsi))
6707 mark_symbols_for_renaming (tsi_stmt (tsi));
6710 if (before)
6711 bsi_insert_before (bsi, stmts, m);
6712 else
6713 bsi_insert_after (bsi, stmts, m);
6716 return expr;
6719 #include "gt-gimplify.h"