gcc/ChangeLog:
[official-gcc.git] / gcc / gimplify.c
blob1e9975777a3af68afa88e1e9069b432d01b18de5
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
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 2, 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 COPYING. If not, write to the Free
22 Software Foundation, 51 Franklin Street, Fifth Floor, Boston, MA
23 02110-1301, USA. */
25 #include "config.h"
26 #include "system.h"
27 #include "coretypes.h"
28 #include "tm.h"
29 #include "tree.h"
30 #include "rtl.h"
31 #include "varray.h"
32 #include "tree-gimple.h"
33 #include "tree-inline.h"
34 #include "diagnostic.h"
35 #include "langhooks.h"
36 #include "langhooks-def.h"
37 #include "tree-flow.h"
38 #include "cgraph.h"
39 #include "timevar.h"
40 #include "except.h"
41 #include "hashtab.h"
42 #include "flags.h"
43 #include "real.h"
44 #include "function.h"
45 #include "output.h"
46 #include "expr.h"
47 #include "ggc.h"
48 #include "toplev.h"
49 #include "target.h"
50 #include "optabs.h"
51 #include "pointer-set.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;
99 static struct gimplify_ctx *gimplify_ctxp;
100 static struct gimplify_omp_ctx *gimplify_omp_ctxp;
104 /* Formal (expression) temporary table handling: Multiple occurrences of
105 the same scalar expression are evaluated into the same temporary. */
107 typedef struct gimple_temp_hash_elt
109 tree val; /* Key */
110 tree temp; /* Value */
111 } elt_t;
113 /* Forward declarations. */
114 static enum gimplify_status gimplify_compound_expr (tree *, tree *, bool);
115 #ifdef ENABLE_CHECKING
116 static bool cpt_same_type (tree a, tree b);
117 #endif
120 /* Return a hash value for a formal temporary table entry. */
122 static hashval_t
123 gimple_tree_hash (const void *p)
125 tree t = ((const elt_t *) p)->val;
126 return iterative_hash_expr (t, 0);
129 /* Compare two formal temporary table entries. */
131 static int
132 gimple_tree_eq (const void *p1, const void *p2)
134 tree t1 = ((const elt_t *) p1)->val;
135 tree t2 = ((const elt_t *) p2)->val;
136 enum tree_code code = TREE_CODE (t1);
138 if (TREE_CODE (t2) != code
139 || TREE_TYPE (t1) != TREE_TYPE (t2))
140 return 0;
142 if (!operand_equal_p (t1, t2, 0))
143 return 0;
145 /* Only allow them to compare equal if they also hash equal; otherwise
146 results are nondeterminate, and we fail bootstrap comparison. */
147 gcc_assert (gimple_tree_hash (p1) == gimple_tree_hash (p2));
149 return 1;
152 /* Set up a context for the gimplifier. */
154 void
155 push_gimplify_context (void)
157 struct gimplify_ctx *c;
159 c = (struct gimplify_ctx *) xcalloc (1, sizeof (struct gimplify_ctx));
160 c->prev_context = gimplify_ctxp;
161 if (optimize)
162 c->temp_htab = htab_create (1000, gimple_tree_hash, gimple_tree_eq, free);
164 gimplify_ctxp = c;
167 /* Tear down a context for the gimplifier. If BODY is non-null, then
168 put the temporaries into the outer BIND_EXPR. Otherwise, put them
169 in the unexpanded_var_list. */
171 void
172 pop_gimplify_context (tree body)
174 struct gimplify_ctx *c = gimplify_ctxp;
175 tree t;
177 gcc_assert (c && !c->current_bind_expr);
178 gimplify_ctxp = c->prev_context;
180 for (t = c->temps; t ; t = TREE_CHAIN (t))
181 DECL_GIMPLE_FORMAL_TEMP_P (t) = 0;
183 if (body)
184 declare_vars (c->temps, body, false);
185 else
186 record_vars (c->temps);
188 if (optimize)
189 htab_delete (c->temp_htab);
190 free (c);
193 static void
194 gimple_push_bind_expr (tree bind)
196 TREE_CHAIN (bind) = gimplify_ctxp->current_bind_expr;
197 gimplify_ctxp->current_bind_expr = bind;
200 static void
201 gimple_pop_bind_expr (void)
203 gimplify_ctxp->current_bind_expr
204 = TREE_CHAIN (gimplify_ctxp->current_bind_expr);
207 tree
208 gimple_current_bind_expr (void)
210 return gimplify_ctxp->current_bind_expr;
213 /* Returns true iff there is a COND_EXPR between us and the innermost
214 CLEANUP_POINT_EXPR. This info is used by gimple_push_cleanup. */
216 static bool
217 gimple_conditional_context (void)
219 return gimplify_ctxp->conditions > 0;
222 /* Note that we've entered a COND_EXPR. */
224 static void
225 gimple_push_condition (void)
227 #ifdef ENABLE_CHECKING
228 if (gimplify_ctxp->conditions == 0)
229 gcc_assert (!gimplify_ctxp->conditional_cleanups);
230 #endif
231 ++(gimplify_ctxp->conditions);
234 /* Note that we've left a COND_EXPR. If we're back at unconditional scope
235 now, add any conditional cleanups we've seen to the prequeue. */
237 static void
238 gimple_pop_condition (tree *pre_p)
240 int conds = --(gimplify_ctxp->conditions);
242 gcc_assert (conds >= 0);
243 if (conds == 0)
245 append_to_statement_list (gimplify_ctxp->conditional_cleanups, pre_p);
246 gimplify_ctxp->conditional_cleanups = NULL_TREE;
250 /* A stable comparison routine for use with splay trees and DECLs. */
252 static int
253 splay_tree_compare_decl_uid (splay_tree_key xa, splay_tree_key xb)
255 tree a = (tree) xa;
256 tree b = (tree) xb;
258 return DECL_UID (a) - DECL_UID (b);
261 /* Create a new omp construct that deals with variable remapping. */
263 static struct gimplify_omp_ctx *
264 new_omp_context (bool is_parallel, bool is_combined_parallel)
266 struct gimplify_omp_ctx *c;
268 c = XCNEW (struct gimplify_omp_ctx);
269 c->outer_context = gimplify_omp_ctxp;
270 c->variables = splay_tree_new (splay_tree_compare_decl_uid, 0, 0);
271 c->privatized_types = pointer_set_create ();
272 c->location = input_location;
273 c->is_parallel = is_parallel;
274 c->is_combined_parallel = is_combined_parallel;
275 c->default_kind = OMP_CLAUSE_DEFAULT_SHARED;
277 return c;
280 /* Destroy an omp construct that deals with variable remapping. */
282 static void
283 delete_omp_context (struct gimplify_omp_ctx *c)
285 splay_tree_delete (c->variables);
286 pointer_set_destroy (c->privatized_types);
287 XDELETE (c);
290 static void omp_add_variable (struct gimplify_omp_ctx *, tree, unsigned int);
291 static bool omp_notice_variable (struct gimplify_omp_ctx *, tree, bool);
293 /* A subroutine of append_to_statement_list{,_force}. T is not NULL. */
295 static void
296 append_to_statement_list_1 (tree t, tree *list_p)
298 tree list = *list_p;
299 tree_stmt_iterator i;
301 if (!list)
303 if (t && TREE_CODE (t) == STATEMENT_LIST)
305 *list_p = t;
306 return;
308 *list_p = list = alloc_stmt_list ();
311 i = tsi_last (list);
312 tsi_link_after (&i, t, TSI_CONTINUE_LINKING);
315 /* Add T to the end of the list container pointed to by LIST_P.
316 If T is an expression with no effects, it is ignored. */
318 void
319 append_to_statement_list (tree t, tree *list_p)
321 if (t && TREE_SIDE_EFFECTS (t))
322 append_to_statement_list_1 (t, list_p);
325 /* Similar, but the statement is always added, regardless of side effects. */
327 void
328 append_to_statement_list_force (tree t, tree *list_p)
330 if (t != NULL_TREE)
331 append_to_statement_list_1 (t, list_p);
334 /* Both gimplify the statement T and append it to LIST_P. */
336 void
337 gimplify_and_add (tree t, tree *list_p)
339 gimplify_stmt (&t);
340 append_to_statement_list (t, list_p);
343 /* Strip off a legitimate source ending from the input string NAME of
344 length LEN. Rather than having to know the names used by all of
345 our front ends, we strip off an ending of a period followed by
346 up to five characters. (Java uses ".class".) */
348 static inline void
349 remove_suffix (char *name, int len)
351 int i;
353 for (i = 2; i < 8 && len > i; i++)
355 if (name[len - i] == '.')
357 name[len - i] = '\0';
358 break;
363 /* Create a nameless artificial label and put it in the current function
364 context. Returns the newly created label. */
366 tree
367 create_artificial_label (void)
369 tree lab = build_decl (LABEL_DECL, NULL_TREE, void_type_node);
371 DECL_ARTIFICIAL (lab) = 1;
372 DECL_IGNORED_P (lab) = 1;
373 DECL_CONTEXT (lab) = current_function_decl;
374 return lab;
377 /* Subroutine for find_single_pointer_decl. */
379 static tree
380 find_single_pointer_decl_1 (tree *tp, int *walk_subtrees ATTRIBUTE_UNUSED,
381 void *data)
383 tree *pdecl = (tree *) data;
385 if (DECL_P (*tp) && POINTER_TYPE_P (TREE_TYPE (*tp)))
387 if (*pdecl)
389 /* We already found a pointer decl; return anything other
390 than NULL_TREE to unwind from walk_tree signalling that
391 we have a duplicate. */
392 return *tp;
394 *pdecl = *tp;
397 return NULL_TREE;
400 /* Find the single DECL of pointer type in the tree T and return it.
401 If there are zero or more than one such DECLs, return NULL. */
403 static tree
404 find_single_pointer_decl (tree t)
406 tree decl = NULL_TREE;
408 if (walk_tree (&t, find_single_pointer_decl_1, &decl, NULL))
410 /* find_single_pointer_decl_1 returns a nonzero value, causing
411 walk_tree to return a nonzero value, to indicate that it
412 found more than one pointer DECL. */
413 return NULL_TREE;
416 return decl;
419 /* Create a new temporary name with PREFIX. Returns an identifier. */
421 static GTY(()) unsigned int tmp_var_id_num;
423 tree
424 create_tmp_var_name (const char *prefix)
426 char *tmp_name;
428 if (prefix)
430 char *preftmp = ASTRDUP (prefix);
432 remove_suffix (preftmp, strlen (preftmp));
433 prefix = preftmp;
436 ASM_FORMAT_PRIVATE_NAME (tmp_name, prefix ? prefix : "T", tmp_var_id_num++);
437 return get_identifier (tmp_name);
441 /* Create a new temporary variable declaration of type TYPE.
442 Does NOT push it into the current binding. */
444 tree
445 create_tmp_var_raw (tree type, const char *prefix)
447 tree tmp_var;
448 tree new_type;
450 /* Make the type of the variable writable. */
451 new_type = build_type_variant (type, 0, 0);
452 TYPE_ATTRIBUTES (new_type) = TYPE_ATTRIBUTES (type);
454 tmp_var = build_decl (VAR_DECL, prefix ? create_tmp_var_name (prefix) : NULL,
455 type);
457 /* The variable was declared by the compiler. */
458 DECL_ARTIFICIAL (tmp_var) = 1;
459 /* And we don't want debug info for it. */
460 DECL_IGNORED_P (tmp_var) = 1;
462 /* Make the variable writable. */
463 TREE_READONLY (tmp_var) = 0;
465 DECL_EXTERNAL (tmp_var) = 0;
466 TREE_STATIC (tmp_var) = 0;
467 TREE_USED (tmp_var) = 1;
469 return tmp_var;
472 /* Create a new temporary variable declaration of type TYPE. DOES push the
473 variable into the current binding. Further, assume that this is called
474 only from gimplification or optimization, at which point the creation of
475 certain types are bugs. */
477 tree
478 create_tmp_var (tree type, const char *prefix)
480 tree tmp_var;
482 /* We don't allow types that are addressable (meaning we can't make copies),
483 or incomplete. We also used to reject every variable size objects here,
484 but now support those for which a constant upper bound can be obtained.
485 The processing for variable sizes is performed in gimple_add_tmp_var,
486 point at which it really matters and possibly reached via paths not going
487 through this function, e.g. after direct calls to create_tmp_var_raw. */
488 gcc_assert (!TREE_ADDRESSABLE (type) && COMPLETE_TYPE_P (type));
490 tmp_var = create_tmp_var_raw (type, prefix);
491 gimple_add_tmp_var (tmp_var);
492 return tmp_var;
495 /* Given a tree, try to return a useful variable name that we can use
496 to prefix a temporary that is being assigned the value of the tree.
497 I.E. given <temp> = &A, return A. */
499 const char *
500 get_name (tree t)
502 tree stripped_decl;
504 stripped_decl = t;
505 STRIP_NOPS (stripped_decl);
506 if (DECL_P (stripped_decl) && DECL_NAME (stripped_decl))
507 return IDENTIFIER_POINTER (DECL_NAME (stripped_decl));
508 else
510 switch (TREE_CODE (stripped_decl))
512 case ADDR_EXPR:
513 return get_name (TREE_OPERAND (stripped_decl, 0));
514 default:
515 return NULL;
520 /* Create a temporary with a name derived from VAL. Subroutine of
521 lookup_tmp_var; nobody else should call this function. */
523 static inline tree
524 create_tmp_from_val (tree val)
526 return create_tmp_var (TYPE_MAIN_VARIANT (TREE_TYPE (val)), get_name (val));
529 /* Create a temporary to hold the value of VAL. If IS_FORMAL, try to reuse
530 an existing expression temporary. */
532 static tree
533 lookup_tmp_var (tree val, bool is_formal)
535 tree ret;
537 /* If not optimizing, never really reuse a temporary. local-alloc
538 won't allocate any variable that is used in more than one basic
539 block, which means it will go into memory, causing much extra
540 work in reload and final and poorer code generation, outweighing
541 the extra memory allocation here. */
542 if (!optimize || !is_formal || TREE_SIDE_EFFECTS (val))
543 ret = create_tmp_from_val (val);
544 else
546 elt_t elt, *elt_p;
547 void **slot;
549 elt.val = val;
550 slot = htab_find_slot (gimplify_ctxp->temp_htab, (void *)&elt, INSERT);
551 if (*slot == NULL)
553 elt_p = XNEW (elt_t);
554 elt_p->val = val;
555 elt_p->temp = ret = create_tmp_from_val (val);
556 *slot = (void *) elt_p;
558 else
560 elt_p = (elt_t *) *slot;
561 ret = elt_p->temp;
565 if (is_formal)
566 DECL_GIMPLE_FORMAL_TEMP_P (ret) = 1;
568 return ret;
571 /* Returns a formal temporary variable initialized with VAL. PRE_P is as
572 in gimplify_expr. Only use this function if:
574 1) The value of the unfactored expression represented by VAL will not
575 change between the initialization and use of the temporary, and
576 2) The temporary will not be otherwise modified.
578 For instance, #1 means that this is inappropriate for SAVE_EXPR temps,
579 and #2 means it is inappropriate for && temps.
581 For other cases, use get_initialized_tmp_var instead. */
583 static tree
584 internal_get_tmp_var (tree val, tree *pre_p, tree *post_p, bool is_formal)
586 tree t, mod;
588 gimplify_expr (&val, pre_p, post_p, is_gimple_formal_tmp_rhs, fb_rvalue);
590 t = lookup_tmp_var (val, is_formal);
592 if (is_formal)
594 tree u = find_single_pointer_decl (val);
596 if (u && TREE_CODE (u) == VAR_DECL && DECL_BASED_ON_RESTRICT_P (u))
597 u = DECL_GET_RESTRICT_BASE (u);
598 if (u && TYPE_RESTRICT (TREE_TYPE (u)))
600 if (DECL_BASED_ON_RESTRICT_P (t))
601 gcc_assert (u == DECL_GET_RESTRICT_BASE (t));
602 else
604 DECL_BASED_ON_RESTRICT_P (t) = 1;
605 SET_DECL_RESTRICT_BASE (t, u);
610 if (TREE_CODE (TREE_TYPE (t)) == COMPLEX_TYPE
611 || TREE_CODE (TREE_TYPE (t)) == VECTOR_TYPE)
612 DECL_GIMPLE_REG_P (t) = 1;
614 mod = build2 (INIT_EXPR, TREE_TYPE (t), t, unshare_expr (val));
616 if (EXPR_HAS_LOCATION (val))
617 SET_EXPR_LOCUS (mod, EXPR_LOCUS (val));
618 else
619 SET_EXPR_LOCATION (mod, input_location);
621 /* gimplify_modify_expr might want to reduce this further. */
622 gimplify_and_add (mod, pre_p);
624 /* If we're gimplifying into ssa, gimplify_modify_expr will have
625 given our temporary an ssa name. Find and return it. */
626 if (gimplify_ctxp->into_ssa)
627 t = TREE_OPERAND (mod, 0);
629 return t;
632 /* Returns a formal temporary variable initialized with VAL. PRE_P
633 points to a statement list where side-effects needed to compute VAL
634 should be stored. */
636 tree
637 get_formal_tmp_var (tree val, tree *pre_p)
639 return internal_get_tmp_var (val, pre_p, NULL, true);
642 /* Returns a temporary variable initialized with VAL. PRE_P and POST_P
643 are as in gimplify_expr. */
645 tree
646 get_initialized_tmp_var (tree val, tree *pre_p, tree *post_p)
648 return internal_get_tmp_var (val, pre_p, post_p, false);
651 /* Declares all the variables in VARS in SCOPE. If DEBUG_INFO is
652 true, generate debug info for them; otherwise don't. */
654 void
655 declare_vars (tree vars, tree scope, bool debug_info)
657 tree last = vars;
658 if (last)
660 tree temps, block;
662 /* C99 mode puts the default 'return 0;' for main outside the outer
663 braces. So drill down until we find an actual scope. */
664 while (TREE_CODE (scope) == COMPOUND_EXPR)
665 scope = TREE_OPERAND (scope, 0);
667 gcc_assert (TREE_CODE (scope) == BIND_EXPR);
669 temps = nreverse (last);
671 block = BIND_EXPR_BLOCK (scope);
672 if (!block || !debug_info)
674 TREE_CHAIN (last) = BIND_EXPR_VARS (scope);
675 BIND_EXPR_VARS (scope) = temps;
677 else
679 /* We need to attach the nodes both to the BIND_EXPR and to its
680 associated BLOCK for debugging purposes. The key point here
681 is that the BLOCK_VARS of the BIND_EXPR_BLOCK of a BIND_EXPR
682 is a subchain of the BIND_EXPR_VARS of the BIND_EXPR. */
683 if (BLOCK_VARS (block))
684 BLOCK_VARS (block) = chainon (BLOCK_VARS (block), temps);
685 else
687 BIND_EXPR_VARS (scope) = chainon (BIND_EXPR_VARS (scope), temps);
688 BLOCK_VARS (block) = temps;
694 /* For VAR a VAR_DECL of variable size, try to find a constant upper bound
695 for the size and adjust DECL_SIZE/DECL_SIZE_UNIT accordingly. Abort if
696 no such upper bound can be obtained. */
698 static void
699 force_constant_size (tree var)
701 /* The only attempt we make is by querying the maximum size of objects
702 of the variable's type. */
704 HOST_WIDE_INT max_size;
706 gcc_assert (TREE_CODE (var) == VAR_DECL);
708 max_size = max_int_size_in_bytes (TREE_TYPE (var));
710 gcc_assert (max_size >= 0);
712 DECL_SIZE_UNIT (var)
713 = build_int_cst (TREE_TYPE (DECL_SIZE_UNIT (var)), max_size);
714 DECL_SIZE (var)
715 = build_int_cst (TREE_TYPE (DECL_SIZE (var)), max_size * BITS_PER_UNIT);
718 void
719 gimple_add_tmp_var (tree tmp)
721 gcc_assert (!TREE_CHAIN (tmp) && !DECL_SEEN_IN_BIND_EXPR_P (tmp));
723 /* Later processing assumes that the object size is constant, which might
724 not be true at this point. Force the use of a constant upper bound in
725 this case. */
726 if (!host_integerp (DECL_SIZE_UNIT (tmp), 1))
727 force_constant_size (tmp);
729 DECL_CONTEXT (tmp) = current_function_decl;
730 DECL_SEEN_IN_BIND_EXPR_P (tmp) = 1;
732 if (gimplify_ctxp)
734 TREE_CHAIN (tmp) = gimplify_ctxp->temps;
735 gimplify_ctxp->temps = tmp;
737 /* Mark temporaries local within the nearest enclosing parallel. */
738 if (gimplify_omp_ctxp)
740 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
741 while (ctx && !ctx->is_parallel)
742 ctx = ctx->outer_context;
743 if (ctx)
744 omp_add_variable (ctx, tmp, GOVD_LOCAL | GOVD_SEEN);
747 else if (cfun)
748 record_vars (tmp);
749 else
750 declare_vars (tmp, DECL_SAVED_TREE (current_function_decl), false);
753 /* Determines whether to assign a locus to the statement STMT. */
755 static bool
756 should_carry_locus_p (tree stmt)
758 /* Don't emit a line note for a label. We particularly don't want to
759 emit one for the break label, since it doesn't actually correspond
760 to the beginning of the loop/switch. */
761 if (TREE_CODE (stmt) == LABEL_EXPR)
762 return false;
764 /* Do not annotate empty statements, since it confuses gcov. */
765 if (!TREE_SIDE_EFFECTS (stmt))
766 return false;
768 return true;
771 static void
772 annotate_one_with_locus (tree t, location_t locus)
774 if (CAN_HAVE_LOCATION_P (t)
775 && ! EXPR_HAS_LOCATION (t) && should_carry_locus_p (t))
776 SET_EXPR_LOCATION (t, locus);
779 void
780 annotate_all_with_locus (tree *stmt_p, location_t locus)
782 tree_stmt_iterator i;
784 if (!*stmt_p)
785 return;
787 for (i = tsi_start (*stmt_p); !tsi_end_p (i); tsi_next (&i))
789 tree t = tsi_stmt (i);
791 /* Assuming we've already been gimplified, we shouldn't
792 see nested chaining constructs anymore. */
793 gcc_assert (TREE_CODE (t) != STATEMENT_LIST
794 && TREE_CODE (t) != COMPOUND_EXPR);
796 annotate_one_with_locus (t, locus);
800 /* Similar to copy_tree_r() but do not copy SAVE_EXPR or TARGET_EXPR nodes.
801 These nodes model computations that should only be done once. If we
802 were to unshare something like SAVE_EXPR(i++), the gimplification
803 process would create wrong code. */
805 static tree
806 mostly_copy_tree_r (tree *tp, int *walk_subtrees, void *data)
808 enum tree_code code = TREE_CODE (*tp);
809 /* Don't unshare types, decls, constants and SAVE_EXPR nodes. */
810 if (TREE_CODE_CLASS (code) == tcc_type
811 || TREE_CODE_CLASS (code) == tcc_declaration
812 || TREE_CODE_CLASS (code) == tcc_constant
813 || code == SAVE_EXPR || code == TARGET_EXPR
814 /* We can't do anything sensible with a BLOCK used as an expression,
815 but we also can't just die when we see it because of non-expression
816 uses. So just avert our eyes and cross our fingers. Silly Java. */
817 || code == BLOCK)
818 *walk_subtrees = 0;
819 else
821 gcc_assert (code != BIND_EXPR);
822 copy_tree_r (tp, walk_subtrees, data);
825 return NULL_TREE;
828 /* Callback for walk_tree to unshare most of the shared trees rooted at
829 *TP. If *TP has been visited already (i.e., TREE_VISITED (*TP) == 1),
830 then *TP is deep copied by calling copy_tree_r.
832 This unshares the same trees as copy_tree_r with the exception of
833 SAVE_EXPR nodes. These nodes model computations that should only be
834 done once. If we were to unshare something like SAVE_EXPR(i++), the
835 gimplification process would create wrong code. */
837 static tree
838 copy_if_shared_r (tree *tp, int *walk_subtrees ATTRIBUTE_UNUSED,
839 void *data ATTRIBUTE_UNUSED)
841 tree t = *tp;
842 enum tree_code code = TREE_CODE (t);
844 /* Skip types, decls, and constants. But we do want to look at their
845 types and the bounds of types. Mark them as visited so we properly
846 unmark their subtrees on the unmark pass. If we've already seen them,
847 don't look down further. */
848 if (TREE_CODE_CLASS (code) == tcc_type
849 || TREE_CODE_CLASS (code) == tcc_declaration
850 || TREE_CODE_CLASS (code) == tcc_constant)
852 if (TREE_VISITED (t))
853 *walk_subtrees = 0;
854 else
855 TREE_VISITED (t) = 1;
858 /* If this node has been visited already, unshare it and don't look
859 any deeper. */
860 else if (TREE_VISITED (t))
862 walk_tree (tp, mostly_copy_tree_r, NULL, NULL);
863 *walk_subtrees = 0;
866 /* Otherwise, mark the tree as visited and keep looking. */
867 else
868 TREE_VISITED (t) = 1;
870 return NULL_TREE;
873 static tree
874 unmark_visited_r (tree *tp, int *walk_subtrees ATTRIBUTE_UNUSED,
875 void *data ATTRIBUTE_UNUSED)
877 if (TREE_VISITED (*tp))
878 TREE_VISITED (*tp) = 0;
879 else
880 *walk_subtrees = 0;
882 return NULL_TREE;
885 /* Unshare all the trees in BODY_P, a pointer into the body of FNDECL, and the
886 bodies of any nested functions if we are unsharing the entire body of
887 FNDECL. */
889 static void
890 unshare_body (tree *body_p, tree fndecl)
892 struct cgraph_node *cgn = cgraph_node (fndecl);
894 walk_tree (body_p, copy_if_shared_r, NULL, NULL);
895 if (body_p == &DECL_SAVED_TREE (fndecl))
896 for (cgn = cgn->nested; cgn; cgn = cgn->next_nested)
897 unshare_body (&DECL_SAVED_TREE (cgn->decl), cgn->decl);
900 /* Likewise, but mark all trees as not visited. */
902 static void
903 unvisit_body (tree *body_p, tree fndecl)
905 struct cgraph_node *cgn = cgraph_node (fndecl);
907 walk_tree (body_p, unmark_visited_r, NULL, NULL);
908 if (body_p == &DECL_SAVED_TREE (fndecl))
909 for (cgn = cgn->nested; cgn; cgn = cgn->next_nested)
910 unvisit_body (&DECL_SAVED_TREE (cgn->decl), cgn->decl);
913 /* Unshare T and all the trees reached from T via TREE_CHAIN. */
915 static void
916 unshare_all_trees (tree t)
918 walk_tree (&t, copy_if_shared_r, NULL, NULL);
919 walk_tree (&t, unmark_visited_r, NULL, NULL);
922 /* Unconditionally make an unshared copy of EXPR. This is used when using
923 stored expressions which span multiple functions, such as BINFO_VTABLE,
924 as the normal unsharing process can't tell that they're shared. */
926 tree
927 unshare_expr (tree expr)
929 walk_tree (&expr, mostly_copy_tree_r, NULL, NULL);
930 return expr;
933 /* A terser interface for building a representation of an exception
934 specification. */
936 tree
937 gimple_build_eh_filter (tree body, tree allowed, tree failure)
939 tree t;
941 /* FIXME should the allowed types go in TREE_TYPE? */
942 t = build2 (EH_FILTER_EXPR, void_type_node, allowed, NULL_TREE);
943 append_to_statement_list (failure, &EH_FILTER_FAILURE (t));
945 t = build2 (TRY_CATCH_EXPR, void_type_node, NULL_TREE, t);
946 append_to_statement_list (body, &TREE_OPERAND (t, 0));
948 return t;
952 /* WRAPPER is a code such as BIND_EXPR or CLEANUP_POINT_EXPR which can both
953 contain statements and have a value. Assign its value to a temporary
954 and give it void_type_node. Returns the temporary, or NULL_TREE if
955 WRAPPER was already void. */
957 tree
958 voidify_wrapper_expr (tree wrapper, tree temp)
960 tree type = TREE_TYPE (wrapper);
961 if (type && !VOID_TYPE_P (type))
963 tree *p;
965 /* Set p to point to the body of the wrapper. Loop until we find
966 something that isn't a wrapper. */
967 for (p = &wrapper; p && *p; )
969 switch (TREE_CODE (*p))
971 case BIND_EXPR:
972 TREE_SIDE_EFFECTS (*p) = 1;
973 TREE_TYPE (*p) = void_type_node;
974 /* For a BIND_EXPR, the body is operand 1. */
975 p = &BIND_EXPR_BODY (*p);
976 break;
978 case CLEANUP_POINT_EXPR:
979 case TRY_FINALLY_EXPR:
980 case TRY_CATCH_EXPR:
981 TREE_SIDE_EFFECTS (*p) = 1;
982 TREE_TYPE (*p) = void_type_node;
983 p = &TREE_OPERAND (*p, 0);
984 break;
986 case STATEMENT_LIST:
988 tree_stmt_iterator i = tsi_last (*p);
989 TREE_SIDE_EFFECTS (*p) = 1;
990 TREE_TYPE (*p) = void_type_node;
991 p = tsi_end_p (i) ? NULL : tsi_stmt_ptr (i);
993 break;
995 case COMPOUND_EXPR:
996 /* Advance to the last statement. Set all container types to void. */
997 for (; TREE_CODE (*p) == COMPOUND_EXPR; p = &TREE_OPERAND (*p, 1))
999 TREE_SIDE_EFFECTS (*p) = 1;
1000 TREE_TYPE (*p) = void_type_node;
1002 break;
1004 default:
1005 goto out;
1009 out:
1010 if (p == NULL || IS_EMPTY_STMT (*p))
1011 temp = NULL_TREE;
1012 else if (temp)
1014 /* The wrapper is on the RHS of an assignment that we're pushing
1015 down. */
1016 gcc_assert (TREE_CODE (temp) == INIT_EXPR
1017 || TREE_CODE (temp) == GIMPLE_MODIFY_STMT
1018 || TREE_CODE (temp) == MODIFY_EXPR);
1019 GENERIC_TREE_OPERAND (temp, 1) = *p;
1020 *p = temp;
1022 else
1024 temp = create_tmp_var (type, "retval");
1025 *p = build2 (INIT_EXPR, type, temp, *p);
1028 return temp;
1031 return NULL_TREE;
1034 /* Prepare calls to builtins to SAVE and RESTORE the stack as well as
1035 a temporary through which they communicate. */
1037 static void
1038 build_stack_save_restore (tree *save, tree *restore)
1040 tree save_call, tmp_var;
1042 save_call =
1043 build_function_call_expr (implicit_built_in_decls[BUILT_IN_STACK_SAVE],
1044 NULL_TREE);
1045 tmp_var = create_tmp_var (ptr_type_node, "saved_stack");
1047 *save = build2 (GIMPLE_MODIFY_STMT, ptr_type_node, tmp_var, save_call);
1048 *restore =
1049 build_function_call_expr (implicit_built_in_decls[BUILT_IN_STACK_RESTORE],
1050 tree_cons (NULL_TREE, tmp_var, NULL_TREE));
1053 /* Gimplify a BIND_EXPR. Just voidify and recurse. */
1055 static enum gimplify_status
1056 gimplify_bind_expr (tree *expr_p, tree *pre_p)
1058 tree bind_expr = *expr_p;
1059 bool old_save_stack = gimplify_ctxp->save_stack;
1060 tree t;
1062 tree temp = voidify_wrapper_expr (bind_expr, NULL);
1064 /* Mark variables seen in this bind expr. */
1065 for (t = BIND_EXPR_VARS (bind_expr); t ; t = TREE_CHAIN (t))
1067 if (TREE_CODE (t) == VAR_DECL)
1069 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
1071 /* Mark variable as local. */
1072 if (ctx && !is_global_var (t)
1073 && (! DECL_SEEN_IN_BIND_EXPR_P (t)
1074 || splay_tree_lookup (ctx->variables,
1075 (splay_tree_key) t) == NULL))
1076 omp_add_variable (gimplify_omp_ctxp, t, GOVD_LOCAL | GOVD_SEEN);
1078 DECL_SEEN_IN_BIND_EXPR_P (t) = 1;
1081 /* Preliminarily mark non-addressed complex variables as eligible
1082 for promotion to gimple registers. We'll transform their uses
1083 as we find them. */
1084 if ((TREE_CODE (TREE_TYPE (t)) == COMPLEX_TYPE
1085 || TREE_CODE (TREE_TYPE (t)) == VECTOR_TYPE)
1086 && !TREE_THIS_VOLATILE (t)
1087 && (TREE_CODE (t) == VAR_DECL && !DECL_HARD_REGISTER (t))
1088 && !needs_to_live_in_memory (t))
1089 DECL_GIMPLE_REG_P (t) = 1;
1092 gimple_push_bind_expr (bind_expr);
1093 gimplify_ctxp->save_stack = false;
1095 gimplify_to_stmt_list (&BIND_EXPR_BODY (bind_expr));
1097 if (gimplify_ctxp->save_stack)
1099 tree stack_save, stack_restore;
1101 /* Save stack on entry and restore it on exit. Add a try_finally
1102 block to achieve this. Note that mudflap depends on the
1103 format of the emitted code: see mx_register_decls(). */
1104 build_stack_save_restore (&stack_save, &stack_restore);
1106 t = build2 (TRY_FINALLY_EXPR, void_type_node,
1107 BIND_EXPR_BODY (bind_expr), NULL_TREE);
1108 append_to_statement_list (stack_restore, &TREE_OPERAND (t, 1));
1110 BIND_EXPR_BODY (bind_expr) = NULL_TREE;
1111 append_to_statement_list (stack_save, &BIND_EXPR_BODY (bind_expr));
1112 append_to_statement_list (t, &BIND_EXPR_BODY (bind_expr));
1115 gimplify_ctxp->save_stack = old_save_stack;
1116 gimple_pop_bind_expr ();
1118 if (temp)
1120 *expr_p = temp;
1121 append_to_statement_list (bind_expr, pre_p);
1122 return GS_OK;
1124 else
1125 return GS_ALL_DONE;
1128 /* Gimplify a RETURN_EXPR. If the expression to be returned is not a
1129 GIMPLE value, it is assigned to a new temporary and the statement is
1130 re-written to return the temporary.
1132 PRE_P points to the list where side effects that must happen before
1133 STMT should be stored. */
1135 static enum gimplify_status
1136 gimplify_return_expr (tree stmt, tree *pre_p)
1138 tree ret_expr = TREE_OPERAND (stmt, 0);
1139 tree result_decl, result;
1141 if (!ret_expr || TREE_CODE (ret_expr) == RESULT_DECL
1142 || ret_expr == error_mark_node)
1143 return GS_ALL_DONE;
1145 if (VOID_TYPE_P (TREE_TYPE (TREE_TYPE (current_function_decl))))
1146 result_decl = NULL_TREE;
1147 else
1149 result_decl = GENERIC_TREE_OPERAND (ret_expr, 0);
1150 if (TREE_CODE (result_decl) == INDIRECT_REF)
1151 /* See through a return by reference. */
1152 result_decl = TREE_OPERAND (result_decl, 0);
1154 gcc_assert ((TREE_CODE (ret_expr) == MODIFY_EXPR
1155 || TREE_CODE (ret_expr) == GIMPLE_MODIFY_STMT
1156 || TREE_CODE (ret_expr) == INIT_EXPR)
1157 && TREE_CODE (result_decl) == RESULT_DECL);
1160 /* If aggregate_value_p is true, then we can return the bare RESULT_DECL.
1161 Recall that aggregate_value_p is FALSE for any aggregate type that is
1162 returned in registers. If we're returning values in registers, then
1163 we don't want to extend the lifetime of the RESULT_DECL, particularly
1164 across another call. In addition, for those aggregates for which
1165 hard_function_value generates a PARALLEL, we'll die during normal
1166 expansion of structure assignments; there's special code in expand_return
1167 to handle this case that does not exist in expand_expr. */
1168 if (!result_decl
1169 || aggregate_value_p (result_decl, TREE_TYPE (current_function_decl)))
1170 result = result_decl;
1171 else if (gimplify_ctxp->return_temp)
1172 result = gimplify_ctxp->return_temp;
1173 else
1175 result = create_tmp_var (TREE_TYPE (result_decl), NULL);
1176 if (TREE_CODE (TREE_TYPE (result)) == COMPLEX_TYPE
1177 || TREE_CODE (TREE_TYPE (result)) == VECTOR_TYPE)
1178 DECL_GIMPLE_REG_P (result) = 1;
1180 /* ??? With complex control flow (usually involving abnormal edges),
1181 we can wind up warning about an uninitialized value for this. Due
1182 to how this variable is constructed and initialized, this is never
1183 true. Give up and never warn. */
1184 TREE_NO_WARNING (result) = 1;
1186 gimplify_ctxp->return_temp = result;
1189 /* Smash the lhs of the GIMPLE_MODIFY_STMT to the temporary we plan to use.
1190 Then gimplify the whole thing. */
1191 if (result != result_decl)
1192 GENERIC_TREE_OPERAND (ret_expr, 0) = result;
1194 gimplify_and_add (TREE_OPERAND (stmt, 0), pre_p);
1196 /* If we didn't use a temporary, then the result is just the result_decl.
1197 Otherwise we need a simple copy. This should already be gimple. */
1198 if (result == result_decl)
1199 ret_expr = result;
1200 else
1201 ret_expr = build2 (GIMPLE_MODIFY_STMT, TREE_TYPE (result), result_decl,
1202 result);
1203 TREE_OPERAND (stmt, 0) = ret_expr;
1205 return GS_ALL_DONE;
1208 /* Gimplifies a DECL_EXPR node *STMT_P by making any necessary allocation
1209 and initialization explicit. */
1211 static enum gimplify_status
1212 gimplify_decl_expr (tree *stmt_p)
1214 tree stmt = *stmt_p;
1215 tree decl = DECL_EXPR_DECL (stmt);
1217 *stmt_p = NULL_TREE;
1219 if (TREE_TYPE (decl) == error_mark_node)
1220 return GS_ERROR;
1222 if ((TREE_CODE (decl) == TYPE_DECL
1223 || TREE_CODE (decl) == VAR_DECL)
1224 && !TYPE_SIZES_GIMPLIFIED (TREE_TYPE (decl)))
1225 gimplify_type_sizes (TREE_TYPE (decl), stmt_p);
1227 if (TREE_CODE (decl) == VAR_DECL && !DECL_EXTERNAL (decl))
1229 tree init = DECL_INITIAL (decl);
1231 if (TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
1233 /* This is a variable-sized decl. Simplify its size and mark it
1234 for deferred expansion. Note that mudflap depends on the format
1235 of the emitted code: see mx_register_decls(). */
1236 tree t, args, addr, ptr_type;
1238 gimplify_one_sizepos (&DECL_SIZE (decl), stmt_p);
1239 gimplify_one_sizepos (&DECL_SIZE_UNIT (decl), stmt_p);
1241 /* All occurrences of this decl in final gimplified code will be
1242 replaced by indirection. Setting DECL_VALUE_EXPR does two
1243 things: First, it lets the rest of the gimplifier know what
1244 replacement to use. Second, it lets the debug info know
1245 where to find the value. */
1246 ptr_type = build_pointer_type (TREE_TYPE (decl));
1247 addr = create_tmp_var (ptr_type, get_name (decl));
1248 DECL_IGNORED_P (addr) = 0;
1249 t = build_fold_indirect_ref (addr);
1250 SET_DECL_VALUE_EXPR (decl, t);
1251 DECL_HAS_VALUE_EXPR_P (decl) = 1;
1253 args = tree_cons (NULL, DECL_SIZE_UNIT (decl), NULL);
1254 t = built_in_decls[BUILT_IN_ALLOCA];
1255 t = build_function_call_expr (t, args);
1256 t = fold_convert (ptr_type, t);
1257 t = build2 (GIMPLE_MODIFY_STMT, void_type_node, addr, t);
1259 gimplify_and_add (t, stmt_p);
1261 /* Indicate that we need to restore the stack level when the
1262 enclosing BIND_EXPR is exited. */
1263 gimplify_ctxp->save_stack = true;
1266 if (init && init != error_mark_node)
1268 if (!TREE_STATIC (decl))
1270 DECL_INITIAL (decl) = NULL_TREE;
1271 init = build2 (INIT_EXPR, void_type_node, decl, init);
1272 gimplify_and_add (init, stmt_p);
1274 else
1275 /* We must still examine initializers for static variables
1276 as they may contain a label address. */
1277 walk_tree (&init, force_labels_r, NULL, NULL);
1280 /* Some front ends do not explicitly declare all anonymous
1281 artificial variables. We compensate here by declaring the
1282 variables, though it would be better if the front ends would
1283 explicitly declare them. */
1284 if (!DECL_SEEN_IN_BIND_EXPR_P (decl)
1285 && DECL_ARTIFICIAL (decl) && DECL_NAME (decl) == NULL_TREE)
1286 gimple_add_tmp_var (decl);
1289 return GS_ALL_DONE;
1292 /* Gimplify a LOOP_EXPR. Normally this just involves gimplifying the body
1293 and replacing the LOOP_EXPR with goto, but if the loop contains an
1294 EXIT_EXPR, we need to append a label for it to jump to. */
1296 static enum gimplify_status
1297 gimplify_loop_expr (tree *expr_p, tree *pre_p)
1299 tree saved_label = gimplify_ctxp->exit_label;
1300 tree start_label = build1 (LABEL_EXPR, void_type_node, NULL_TREE);
1301 tree jump_stmt = build_and_jump (&LABEL_EXPR_LABEL (start_label));
1303 append_to_statement_list (start_label, pre_p);
1305 gimplify_ctxp->exit_label = NULL_TREE;
1307 gimplify_and_add (LOOP_EXPR_BODY (*expr_p), pre_p);
1309 if (gimplify_ctxp->exit_label)
1311 append_to_statement_list (jump_stmt, pre_p);
1312 *expr_p = build1 (LABEL_EXPR, void_type_node, gimplify_ctxp->exit_label);
1314 else
1315 *expr_p = jump_stmt;
1317 gimplify_ctxp->exit_label = saved_label;
1319 return GS_ALL_DONE;
1322 /* Compare two case labels. Because the front end should already have
1323 made sure that case ranges do not overlap, it is enough to only compare
1324 the CASE_LOW values of each case label. */
1326 static int
1327 compare_case_labels (const void *p1, const void *p2)
1329 tree case1 = *(tree *)p1;
1330 tree case2 = *(tree *)p2;
1332 return tree_int_cst_compare (CASE_LOW (case1), CASE_LOW (case2));
1335 /* Sort the case labels in LABEL_VEC in place in ascending order. */
1337 void
1338 sort_case_labels (tree label_vec)
1340 size_t len = TREE_VEC_LENGTH (label_vec);
1341 tree default_case = TREE_VEC_ELT (label_vec, len - 1);
1343 if (CASE_LOW (default_case))
1345 size_t i;
1347 /* The last label in the vector should be the default case
1348 but it is not. */
1349 for (i = 0; i < len; ++i)
1351 tree t = TREE_VEC_ELT (label_vec, i);
1352 if (!CASE_LOW (t))
1354 default_case = t;
1355 TREE_VEC_ELT (label_vec, i) = TREE_VEC_ELT (label_vec, len - 1);
1356 TREE_VEC_ELT (label_vec, len - 1) = default_case;
1357 break;
1362 qsort (&TREE_VEC_ELT (label_vec, 0), len - 1, sizeof (tree),
1363 compare_case_labels);
1366 /* Gimplify a SWITCH_EXPR, and collect a TREE_VEC of the labels it can
1367 branch to. */
1369 static enum gimplify_status
1370 gimplify_switch_expr (tree *expr_p, tree *pre_p)
1372 tree switch_expr = *expr_p;
1373 enum gimplify_status ret;
1375 ret = gimplify_expr (&SWITCH_COND (switch_expr), pre_p, NULL,
1376 is_gimple_val, fb_rvalue);
1378 if (SWITCH_BODY (switch_expr))
1380 VEC(tree,heap) *labels, *saved_labels;
1381 tree label_vec, default_case = NULL_TREE;
1382 size_t i, len;
1384 /* If someone can be bothered to fill in the labels, they can
1385 be bothered to null out the body too. */
1386 gcc_assert (!SWITCH_LABELS (switch_expr));
1388 saved_labels = gimplify_ctxp->case_labels;
1389 gimplify_ctxp->case_labels = VEC_alloc (tree, heap, 8);
1391 gimplify_to_stmt_list (&SWITCH_BODY (switch_expr));
1393 labels = gimplify_ctxp->case_labels;
1394 gimplify_ctxp->case_labels = saved_labels;
1396 i = 0;
1397 while (i < VEC_length (tree, labels))
1399 tree elt = VEC_index (tree, labels, i);
1400 tree low = CASE_LOW (elt);
1401 bool remove_element = FALSE;
1403 if (low)
1405 /* Discard empty ranges. */
1406 tree high = CASE_HIGH (elt);
1407 if (high && INT_CST_LT (high, low))
1408 remove_element = TRUE;
1410 else
1412 /* The default case must be the last label in the list. */
1413 gcc_assert (!default_case);
1414 default_case = elt;
1415 remove_element = TRUE;
1418 if (remove_element)
1419 VEC_ordered_remove (tree, labels, i);
1420 else
1421 i++;
1423 len = i;
1425 label_vec = make_tree_vec (len + 1);
1426 SWITCH_LABELS (*expr_p) = label_vec;
1427 append_to_statement_list (switch_expr, pre_p);
1429 if (! default_case)
1431 /* If the switch has no default label, add one, so that we jump
1432 around the switch body. */
1433 default_case = build3 (CASE_LABEL_EXPR, void_type_node, NULL_TREE,
1434 NULL_TREE, create_artificial_label ());
1435 append_to_statement_list (SWITCH_BODY (switch_expr), pre_p);
1436 *expr_p = build1 (LABEL_EXPR, void_type_node,
1437 CASE_LABEL (default_case));
1439 else
1440 *expr_p = SWITCH_BODY (switch_expr);
1442 for (i = 0; i < len; ++i)
1443 TREE_VEC_ELT (label_vec, i) = VEC_index (tree, labels, i);
1444 TREE_VEC_ELT (label_vec, len) = default_case;
1446 VEC_free (tree, heap, labels);
1448 sort_case_labels (label_vec);
1450 SWITCH_BODY (switch_expr) = NULL;
1452 else
1453 gcc_assert (SWITCH_LABELS (switch_expr));
1455 return ret;
1458 static enum gimplify_status
1459 gimplify_case_label_expr (tree *expr_p)
1461 tree expr = *expr_p;
1462 struct gimplify_ctx *ctxp;
1464 /* Invalid OpenMP programs can play Duff's Device type games with
1465 #pragma omp parallel. At least in the C front end, we don't
1466 detect such invalid branches until after gimplification. */
1467 for (ctxp = gimplify_ctxp; ; ctxp = ctxp->prev_context)
1468 if (ctxp->case_labels)
1469 break;
1471 VEC_safe_push (tree, heap, ctxp->case_labels, expr);
1472 *expr_p = build1 (LABEL_EXPR, void_type_node, CASE_LABEL (expr));
1473 return GS_ALL_DONE;
1476 /* Build a GOTO to the LABEL_DECL pointed to by LABEL_P, building it first
1477 if necessary. */
1479 tree
1480 build_and_jump (tree *label_p)
1482 if (label_p == NULL)
1483 /* If there's nowhere to jump, just fall through. */
1484 return NULL_TREE;
1486 if (*label_p == NULL_TREE)
1488 tree label = create_artificial_label ();
1489 *label_p = label;
1492 return build1 (GOTO_EXPR, void_type_node, *label_p);
1495 /* Gimplify an EXIT_EXPR by converting to a GOTO_EXPR inside a COND_EXPR.
1496 This also involves building a label to jump to and communicating it to
1497 gimplify_loop_expr through gimplify_ctxp->exit_label. */
1499 static enum gimplify_status
1500 gimplify_exit_expr (tree *expr_p)
1502 tree cond = TREE_OPERAND (*expr_p, 0);
1503 tree expr;
1505 expr = build_and_jump (&gimplify_ctxp->exit_label);
1506 expr = build3 (COND_EXPR, void_type_node, cond, expr, NULL_TREE);
1507 *expr_p = expr;
1509 return GS_OK;
1512 /* A helper function to be called via walk_tree. Mark all labels under *TP
1513 as being forced. To be called for DECL_INITIAL of static variables. */
1515 tree
1516 force_labels_r (tree *tp, int *walk_subtrees, void *data ATTRIBUTE_UNUSED)
1518 if (TYPE_P (*tp))
1519 *walk_subtrees = 0;
1520 if (TREE_CODE (*tp) == LABEL_DECL)
1521 FORCED_LABEL (*tp) = 1;
1523 return NULL_TREE;
1526 /* *EXPR_P is a COMPONENT_REF being used as an rvalue. If its type is
1527 different from its canonical type, wrap the whole thing inside a
1528 NOP_EXPR and force the type of the COMPONENT_REF to be the canonical
1529 type.
1531 The canonical type of a COMPONENT_REF is the type of the field being
1532 referenced--unless the field is a bit-field which can be read directly
1533 in a smaller mode, in which case the canonical type is the
1534 sign-appropriate type corresponding to that mode. */
1536 static void
1537 canonicalize_component_ref (tree *expr_p)
1539 tree expr = *expr_p;
1540 tree type;
1542 gcc_assert (TREE_CODE (expr) == COMPONENT_REF);
1544 if (INTEGRAL_TYPE_P (TREE_TYPE (expr)))
1545 type = TREE_TYPE (get_unwidened (expr, NULL_TREE));
1546 else
1547 type = TREE_TYPE (TREE_OPERAND (expr, 1));
1549 if (TREE_TYPE (expr) != type)
1551 tree old_type = TREE_TYPE (expr);
1553 /* Set the type of the COMPONENT_REF to the underlying type. */
1554 TREE_TYPE (expr) = type;
1556 /* And wrap the whole thing inside a NOP_EXPR. */
1557 expr = build1 (NOP_EXPR, old_type, expr);
1559 *expr_p = expr;
1563 /* If a NOP conversion is changing a pointer to array of foo to a pointer
1564 to foo, embed that change in the ADDR_EXPR by converting
1565 T array[U];
1566 (T *)&array
1568 &array[L]
1569 where L is the lower bound. For simplicity, only do this for constant
1570 lower bound. */
1572 static void
1573 canonicalize_addr_expr (tree *expr_p)
1575 tree expr = *expr_p;
1576 tree ctype = TREE_TYPE (expr);
1577 tree addr_expr = TREE_OPERAND (expr, 0);
1578 tree atype = TREE_TYPE (addr_expr);
1579 tree dctype, datype, ddatype, otype, obj_expr;
1581 /* Both cast and addr_expr types should be pointers. */
1582 if (!POINTER_TYPE_P (ctype) || !POINTER_TYPE_P (atype))
1583 return;
1585 /* The addr_expr type should be a pointer to an array. */
1586 datype = TREE_TYPE (atype);
1587 if (TREE_CODE (datype) != ARRAY_TYPE)
1588 return;
1590 /* Both cast and addr_expr types should address the same object type. */
1591 dctype = TREE_TYPE (ctype);
1592 ddatype = TREE_TYPE (datype);
1593 if (!lang_hooks.types_compatible_p (ddatype, dctype))
1594 return;
1596 /* The addr_expr and the object type should match. */
1597 obj_expr = TREE_OPERAND (addr_expr, 0);
1598 otype = TREE_TYPE (obj_expr);
1599 if (!lang_hooks.types_compatible_p (otype, datype))
1600 return;
1602 /* The lower bound and element sizes must be constant. */
1603 if (!TYPE_SIZE_UNIT (dctype)
1604 || TREE_CODE (TYPE_SIZE_UNIT (dctype)) != INTEGER_CST
1605 || !TYPE_DOMAIN (datype) || !TYPE_MIN_VALUE (TYPE_DOMAIN (datype))
1606 || TREE_CODE (TYPE_MIN_VALUE (TYPE_DOMAIN (datype))) != INTEGER_CST)
1607 return;
1609 /* All checks succeeded. Build a new node to merge the cast. */
1610 *expr_p = build4 (ARRAY_REF, dctype, obj_expr,
1611 TYPE_MIN_VALUE (TYPE_DOMAIN (datype)),
1612 TYPE_MIN_VALUE (TYPE_DOMAIN (datype)),
1613 size_binop (EXACT_DIV_EXPR, TYPE_SIZE_UNIT (dctype),
1614 size_int (TYPE_ALIGN_UNIT (dctype))));
1615 *expr_p = build1 (ADDR_EXPR, ctype, *expr_p);
1618 /* *EXPR_P is a NOP_EXPR or CONVERT_EXPR. Remove it and/or other conversions
1619 underneath as appropriate. */
1621 static enum gimplify_status
1622 gimplify_conversion (tree *expr_p)
1624 gcc_assert (TREE_CODE (*expr_p) == NOP_EXPR
1625 || TREE_CODE (*expr_p) == CONVERT_EXPR);
1627 /* Then strip away all but the outermost conversion. */
1628 STRIP_SIGN_NOPS (TREE_OPERAND (*expr_p, 0));
1630 /* And remove the outermost conversion if it's useless. */
1631 if (tree_ssa_useless_type_conversion (*expr_p))
1632 *expr_p = TREE_OPERAND (*expr_p, 0);
1634 /* If we still have a conversion at the toplevel,
1635 then canonicalize some constructs. */
1636 if (TREE_CODE (*expr_p) == NOP_EXPR || TREE_CODE (*expr_p) == CONVERT_EXPR)
1638 tree sub = TREE_OPERAND (*expr_p, 0);
1640 /* If a NOP conversion is changing the type of a COMPONENT_REF
1641 expression, then canonicalize its type now in order to expose more
1642 redundant conversions. */
1643 if (TREE_CODE (sub) == COMPONENT_REF)
1644 canonicalize_component_ref (&TREE_OPERAND (*expr_p, 0));
1646 /* If a NOP conversion is changing a pointer to array of foo
1647 to a pointer to foo, embed that change in the ADDR_EXPR. */
1648 else if (TREE_CODE (sub) == ADDR_EXPR)
1649 canonicalize_addr_expr (expr_p);
1652 return GS_OK;
1655 /* Gimplify a VAR_DECL or PARM_DECL. Returns GS_OK if we expanded a
1656 DECL_VALUE_EXPR, and it's worth re-examining things. */
1658 static enum gimplify_status
1659 gimplify_var_or_parm_decl (tree *expr_p)
1661 tree decl = *expr_p;
1663 /* ??? If this is a local variable, and it has not been seen in any
1664 outer BIND_EXPR, then it's probably the result of a duplicate
1665 declaration, for which we've already issued an error. It would
1666 be really nice if the front end wouldn't leak these at all.
1667 Currently the only known culprit is C++ destructors, as seen
1668 in g++.old-deja/g++.jason/binding.C. */
1669 if (TREE_CODE (decl) == VAR_DECL
1670 && !DECL_SEEN_IN_BIND_EXPR_P (decl)
1671 && !TREE_STATIC (decl) && !DECL_EXTERNAL (decl)
1672 && decl_function_context (decl) == current_function_decl)
1674 gcc_assert (errorcount || sorrycount);
1675 return GS_ERROR;
1678 /* When within an OpenMP context, notice uses of variables. */
1679 if (gimplify_omp_ctxp && omp_notice_variable (gimplify_omp_ctxp, decl, true))
1680 return GS_ALL_DONE;
1682 /* If the decl is an alias for another expression, substitute it now. */
1683 if (DECL_HAS_VALUE_EXPR_P (decl))
1685 *expr_p = unshare_expr (DECL_VALUE_EXPR (decl));
1686 return GS_OK;
1689 return GS_ALL_DONE;
1693 /* Gimplify the COMPONENT_REF, ARRAY_REF, REALPART_EXPR or IMAGPART_EXPR
1694 node pointed to by EXPR_P.
1696 compound_lval
1697 : min_lval '[' val ']'
1698 | min_lval '.' ID
1699 | compound_lval '[' val ']'
1700 | compound_lval '.' ID
1702 This is not part of the original SIMPLE definition, which separates
1703 array and member references, but it seems reasonable to handle them
1704 together. Also, this way we don't run into problems with union
1705 aliasing; gcc requires that for accesses through a union to alias, the
1706 union reference must be explicit, which was not always the case when we
1707 were splitting up array and member refs.
1709 PRE_P points to the list where side effects that must happen before
1710 *EXPR_P should be stored.
1712 POST_P points to the list where side effects that must happen after
1713 *EXPR_P should be stored. */
1715 static enum gimplify_status
1716 gimplify_compound_lval (tree *expr_p, tree *pre_p,
1717 tree *post_p, fallback_t fallback)
1719 tree *p;
1720 VEC(tree,heap) *stack;
1721 enum gimplify_status ret = GS_OK, tret;
1722 int i;
1724 /* Create a stack of the subexpressions so later we can walk them in
1725 order from inner to outer. */
1726 stack = VEC_alloc (tree, heap, 10);
1728 /* We can handle anything that get_inner_reference can deal with. */
1729 for (p = expr_p; ; p = &TREE_OPERAND (*p, 0))
1731 restart:
1732 /* Fold INDIRECT_REFs now to turn them into ARRAY_REFs. */
1733 if (TREE_CODE (*p) == INDIRECT_REF)
1734 *p = fold_indirect_ref (*p);
1736 if (handled_component_p (*p))
1738 /* Expand DECL_VALUE_EXPR now. In some cases that may expose
1739 additional COMPONENT_REFs. */
1740 else if ((TREE_CODE (*p) == VAR_DECL || TREE_CODE (*p) == PARM_DECL)
1741 && gimplify_var_or_parm_decl (p) == GS_OK)
1742 goto restart;
1743 else
1744 break;
1746 VEC_safe_push (tree, heap, stack, *p);
1749 gcc_assert (VEC_length (tree, stack));
1751 /* Now STACK is a stack of pointers to all the refs we've walked through
1752 and P points to the innermost expression.
1754 Java requires that we elaborated nodes in source order. That
1755 means we must gimplify the inner expression followed by each of
1756 the indices, in order. But we can't gimplify the inner
1757 expression until we deal with any variable bounds, sizes, or
1758 positions in order to deal with PLACEHOLDER_EXPRs.
1760 So we do this in three steps. First we deal with the annotations
1761 for any variables in the components, then we gimplify the base,
1762 then we gimplify any indices, from left to right. */
1763 for (i = VEC_length (tree, stack) - 1; i >= 0; i--)
1765 tree t = VEC_index (tree, stack, i);
1767 if (TREE_CODE (t) == ARRAY_REF || TREE_CODE (t) == ARRAY_RANGE_REF)
1769 /* Gimplify the low bound and element type size and put them into
1770 the ARRAY_REF. If these values are set, they have already been
1771 gimplified. */
1772 if (!TREE_OPERAND (t, 2))
1774 tree low = unshare_expr (array_ref_low_bound (t));
1775 if (!is_gimple_min_invariant (low))
1777 TREE_OPERAND (t, 2) = low;
1778 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p, post_p,
1779 is_gimple_formal_tmp_reg, fb_rvalue);
1780 ret = MIN (ret, tret);
1784 if (!TREE_OPERAND (t, 3))
1786 tree elmt_type = TREE_TYPE (TREE_TYPE (TREE_OPERAND (t, 0)));
1787 tree elmt_size = unshare_expr (array_ref_element_size (t));
1788 tree factor = size_int (TYPE_ALIGN_UNIT (elmt_type));
1790 /* Divide the element size by the alignment of the element
1791 type (above). */
1792 elmt_size = size_binop (EXACT_DIV_EXPR, elmt_size, factor);
1794 if (!is_gimple_min_invariant (elmt_size))
1796 TREE_OPERAND (t, 3) = elmt_size;
1797 tret = gimplify_expr (&TREE_OPERAND (t, 3), pre_p, post_p,
1798 is_gimple_formal_tmp_reg, fb_rvalue);
1799 ret = MIN (ret, tret);
1803 else if (TREE_CODE (t) == COMPONENT_REF)
1805 /* Set the field offset into T and gimplify it. */
1806 if (!TREE_OPERAND (t, 2))
1808 tree offset = unshare_expr (component_ref_field_offset (t));
1809 tree field = TREE_OPERAND (t, 1);
1810 tree factor
1811 = size_int (DECL_OFFSET_ALIGN (field) / BITS_PER_UNIT);
1813 /* Divide the offset by its alignment. */
1814 offset = size_binop (EXACT_DIV_EXPR, offset, factor);
1816 if (!is_gimple_min_invariant (offset))
1818 TREE_OPERAND (t, 2) = offset;
1819 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p, post_p,
1820 is_gimple_formal_tmp_reg, fb_rvalue);
1821 ret = MIN (ret, tret);
1827 /* Step 2 is to gimplify the base expression. Make sure lvalue is set
1828 so as to match the min_lval predicate. Failure to do so may result
1829 in the creation of large aggregate temporaries. */
1830 tret = gimplify_expr (p, pre_p, post_p, is_gimple_min_lval,
1831 fallback | fb_lvalue);
1832 ret = MIN (ret, tret);
1834 /* And finally, the indices and operands to BIT_FIELD_REF. During this
1835 loop we also remove any useless conversions. */
1836 for (; VEC_length (tree, stack) > 0; )
1838 tree t = VEC_pop (tree, stack);
1840 if (TREE_CODE (t) == ARRAY_REF || TREE_CODE (t) == ARRAY_RANGE_REF)
1842 /* Gimplify the dimension.
1843 Temporary fix for gcc.c-torture/execute/20040313-1.c.
1844 Gimplify non-constant array indices into a temporary
1845 variable.
1846 FIXME - The real fix is to gimplify post-modify
1847 expressions into a minimal gimple lvalue. However, that
1848 exposes bugs in alias analysis. The alias analyzer does
1849 not handle &PTR->FIELD very well. Will fix after the
1850 branch is merged into mainline (dnovillo 2004-05-03). */
1851 if (!is_gimple_min_invariant (TREE_OPERAND (t, 1)))
1853 tret = gimplify_expr (&TREE_OPERAND (t, 1), pre_p, post_p,
1854 is_gimple_formal_tmp_reg, fb_rvalue);
1855 ret = MIN (ret, tret);
1858 else if (TREE_CODE (t) == BIT_FIELD_REF)
1860 tret = gimplify_expr (&TREE_OPERAND (t, 1), pre_p, post_p,
1861 is_gimple_val, fb_rvalue);
1862 ret = MIN (ret, tret);
1863 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p, post_p,
1864 is_gimple_val, fb_rvalue);
1865 ret = MIN (ret, tret);
1868 STRIP_USELESS_TYPE_CONVERSION (TREE_OPERAND (t, 0));
1870 /* The innermost expression P may have originally had TREE_SIDE_EFFECTS
1871 set which would have caused all the outer expressions in EXPR_P
1872 leading to P to also have had TREE_SIDE_EFFECTS set. */
1873 recalculate_side_effects (t);
1876 tret = gimplify_expr (p, pre_p, post_p, is_gimple_min_lval, fallback);
1877 ret = MIN (ret, tret);
1879 /* If the outermost expression is a COMPONENT_REF, canonicalize its type. */
1880 if ((fallback & fb_rvalue) && TREE_CODE (*expr_p) == COMPONENT_REF)
1882 canonicalize_component_ref (expr_p);
1883 ret = MIN (ret, GS_OK);
1886 VEC_free (tree, heap, stack);
1888 return ret;
1891 /* Gimplify the self modifying expression pointed to by EXPR_P
1892 (++, --, +=, -=).
1894 PRE_P points to the list where side effects that must happen before
1895 *EXPR_P should be stored.
1897 POST_P points to the list where side effects that must happen after
1898 *EXPR_P should be stored.
1900 WANT_VALUE is nonzero iff we want to use the value of this expression
1901 in another expression. */
1903 static enum gimplify_status
1904 gimplify_self_mod_expr (tree *expr_p, tree *pre_p, tree *post_p,
1905 bool want_value)
1907 enum tree_code code;
1908 tree lhs, lvalue, rhs, t1, post = NULL, *orig_post_p = post_p;
1909 bool postfix;
1910 enum tree_code arith_code;
1911 enum gimplify_status ret;
1913 code = TREE_CODE (*expr_p);
1915 gcc_assert (code == POSTINCREMENT_EXPR || code == POSTDECREMENT_EXPR
1916 || code == PREINCREMENT_EXPR || code == PREDECREMENT_EXPR);
1918 /* Prefix or postfix? */
1919 if (code == POSTINCREMENT_EXPR || code == POSTDECREMENT_EXPR)
1920 /* Faster to treat as prefix if result is not used. */
1921 postfix = want_value;
1922 else
1923 postfix = false;
1925 /* For postfix, make sure the inner expression's post side effects
1926 are executed after side effects from this expression. */
1927 if (postfix)
1928 post_p = &post;
1930 /* Add or subtract? */
1931 if (code == PREINCREMENT_EXPR || code == POSTINCREMENT_EXPR)
1932 arith_code = PLUS_EXPR;
1933 else
1934 arith_code = MINUS_EXPR;
1936 /* Gimplify the LHS into a GIMPLE lvalue. */
1937 lvalue = TREE_OPERAND (*expr_p, 0);
1938 ret = gimplify_expr (&lvalue, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
1939 if (ret == GS_ERROR)
1940 return ret;
1942 /* Extract the operands to the arithmetic operation. */
1943 lhs = lvalue;
1944 rhs = TREE_OPERAND (*expr_p, 1);
1946 /* For postfix operator, we evaluate the LHS to an rvalue and then use
1947 that as the result value and in the postqueue operation. */
1948 if (postfix)
1950 ret = gimplify_expr (&lhs, pre_p, post_p, is_gimple_val, fb_rvalue);
1951 if (ret == GS_ERROR)
1952 return ret;
1955 t1 = build2 (arith_code, TREE_TYPE (*expr_p), lhs, rhs);
1956 t1 = build2 (GIMPLE_MODIFY_STMT, TREE_TYPE (lvalue), lvalue, t1);
1958 if (postfix)
1960 gimplify_and_add (t1, orig_post_p);
1961 append_to_statement_list (post, orig_post_p);
1962 *expr_p = lhs;
1963 return GS_ALL_DONE;
1965 else
1967 *expr_p = t1;
1968 return GS_OK;
1972 /* If *EXPR_P has a variable sized type, wrap it in a WITH_SIZE_EXPR. */
1974 static void
1975 maybe_with_size_expr (tree *expr_p)
1977 tree expr = *expr_p;
1978 tree type = TREE_TYPE (expr);
1979 tree size;
1981 /* If we've already wrapped this or the type is error_mark_node, we can't do
1982 anything. */
1983 if (TREE_CODE (expr) == WITH_SIZE_EXPR
1984 || type == error_mark_node)
1985 return;
1987 /* If the size isn't known or is a constant, we have nothing to do. */
1988 size = TYPE_SIZE_UNIT (type);
1989 if (!size || TREE_CODE (size) == INTEGER_CST)
1990 return;
1992 /* Otherwise, make a WITH_SIZE_EXPR. */
1993 size = unshare_expr (size);
1994 size = SUBSTITUTE_PLACEHOLDER_IN_EXPR (size, expr);
1995 *expr_p = build2 (WITH_SIZE_EXPR, type, expr, size);
1998 /* Subroutine of gimplify_call_expr: Gimplify a single argument. */
2000 static enum gimplify_status
2001 gimplify_arg (tree *expr_p, tree *pre_p)
2003 bool (*test) (tree);
2004 fallback_t fb;
2006 /* In general, we allow lvalues for function arguments to avoid
2007 extra overhead of copying large aggregates out of even larger
2008 aggregates into temporaries only to copy the temporaries to
2009 the argument list. Make optimizers happy by pulling out to
2010 temporaries those types that fit in registers. */
2011 if (is_gimple_reg_type (TREE_TYPE (*expr_p)))
2012 test = is_gimple_val, fb = fb_rvalue;
2013 else
2014 test = is_gimple_lvalue, fb = fb_either;
2016 /* If this is a variable sized type, we must remember the size. */
2017 maybe_with_size_expr (expr_p);
2019 /* There is a sequence point before a function call. Side effects in
2020 the argument list must occur before the actual call. So, when
2021 gimplifying arguments, force gimplify_expr to use an internal
2022 post queue which is then appended to the end of PRE_P. */
2023 return gimplify_expr (expr_p, pre_p, NULL, test, fb);
2026 /* Gimplify the CALL_EXPR node pointed to by EXPR_P. PRE_P points to the
2027 list where side effects that must happen before *EXPR_P should be stored.
2028 WANT_VALUE is true if the result of the call is desired. */
2030 static enum gimplify_status
2031 gimplify_call_expr (tree *expr_p, tree *pre_p, bool want_value)
2033 tree decl;
2034 tree arglist;
2035 enum gimplify_status ret;
2037 gcc_assert (TREE_CODE (*expr_p) == CALL_EXPR);
2039 /* For reliable diagnostics during inlining, it is necessary that
2040 every call_expr be annotated with file and line. */
2041 if (! EXPR_HAS_LOCATION (*expr_p))
2042 SET_EXPR_LOCATION (*expr_p, input_location);
2044 /* This may be a call to a builtin function.
2046 Builtin function calls may be transformed into different
2047 (and more efficient) builtin function calls under certain
2048 circumstances. Unfortunately, gimplification can muck things
2049 up enough that the builtin expanders are not aware that certain
2050 transformations are still valid.
2052 So we attempt transformation/gimplification of the call before
2053 we gimplify the CALL_EXPR. At this time we do not manage to
2054 transform all calls in the same manner as the expanders do, but
2055 we do transform most of them. */
2056 decl = get_callee_fndecl (*expr_p);
2057 if (decl && DECL_BUILT_IN (decl))
2059 tree arglist = TREE_OPERAND (*expr_p, 1);
2060 tree new = fold_builtin (decl, arglist, !want_value);
2062 if (new && new != *expr_p)
2064 /* There was a transformation of this call which computes the
2065 same value, but in a more efficient way. Return and try
2066 again. */
2067 *expr_p = new;
2068 return GS_OK;
2071 if (DECL_BUILT_IN_CLASS (decl) == BUILT_IN_NORMAL
2072 && DECL_FUNCTION_CODE (decl) == BUILT_IN_VA_START)
2074 if (!arglist || !TREE_CHAIN (arglist))
2076 error ("too few arguments to function %<va_start%>");
2077 *expr_p = build_empty_stmt ();
2078 return GS_OK;
2081 if (fold_builtin_next_arg (TREE_CHAIN (arglist)))
2083 *expr_p = build_empty_stmt ();
2084 return GS_OK;
2086 /* Avoid gimplifying the second argument to va_start, which needs
2087 to be the plain PARM_DECL. */
2088 return gimplify_arg (&TREE_VALUE (TREE_OPERAND (*expr_p, 1)), pre_p);
2092 /* There is a sequence point before the call, so any side effects in
2093 the calling expression must occur before the actual call. Force
2094 gimplify_expr to use an internal post queue. */
2095 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, NULL,
2096 is_gimple_call_addr, fb_rvalue);
2098 if (PUSH_ARGS_REVERSED)
2099 TREE_OPERAND (*expr_p, 1) = nreverse (TREE_OPERAND (*expr_p, 1));
2100 for (arglist = TREE_OPERAND (*expr_p, 1); arglist;
2101 arglist = TREE_CHAIN (arglist))
2103 enum gimplify_status t;
2105 t = gimplify_arg (&TREE_VALUE (arglist), pre_p);
2107 if (t == GS_ERROR)
2108 ret = GS_ERROR;
2110 if (PUSH_ARGS_REVERSED)
2111 TREE_OPERAND (*expr_p, 1) = nreverse (TREE_OPERAND (*expr_p, 1));
2113 /* Try this again in case gimplification exposed something. */
2114 if (ret != GS_ERROR)
2116 decl = get_callee_fndecl (*expr_p);
2117 if (decl && DECL_BUILT_IN (decl))
2119 tree arglist = TREE_OPERAND (*expr_p, 1);
2120 tree new = fold_builtin (decl, arglist, !want_value);
2122 if (new && new != *expr_p)
2124 /* There was a transformation of this call which computes the
2125 same value, but in a more efficient way. Return and try
2126 again. */
2127 *expr_p = new;
2128 return GS_OK;
2133 /* If the function is "const" or "pure", then clear TREE_SIDE_EFFECTS on its
2134 decl. This allows us to eliminate redundant or useless
2135 calls to "const" functions. */
2136 if (TREE_CODE (*expr_p) == CALL_EXPR
2137 && (call_expr_flags (*expr_p) & (ECF_CONST | ECF_PURE)))
2138 TREE_SIDE_EFFECTS (*expr_p) = 0;
2140 return ret;
2143 /* Handle shortcut semantics in the predicate operand of a COND_EXPR by
2144 rewriting it into multiple COND_EXPRs, and possibly GOTO_EXPRs.
2146 TRUE_LABEL_P and FALSE_LABEL_P point to the labels to jump to if the
2147 condition is true or false, respectively. If null, we should generate
2148 our own to skip over the evaluation of this specific expression.
2150 This function is the tree equivalent of do_jump.
2152 shortcut_cond_r should only be called by shortcut_cond_expr. */
2154 static tree
2155 shortcut_cond_r (tree pred, tree *true_label_p, tree *false_label_p)
2157 tree local_label = NULL_TREE;
2158 tree t, expr = NULL;
2160 /* OK, it's not a simple case; we need to pull apart the COND_EXPR to
2161 retain the shortcut semantics. Just insert the gotos here;
2162 shortcut_cond_expr will append the real blocks later. */
2163 if (TREE_CODE (pred) == TRUTH_ANDIF_EXPR)
2165 /* Turn if (a && b) into
2167 if (a); else goto no;
2168 if (b) goto yes; else goto no;
2169 (no:) */
2171 if (false_label_p == NULL)
2172 false_label_p = &local_label;
2174 t = shortcut_cond_r (TREE_OPERAND (pred, 0), NULL, false_label_p);
2175 append_to_statement_list (t, &expr);
2177 t = shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p,
2178 false_label_p);
2179 append_to_statement_list (t, &expr);
2181 else if (TREE_CODE (pred) == TRUTH_ORIF_EXPR)
2183 /* Turn if (a || b) into
2185 if (a) goto yes;
2186 if (b) goto yes; else goto no;
2187 (yes:) */
2189 if (true_label_p == NULL)
2190 true_label_p = &local_label;
2192 t = shortcut_cond_r (TREE_OPERAND (pred, 0), true_label_p, NULL);
2193 append_to_statement_list (t, &expr);
2195 t = shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p,
2196 false_label_p);
2197 append_to_statement_list (t, &expr);
2199 else if (TREE_CODE (pred) == COND_EXPR)
2201 /* As long as we're messing with gotos, turn if (a ? b : c) into
2202 if (a)
2203 if (b) goto yes; else goto no;
2204 else
2205 if (c) goto yes; else goto no; */
2206 expr = build3 (COND_EXPR, void_type_node, TREE_OPERAND (pred, 0),
2207 shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p,
2208 false_label_p),
2209 shortcut_cond_r (TREE_OPERAND (pred, 2), true_label_p,
2210 false_label_p));
2212 else
2214 expr = build3 (COND_EXPR, void_type_node, pred,
2215 build_and_jump (true_label_p),
2216 build_and_jump (false_label_p));
2219 if (local_label)
2221 t = build1 (LABEL_EXPR, void_type_node, local_label);
2222 append_to_statement_list (t, &expr);
2225 return expr;
2228 static tree
2229 shortcut_cond_expr (tree expr)
2231 tree pred = TREE_OPERAND (expr, 0);
2232 tree then_ = TREE_OPERAND (expr, 1);
2233 tree else_ = TREE_OPERAND (expr, 2);
2234 tree true_label, false_label, end_label, t;
2235 tree *true_label_p;
2236 tree *false_label_p;
2237 bool emit_end, emit_false, jump_over_else;
2238 bool then_se = then_ && TREE_SIDE_EFFECTS (then_);
2239 bool else_se = else_ && TREE_SIDE_EFFECTS (else_);
2241 /* First do simple transformations. */
2242 if (!else_se)
2244 /* If there is no 'else', turn (a && b) into if (a) if (b). */
2245 while (TREE_CODE (pred) == TRUTH_ANDIF_EXPR)
2247 TREE_OPERAND (expr, 0) = TREE_OPERAND (pred, 1);
2248 then_ = shortcut_cond_expr (expr);
2249 then_se = then_ && TREE_SIDE_EFFECTS (then_);
2250 pred = TREE_OPERAND (pred, 0);
2251 expr = build3 (COND_EXPR, void_type_node, pred, then_, NULL_TREE);
2254 if (!then_se)
2256 /* If there is no 'then', turn
2257 if (a || b); else d
2258 into
2259 if (a); else if (b); else d. */
2260 while (TREE_CODE (pred) == TRUTH_ORIF_EXPR)
2262 TREE_OPERAND (expr, 0) = TREE_OPERAND (pred, 1);
2263 else_ = shortcut_cond_expr (expr);
2264 else_se = else_ && TREE_SIDE_EFFECTS (else_);
2265 pred = TREE_OPERAND (pred, 0);
2266 expr = build3 (COND_EXPR, void_type_node, pred, NULL_TREE, else_);
2270 /* If we're done, great. */
2271 if (TREE_CODE (pred) != TRUTH_ANDIF_EXPR
2272 && TREE_CODE (pred) != TRUTH_ORIF_EXPR)
2273 return expr;
2275 /* Otherwise we need to mess with gotos. Change
2276 if (a) c; else d;
2278 if (a); else goto no;
2279 c; goto end;
2280 no: d; end:
2281 and recursively gimplify the condition. */
2283 true_label = false_label = end_label = NULL_TREE;
2285 /* If our arms just jump somewhere, hijack those labels so we don't
2286 generate jumps to jumps. */
2288 if (then_
2289 && TREE_CODE (then_) == GOTO_EXPR
2290 && TREE_CODE (GOTO_DESTINATION (then_)) == LABEL_DECL)
2292 true_label = GOTO_DESTINATION (then_);
2293 then_ = NULL;
2294 then_se = false;
2297 if (else_
2298 && TREE_CODE (else_) == GOTO_EXPR
2299 && TREE_CODE (GOTO_DESTINATION (else_)) == LABEL_DECL)
2301 false_label = GOTO_DESTINATION (else_);
2302 else_ = NULL;
2303 else_se = false;
2306 /* If we aren't hijacking a label for the 'then' branch, it falls through. */
2307 if (true_label)
2308 true_label_p = &true_label;
2309 else
2310 true_label_p = NULL;
2312 /* The 'else' branch also needs a label if it contains interesting code. */
2313 if (false_label || else_se)
2314 false_label_p = &false_label;
2315 else
2316 false_label_p = NULL;
2318 /* If there was nothing else in our arms, just forward the label(s). */
2319 if (!then_se && !else_se)
2320 return shortcut_cond_r (pred, true_label_p, false_label_p);
2322 /* If our last subexpression already has a terminal label, reuse it. */
2323 if (else_se)
2324 expr = expr_last (else_);
2325 else if (then_se)
2326 expr = expr_last (then_);
2327 else
2328 expr = NULL;
2329 if (expr && TREE_CODE (expr) == LABEL_EXPR)
2330 end_label = LABEL_EXPR_LABEL (expr);
2332 /* If we don't care about jumping to the 'else' branch, jump to the end
2333 if the condition is false. */
2334 if (!false_label_p)
2335 false_label_p = &end_label;
2337 /* We only want to emit these labels if we aren't hijacking them. */
2338 emit_end = (end_label == NULL_TREE);
2339 emit_false = (false_label == NULL_TREE);
2341 /* We only emit the jump over the else clause if we have to--if the
2342 then clause may fall through. Otherwise we can wind up with a
2343 useless jump and a useless label at the end of gimplified code,
2344 which will cause us to think that this conditional as a whole
2345 falls through even if it doesn't. If we then inline a function
2346 which ends with such a condition, that can cause us to issue an
2347 inappropriate warning about control reaching the end of a
2348 non-void function. */
2349 jump_over_else = block_may_fallthru (then_);
2351 pred = shortcut_cond_r (pred, true_label_p, false_label_p);
2353 expr = NULL;
2354 append_to_statement_list (pred, &expr);
2356 append_to_statement_list (then_, &expr);
2357 if (else_se)
2359 if (jump_over_else)
2361 t = build_and_jump (&end_label);
2362 append_to_statement_list (t, &expr);
2364 if (emit_false)
2366 t = build1 (LABEL_EXPR, void_type_node, false_label);
2367 append_to_statement_list (t, &expr);
2369 append_to_statement_list (else_, &expr);
2371 if (emit_end && end_label)
2373 t = build1 (LABEL_EXPR, void_type_node, end_label);
2374 append_to_statement_list (t, &expr);
2377 return expr;
2380 /* EXPR is used in a boolean context; make sure it has BOOLEAN_TYPE. */
2382 tree
2383 gimple_boolify (tree expr)
2385 tree type = TREE_TYPE (expr);
2387 if (TREE_CODE (type) == BOOLEAN_TYPE)
2388 return expr;
2390 switch (TREE_CODE (expr))
2392 case TRUTH_AND_EXPR:
2393 case TRUTH_OR_EXPR:
2394 case TRUTH_XOR_EXPR:
2395 case TRUTH_ANDIF_EXPR:
2396 case TRUTH_ORIF_EXPR:
2397 /* Also boolify the arguments of truth exprs. */
2398 TREE_OPERAND (expr, 1) = gimple_boolify (TREE_OPERAND (expr, 1));
2399 /* FALLTHRU */
2401 case TRUTH_NOT_EXPR:
2402 TREE_OPERAND (expr, 0) = gimple_boolify (TREE_OPERAND (expr, 0));
2403 /* FALLTHRU */
2405 case EQ_EXPR: case NE_EXPR:
2406 case LE_EXPR: case GE_EXPR: case LT_EXPR: case GT_EXPR:
2407 /* These expressions always produce boolean results. */
2408 TREE_TYPE (expr) = boolean_type_node;
2409 return expr;
2411 default:
2412 /* Other expressions that get here must have boolean values, but
2413 might need to be converted to the appropriate mode. */
2414 return fold_convert (boolean_type_node, expr);
2418 /* Convert the conditional expression pointed to by EXPR_P '(p) ? a : b;'
2419 into
2421 if (p) if (p)
2422 t1 = a; a;
2423 else or else
2424 t1 = b; b;
2427 The second form is used when *EXPR_P is of type void.
2429 TARGET is the tree for T1 above.
2431 PRE_P points to the list where side effects that must happen before
2432 *EXPR_P should be stored. */
2434 static enum gimplify_status
2435 gimplify_cond_expr (tree *expr_p, tree *pre_p, fallback_t fallback)
2437 tree expr = *expr_p;
2438 tree tmp, tmp2, type;
2439 enum gimplify_status ret;
2441 type = TREE_TYPE (expr);
2443 /* If this COND_EXPR has a value, copy the values into a temporary within
2444 the arms. */
2445 if (! VOID_TYPE_P (type))
2447 tree result;
2449 if ((fallback & fb_lvalue) == 0)
2451 result = tmp2 = tmp = create_tmp_var (TREE_TYPE (expr), "iftmp");
2452 ret = GS_ALL_DONE;
2454 else
2456 tree type = build_pointer_type (TREE_TYPE (expr));
2458 if (TREE_TYPE (TREE_OPERAND (expr, 1)) != void_type_node)
2459 TREE_OPERAND (expr, 1) =
2460 build_fold_addr_expr (TREE_OPERAND (expr, 1));
2462 if (TREE_TYPE (TREE_OPERAND (expr, 2)) != void_type_node)
2463 TREE_OPERAND (expr, 2) =
2464 build_fold_addr_expr (TREE_OPERAND (expr, 2));
2466 tmp2 = tmp = create_tmp_var (type, "iftmp");
2468 expr = build3 (COND_EXPR, void_type_node, TREE_OPERAND (expr, 0),
2469 TREE_OPERAND (expr, 1), TREE_OPERAND (expr, 2));
2471 result = build_fold_indirect_ref (tmp);
2472 ret = GS_ALL_DONE;
2475 /* Build the then clause, 't1 = a;'. But don't build an assignment
2476 if this branch is void; in C++ it can be, if it's a throw. */
2477 if (TREE_TYPE (TREE_OPERAND (expr, 1)) != void_type_node)
2478 TREE_OPERAND (expr, 1)
2479 = build2 (GIMPLE_MODIFY_STMT, void_type_node, tmp,
2480 TREE_OPERAND (expr, 1));
2482 /* Build the else clause, 't1 = b;'. */
2483 if (TREE_TYPE (TREE_OPERAND (expr, 2)) != void_type_node)
2484 TREE_OPERAND (expr, 2)
2485 = build2 (GIMPLE_MODIFY_STMT, void_type_node, tmp2,
2486 TREE_OPERAND (expr, 2));
2488 TREE_TYPE (expr) = void_type_node;
2489 recalculate_side_effects (expr);
2491 /* Move the COND_EXPR to the prequeue. */
2492 gimplify_and_add (expr, pre_p);
2494 *expr_p = result;
2495 return ret;
2498 /* Make sure the condition has BOOLEAN_TYPE. */
2499 TREE_OPERAND (expr, 0) = gimple_boolify (TREE_OPERAND (expr, 0));
2501 /* Break apart && and || conditions. */
2502 if (TREE_CODE (TREE_OPERAND (expr, 0)) == TRUTH_ANDIF_EXPR
2503 || TREE_CODE (TREE_OPERAND (expr, 0)) == TRUTH_ORIF_EXPR)
2505 expr = shortcut_cond_expr (expr);
2507 if (expr != *expr_p)
2509 *expr_p = expr;
2511 /* We can't rely on gimplify_expr to re-gimplify the expanded
2512 form properly, as cleanups might cause the target labels to be
2513 wrapped in a TRY_FINALLY_EXPR. To prevent that, we need to
2514 set up a conditional context. */
2515 gimple_push_condition ();
2516 gimplify_stmt (expr_p);
2517 gimple_pop_condition (pre_p);
2519 return GS_ALL_DONE;
2523 /* Now do the normal gimplification. */
2524 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, NULL,
2525 is_gimple_condexpr, fb_rvalue);
2527 gimple_push_condition ();
2529 gimplify_to_stmt_list (&TREE_OPERAND (expr, 1));
2530 gimplify_to_stmt_list (&TREE_OPERAND (expr, 2));
2531 recalculate_side_effects (expr);
2533 gimple_pop_condition (pre_p);
2535 if (ret == GS_ERROR)
2537 else if (TREE_SIDE_EFFECTS (TREE_OPERAND (expr, 1)))
2538 ret = GS_ALL_DONE;
2539 else if (TREE_SIDE_EFFECTS (TREE_OPERAND (expr, 2)))
2540 /* Rewrite "if (a); else b" to "if (!a) b" */
2542 TREE_OPERAND (expr, 0) = invert_truthvalue (TREE_OPERAND (expr, 0));
2543 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, NULL,
2544 is_gimple_condexpr, fb_rvalue);
2546 tmp = TREE_OPERAND (expr, 1);
2547 TREE_OPERAND (expr, 1) = TREE_OPERAND (expr, 2);
2548 TREE_OPERAND (expr, 2) = tmp;
2550 else
2551 /* Both arms are empty; replace the COND_EXPR with its predicate. */
2552 expr = TREE_OPERAND (expr, 0);
2554 *expr_p = expr;
2555 return ret;
2558 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
2559 a call to __builtin_memcpy. */
2561 static enum gimplify_status
2562 gimplify_modify_expr_to_memcpy (tree *expr_p, tree size, bool want_value)
2564 tree args, t, to, to_ptr, from;
2566 to = GENERIC_TREE_OPERAND (*expr_p, 0);
2567 from = GENERIC_TREE_OPERAND (*expr_p, 1);
2569 args = tree_cons (NULL, size, NULL);
2571 t = build_fold_addr_expr (from);
2572 args = tree_cons (NULL, t, args);
2574 to_ptr = build_fold_addr_expr (to);
2575 args = tree_cons (NULL, to_ptr, args);
2576 t = implicit_built_in_decls[BUILT_IN_MEMCPY];
2577 t = build_function_call_expr (t, args);
2579 if (want_value)
2581 t = build1 (NOP_EXPR, TREE_TYPE (to_ptr), t);
2582 t = build1 (INDIRECT_REF, TREE_TYPE (to), t);
2585 *expr_p = t;
2586 return GS_OK;
2589 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
2590 a call to __builtin_memset. In this case we know that the RHS is
2591 a CONSTRUCTOR with an empty element list. */
2593 static enum gimplify_status
2594 gimplify_modify_expr_to_memset (tree *expr_p, tree size, bool want_value)
2596 tree args, t, to, to_ptr;
2598 to = GENERIC_TREE_OPERAND (*expr_p, 0);
2600 args = tree_cons (NULL, size, NULL);
2602 args = tree_cons (NULL, integer_zero_node, args);
2604 to_ptr = build_fold_addr_expr (to);
2605 args = tree_cons (NULL, to_ptr, args);
2606 t = implicit_built_in_decls[BUILT_IN_MEMSET];
2607 t = build_function_call_expr (t, args);
2609 if (want_value)
2611 t = build1 (NOP_EXPR, TREE_TYPE (to_ptr), t);
2612 t = build1 (INDIRECT_REF, TREE_TYPE (to), t);
2615 *expr_p = t;
2616 return GS_OK;
2619 /* A subroutine of gimplify_init_ctor_preeval. Called via walk_tree,
2620 determine, cautiously, if a CONSTRUCTOR overlaps the lhs of an
2621 assignment. Returns non-null if we detect a potential overlap. */
2623 struct gimplify_init_ctor_preeval_data
2625 /* The base decl of the lhs object. May be NULL, in which case we
2626 have to assume the lhs is indirect. */
2627 tree lhs_base_decl;
2629 /* The alias set of the lhs object. */
2630 int lhs_alias_set;
2633 static tree
2634 gimplify_init_ctor_preeval_1 (tree *tp, int *walk_subtrees, void *xdata)
2636 struct gimplify_init_ctor_preeval_data *data
2637 = (struct gimplify_init_ctor_preeval_data *) xdata;
2638 tree t = *tp;
2640 /* If we find the base object, obviously we have overlap. */
2641 if (data->lhs_base_decl == t)
2642 return t;
2644 /* If the constructor component is indirect, determine if we have a
2645 potential overlap with the lhs. The only bits of information we
2646 have to go on at this point are addressability and alias sets. */
2647 if (TREE_CODE (t) == INDIRECT_REF
2648 && (!data->lhs_base_decl || TREE_ADDRESSABLE (data->lhs_base_decl))
2649 && alias_sets_conflict_p (data->lhs_alias_set, get_alias_set (t)))
2650 return t;
2652 if (IS_TYPE_OR_DECL_P (t))
2653 *walk_subtrees = 0;
2654 return NULL;
2657 /* A subroutine of gimplify_init_constructor. Pre-evaluate *EXPR_P,
2658 force values that overlap with the lhs (as described by *DATA)
2659 into temporaries. */
2661 static void
2662 gimplify_init_ctor_preeval (tree *expr_p, tree *pre_p, tree *post_p,
2663 struct gimplify_init_ctor_preeval_data *data)
2665 enum gimplify_status one;
2667 /* If the value is invariant, then there's nothing to pre-evaluate.
2668 But ensure it doesn't have any side-effects since a SAVE_EXPR is
2669 invariant but has side effects and might contain a reference to
2670 the object we're initializing. */
2671 if (TREE_INVARIANT (*expr_p) && !TREE_SIDE_EFFECTS (*expr_p))
2672 return;
2674 /* If the type has non-trivial constructors, we can't pre-evaluate. */
2675 if (TREE_ADDRESSABLE (TREE_TYPE (*expr_p)))
2676 return;
2678 /* Recurse for nested constructors. */
2679 if (TREE_CODE (*expr_p) == CONSTRUCTOR)
2681 unsigned HOST_WIDE_INT ix;
2682 constructor_elt *ce;
2683 VEC(constructor_elt,gc) *v = CONSTRUCTOR_ELTS (*expr_p);
2685 for (ix = 0; VEC_iterate (constructor_elt, v, ix, ce); ix++)
2686 gimplify_init_ctor_preeval (&ce->value, pre_p, post_p, data);
2687 return;
2690 /* If this is a variable sized type, we must remember the size. */
2691 maybe_with_size_expr (expr_p);
2693 /* Gimplify the constructor element to something appropriate for the rhs
2694 of a MODIFY_EXPR. Given that we know the lhs is an aggregate, we know
2695 the gimplifier will consider this a store to memory. Doing this
2696 gimplification now means that we won't have to deal with complicated
2697 language-specific trees, nor trees like SAVE_EXPR that can induce
2698 exponential search behavior. */
2699 one = gimplify_expr (expr_p, pre_p, post_p, is_gimple_mem_rhs, fb_rvalue);
2700 if (one == GS_ERROR)
2702 *expr_p = NULL;
2703 return;
2706 /* If we gimplified to a bare decl, we can be sure that it doesn't overlap
2707 with the lhs, since "a = { .x=a }" doesn't make sense. This will
2708 always be true for all scalars, since is_gimple_mem_rhs insists on a
2709 temporary variable for them. */
2710 if (DECL_P (*expr_p))
2711 return;
2713 /* If this is of variable size, we have no choice but to assume it doesn't
2714 overlap since we can't make a temporary for it. */
2715 if (TREE_CODE (TYPE_SIZE (TREE_TYPE (*expr_p))) != INTEGER_CST)
2716 return;
2718 /* Otherwise, we must search for overlap ... */
2719 if (!walk_tree (expr_p, gimplify_init_ctor_preeval_1, data, NULL))
2720 return;
2722 /* ... and if found, force the value into a temporary. */
2723 *expr_p = get_formal_tmp_var (*expr_p, pre_p);
2726 /* A subroutine of gimplify_init_ctor_eval. Create a loop for
2727 a RANGE_EXPR in a CONSTRUCTOR for an array.
2729 var = lower;
2730 loop_entry:
2731 object[var] = value;
2732 if (var == upper)
2733 goto loop_exit;
2734 var = var + 1;
2735 goto loop_entry;
2736 loop_exit:
2738 We increment var _after_ the loop exit check because we might otherwise
2739 fail if upper == TYPE_MAX_VALUE (type for upper).
2741 Note that we never have to deal with SAVE_EXPRs here, because this has
2742 already been taken care of for us, in gimplify_init_ctor_preeval(). */
2744 static void gimplify_init_ctor_eval (tree, VEC(constructor_elt,gc) *,
2745 tree *, bool);
2747 static void
2748 gimplify_init_ctor_eval_range (tree object, tree lower, tree upper,
2749 tree value, tree array_elt_type,
2750 tree *pre_p, bool cleared)
2752 tree loop_entry_label, loop_exit_label;
2753 tree var, var_type, cref;
2755 loop_entry_label = create_artificial_label ();
2756 loop_exit_label = create_artificial_label ();
2758 /* Create and initialize the index variable. */
2759 var_type = TREE_TYPE (upper);
2760 var = create_tmp_var (var_type, NULL);
2761 append_to_statement_list (build2 (GIMPLE_MODIFY_STMT, var_type, var, lower),
2762 pre_p);
2764 /* Add the loop entry label. */
2765 append_to_statement_list (build1 (LABEL_EXPR,
2766 void_type_node,
2767 loop_entry_label),
2768 pre_p);
2770 /* Build the reference. */
2771 cref = build4 (ARRAY_REF, array_elt_type, unshare_expr (object),
2772 var, NULL_TREE, NULL_TREE);
2774 /* If we are a constructor, just call gimplify_init_ctor_eval to do
2775 the store. Otherwise just assign value to the reference. */
2777 if (TREE_CODE (value) == CONSTRUCTOR)
2778 /* NB we might have to call ourself recursively through
2779 gimplify_init_ctor_eval if the value is a constructor. */
2780 gimplify_init_ctor_eval (cref, CONSTRUCTOR_ELTS (value),
2781 pre_p, cleared);
2782 else
2783 append_to_statement_list (build2 (GIMPLE_MODIFY_STMT, TREE_TYPE (cref),
2784 cref, value),
2785 pre_p);
2787 /* We exit the loop when the index var is equal to the upper bound. */
2788 gimplify_and_add (build3 (COND_EXPR, void_type_node,
2789 build2 (EQ_EXPR, boolean_type_node,
2790 var, upper),
2791 build1 (GOTO_EXPR,
2792 void_type_node,
2793 loop_exit_label),
2794 NULL_TREE),
2795 pre_p);
2797 /* Otherwise, increment the index var... */
2798 append_to_statement_list (build2 (GIMPLE_MODIFY_STMT, var_type, var,
2799 build2 (PLUS_EXPR, var_type, var,
2800 fold_convert (var_type,
2801 integer_one_node))),
2802 pre_p);
2804 /* ...and jump back to the loop entry. */
2805 append_to_statement_list (build1 (GOTO_EXPR,
2806 void_type_node,
2807 loop_entry_label),
2808 pre_p);
2810 /* Add the loop exit label. */
2811 append_to_statement_list (build1 (LABEL_EXPR,
2812 void_type_node,
2813 loop_exit_label),
2814 pre_p);
2817 /* Return true if FDECL is accessing a field that is zero sized. */
2819 static bool
2820 zero_sized_field_decl (tree fdecl)
2822 if (TREE_CODE (fdecl) == FIELD_DECL && DECL_SIZE (fdecl)
2823 && integer_zerop (DECL_SIZE (fdecl)))
2824 return true;
2825 return false;
2828 /* Return true if TYPE is zero sized. */
2830 static bool
2831 zero_sized_type (tree type)
2833 if (AGGREGATE_TYPE_P (type) && TYPE_SIZE (type)
2834 && integer_zerop (TYPE_SIZE (type)))
2835 return true;
2836 return false;
2839 /* A subroutine of gimplify_init_constructor. Generate individual
2840 MODIFY_EXPRs for a CONSTRUCTOR. OBJECT is the LHS against which the
2841 assignments should happen. ELTS is the CONSTRUCTOR_ELTS of the
2842 CONSTRUCTOR. CLEARED is true if the entire LHS object has been
2843 zeroed first. */
2845 static void
2846 gimplify_init_ctor_eval (tree object, VEC(constructor_elt,gc) *elts,
2847 tree *pre_p, bool cleared)
2849 tree array_elt_type = NULL;
2850 unsigned HOST_WIDE_INT ix;
2851 tree purpose, value;
2853 if (TREE_CODE (TREE_TYPE (object)) == ARRAY_TYPE)
2854 array_elt_type = TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (object)));
2856 FOR_EACH_CONSTRUCTOR_ELT (elts, ix, purpose, value)
2858 tree cref, init;
2860 /* NULL values are created above for gimplification errors. */
2861 if (value == NULL)
2862 continue;
2864 if (cleared && initializer_zerop (value))
2865 continue;
2867 /* ??? Here's to hoping the front end fills in all of the indices,
2868 so we don't have to figure out what's missing ourselves. */
2869 gcc_assert (purpose);
2871 /* Skip zero-sized fields, unless value has side-effects. This can
2872 happen with calls to functions returning a zero-sized type, which
2873 we shouldn't discard. As a number of downstream passes don't
2874 expect sets of zero-sized fields, we rely on the gimplification of
2875 the MODIFY_EXPR we make below to drop the assignment statement. */
2876 if (! TREE_SIDE_EFFECTS (value) && zero_sized_field_decl (purpose))
2877 continue;
2879 /* If we have a RANGE_EXPR, we have to build a loop to assign the
2880 whole range. */
2881 if (TREE_CODE (purpose) == RANGE_EXPR)
2883 tree lower = TREE_OPERAND (purpose, 0);
2884 tree upper = TREE_OPERAND (purpose, 1);
2886 /* If the lower bound is equal to upper, just treat it as if
2887 upper was the index. */
2888 if (simple_cst_equal (lower, upper))
2889 purpose = upper;
2890 else
2892 gimplify_init_ctor_eval_range (object, lower, upper, value,
2893 array_elt_type, pre_p, cleared);
2894 continue;
2898 if (array_elt_type)
2900 cref = build4 (ARRAY_REF, array_elt_type, unshare_expr (object),
2901 purpose, NULL_TREE, NULL_TREE);
2903 else
2905 gcc_assert (TREE_CODE (purpose) == FIELD_DECL);
2906 cref = build3 (COMPONENT_REF, TREE_TYPE (purpose),
2907 unshare_expr (object), purpose, NULL_TREE);
2910 if (TREE_CODE (value) == CONSTRUCTOR
2911 && TREE_CODE (TREE_TYPE (value)) != VECTOR_TYPE)
2912 gimplify_init_ctor_eval (cref, CONSTRUCTOR_ELTS (value),
2913 pre_p, cleared);
2914 else
2916 init = build2 (INIT_EXPR, TREE_TYPE (cref), cref, value);
2917 gimplify_and_add (init, pre_p);
2922 /* A subroutine of gimplify_modify_expr. Break out elements of a
2923 CONSTRUCTOR used as an initializer into separate MODIFY_EXPRs.
2925 Note that we still need to clear any elements that don't have explicit
2926 initializers, so if not all elements are initialized we keep the
2927 original MODIFY_EXPR, we just remove all of the constructor elements. */
2929 static enum gimplify_status
2930 gimplify_init_constructor (tree *expr_p, tree *pre_p,
2931 tree *post_p, bool want_value)
2933 tree object;
2934 tree ctor = GENERIC_TREE_OPERAND (*expr_p, 1);
2935 tree type = TREE_TYPE (ctor);
2936 enum gimplify_status ret;
2937 VEC(constructor_elt,gc) *elts;
2939 if (TREE_CODE (ctor) != CONSTRUCTOR)
2940 return GS_UNHANDLED;
2942 ret = gimplify_expr (&GENERIC_TREE_OPERAND (*expr_p, 0), pre_p, post_p,
2943 is_gimple_lvalue, fb_lvalue);
2944 if (ret == GS_ERROR)
2945 return ret;
2946 object = GENERIC_TREE_OPERAND (*expr_p, 0);
2948 elts = CONSTRUCTOR_ELTS (ctor);
2950 ret = GS_ALL_DONE;
2951 switch (TREE_CODE (type))
2953 case RECORD_TYPE:
2954 case UNION_TYPE:
2955 case QUAL_UNION_TYPE:
2956 case ARRAY_TYPE:
2958 struct gimplify_init_ctor_preeval_data preeval_data;
2959 HOST_WIDE_INT num_type_elements, num_ctor_elements;
2960 HOST_WIDE_INT num_nonzero_elements;
2961 bool cleared, valid_const_initializer;
2963 /* Aggregate types must lower constructors to initialization of
2964 individual elements. The exception is that a CONSTRUCTOR node
2965 with no elements indicates zero-initialization of the whole. */
2966 if (VEC_empty (constructor_elt, elts))
2967 break;
2969 /* Fetch information about the constructor to direct later processing.
2970 We might want to make static versions of it in various cases, and
2971 can only do so if it known to be a valid constant initializer. */
2972 valid_const_initializer
2973 = categorize_ctor_elements (ctor, &num_nonzero_elements,
2974 &num_ctor_elements, &cleared);
2976 /* If a const aggregate variable is being initialized, then it
2977 should never be a lose to promote the variable to be static. */
2978 if (valid_const_initializer
2979 && num_nonzero_elements > 1
2980 && TREE_READONLY (object)
2981 && TREE_CODE (object) == VAR_DECL)
2983 DECL_INITIAL (object) = ctor;
2984 TREE_STATIC (object) = 1;
2985 if (!DECL_NAME (object))
2986 DECL_NAME (object) = create_tmp_var_name ("C");
2987 walk_tree (&DECL_INITIAL (object), force_labels_r, NULL, NULL);
2989 /* ??? C++ doesn't automatically append a .<number> to the
2990 assembler name, and even when it does, it looks a FE private
2991 data structures to figure out what that number should be,
2992 which are not set for this variable. I suppose this is
2993 important for local statics for inline functions, which aren't
2994 "local" in the object file sense. So in order to get a unique
2995 TU-local symbol, we must invoke the lhd version now. */
2996 lhd_set_decl_assembler_name (object);
2998 *expr_p = NULL_TREE;
2999 break;
3002 /* If there are "lots" of initialized elements, even discounting
3003 those that are not address constants (and thus *must* be
3004 computed at runtime), then partition the constructor into
3005 constant and non-constant parts. Block copy the constant
3006 parts in, then generate code for the non-constant parts. */
3007 /* TODO. There's code in cp/typeck.c to do this. */
3009 num_type_elements = count_type_elements (type, true);
3011 /* If count_type_elements could not determine number of type elements
3012 for a constant-sized object, assume clearing is needed.
3013 Don't do this for variable-sized objects, as store_constructor
3014 will ignore the clearing of variable-sized objects. */
3015 if (num_type_elements < 0 && int_size_in_bytes (type) >= 0)
3016 cleared = true;
3017 /* If there are "lots" of zeros, then block clear the object first. */
3018 else if (num_type_elements - num_nonzero_elements > CLEAR_RATIO
3019 && num_nonzero_elements < num_type_elements/4)
3020 cleared = true;
3021 /* ??? This bit ought not be needed. For any element not present
3022 in the initializer, we should simply set them to zero. Except
3023 we'd need to *find* the elements that are not present, and that
3024 requires trickery to avoid quadratic compile-time behavior in
3025 large cases or excessive memory use in small cases. */
3026 else if (num_ctor_elements < num_type_elements)
3027 cleared = true;
3029 /* If there are "lots" of initialized elements, and all of them
3030 are valid address constants, then the entire initializer can
3031 be dropped to memory, and then memcpy'd out. Don't do this
3032 for sparse arrays, though, as it's more efficient to follow
3033 the standard CONSTRUCTOR behavior of memset followed by
3034 individual element initialization. */
3035 if (valid_const_initializer && !cleared)
3037 HOST_WIDE_INT size = int_size_in_bytes (type);
3038 unsigned int align;
3040 /* ??? We can still get unbounded array types, at least
3041 from the C++ front end. This seems wrong, but attempt
3042 to work around it for now. */
3043 if (size < 0)
3045 size = int_size_in_bytes (TREE_TYPE (object));
3046 if (size >= 0)
3047 TREE_TYPE (ctor) = type = TREE_TYPE (object);
3050 /* Find the maximum alignment we can assume for the object. */
3051 /* ??? Make use of DECL_OFFSET_ALIGN. */
3052 if (DECL_P (object))
3053 align = DECL_ALIGN (object);
3054 else
3055 align = TYPE_ALIGN (type);
3057 if (size > 0 && !can_move_by_pieces (size, align))
3059 tree new = create_tmp_var_raw (type, "C");
3061 gimple_add_tmp_var (new);
3062 TREE_STATIC (new) = 1;
3063 TREE_READONLY (new) = 1;
3064 DECL_INITIAL (new) = ctor;
3065 if (align > DECL_ALIGN (new))
3067 DECL_ALIGN (new) = align;
3068 DECL_USER_ALIGN (new) = 1;
3070 walk_tree (&DECL_INITIAL (new), force_labels_r, NULL, NULL);
3072 GENERIC_TREE_OPERAND (*expr_p, 1) = new;
3074 /* This is no longer an assignment of a CONSTRUCTOR, but
3075 we still may have processing to do on the LHS. So
3076 pretend we didn't do anything here to let that happen. */
3077 return GS_UNHANDLED;
3081 /* If there are nonzero elements, pre-evaluate to capture elements
3082 overlapping with the lhs into temporaries. We must do this before
3083 clearing to fetch the values before they are zeroed-out. */
3084 if (num_nonzero_elements > 0)
3086 preeval_data.lhs_base_decl = get_base_address (object);
3087 if (!DECL_P (preeval_data.lhs_base_decl))
3088 preeval_data.lhs_base_decl = NULL;
3089 preeval_data.lhs_alias_set = get_alias_set (object);
3091 gimplify_init_ctor_preeval (&GENERIC_TREE_OPERAND (*expr_p, 1),
3092 pre_p, post_p, &preeval_data);
3095 if (cleared)
3097 /* Zap the CONSTRUCTOR element list, which simplifies this case.
3098 Note that we still have to gimplify, in order to handle the
3099 case of variable sized types. Avoid shared tree structures. */
3100 CONSTRUCTOR_ELTS (ctor) = NULL;
3101 object = unshare_expr (object);
3102 gimplify_stmt (expr_p);
3103 append_to_statement_list (*expr_p, pre_p);
3106 /* If we have not block cleared the object, or if there are nonzero
3107 elements in the constructor, add assignments to the individual
3108 scalar fields of the object. */
3109 if (!cleared || num_nonzero_elements > 0)
3110 gimplify_init_ctor_eval (object, elts, pre_p, cleared);
3112 *expr_p = NULL_TREE;
3114 break;
3116 case COMPLEX_TYPE:
3118 tree r, i;
3120 /* Extract the real and imaginary parts out of the ctor. */
3121 gcc_assert (VEC_length (constructor_elt, elts) == 2);
3122 r = VEC_index (constructor_elt, elts, 0)->value;
3123 i = VEC_index (constructor_elt, elts, 1)->value;
3124 if (r == NULL || i == NULL)
3126 tree zero = fold_convert (TREE_TYPE (type), integer_zero_node);
3127 if (r == NULL)
3128 r = zero;
3129 if (i == NULL)
3130 i = zero;
3133 /* Complex types have either COMPLEX_CST or COMPLEX_EXPR to
3134 represent creation of a complex value. */
3135 if (TREE_CONSTANT (r) && TREE_CONSTANT (i))
3137 ctor = build_complex (type, r, i);
3138 TREE_OPERAND (*expr_p, 1) = ctor;
3140 else
3142 ctor = build2 (COMPLEX_EXPR, type, r, i);
3143 TREE_OPERAND (*expr_p, 1) = ctor;
3144 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
3145 rhs_predicate_for (TREE_OPERAND (*expr_p, 0)),
3146 fb_rvalue);
3149 break;
3151 case VECTOR_TYPE:
3153 unsigned HOST_WIDE_INT ix;
3154 constructor_elt *ce;
3156 /* Go ahead and simplify constant constructors to VECTOR_CST. */
3157 if (TREE_CONSTANT (ctor))
3159 bool constant_p = true;
3160 tree value;
3162 /* Even when ctor is constant, it might contain non-*_CST
3163 elements (e.g. { 1.0/0.0 - 1.0/0.0, 0.0 }) and those don't
3164 belong into VECTOR_CST nodes. */
3165 FOR_EACH_CONSTRUCTOR_VALUE (elts, ix, value)
3166 if (!CONSTANT_CLASS_P (value))
3168 constant_p = false;
3169 break;
3172 if (constant_p)
3174 TREE_OPERAND (*expr_p, 1) = build_vector_from_ctor (type, elts);
3175 break;
3178 /* Don't reduce a TREE_CONSTANT vector ctor even if we can't
3179 make a VECTOR_CST. It won't do anything for us, and it'll
3180 prevent us from representing it as a single constant. */
3181 break;
3184 /* Vector types use CONSTRUCTOR all the way through gimple
3185 compilation as a general initializer. */
3186 for (ix = 0; VEC_iterate (constructor_elt, elts, ix, ce); ix++)
3188 enum gimplify_status tret;
3189 tret = gimplify_expr (&ce->value, pre_p, post_p,
3190 is_gimple_val, fb_rvalue);
3191 if (tret == GS_ERROR)
3192 ret = GS_ERROR;
3194 if (!is_gimple_reg (GENERIC_TREE_OPERAND (*expr_p, 0)))
3195 GENERIC_TREE_OPERAND (*expr_p, 1) = get_formal_tmp_var (ctor, pre_p);
3197 break;
3199 default:
3200 /* So how did we get a CONSTRUCTOR for a scalar type? */
3201 gcc_unreachable ();
3204 if (ret == GS_ERROR)
3205 return GS_ERROR;
3206 else if (want_value)
3208 append_to_statement_list (*expr_p, pre_p);
3209 *expr_p = object;
3210 return GS_OK;
3212 else
3213 return GS_ALL_DONE;
3216 /* Given a pointer value OP0, return a simplified version of an
3217 indirection through OP0, or NULL_TREE if no simplification is
3218 possible. This may only be applied to a rhs of an expression.
3219 Note that the resulting type may be different from the type pointed
3220 to in the sense that it is still compatible from the langhooks
3221 point of view. */
3223 static tree
3224 fold_indirect_ref_rhs (tree t)
3226 tree type = TREE_TYPE (TREE_TYPE (t));
3227 tree sub = t;
3228 tree subtype;
3230 STRIP_USELESS_TYPE_CONVERSION (sub);
3231 subtype = TREE_TYPE (sub);
3232 if (!POINTER_TYPE_P (subtype))
3233 return NULL_TREE;
3235 if (TREE_CODE (sub) == ADDR_EXPR)
3237 tree op = TREE_OPERAND (sub, 0);
3238 tree optype = TREE_TYPE (op);
3239 /* *&p => p */
3240 if (lang_hooks.types_compatible_p (type, optype))
3241 return op;
3242 /* *(foo *)&fooarray => fooarray[0] */
3243 else if (TREE_CODE (optype) == ARRAY_TYPE
3244 && lang_hooks.types_compatible_p (type, TREE_TYPE (optype)))
3246 tree type_domain = TYPE_DOMAIN (optype);
3247 tree min_val = size_zero_node;
3248 if (type_domain && TYPE_MIN_VALUE (type_domain))
3249 min_val = TYPE_MIN_VALUE (type_domain);
3250 return build4 (ARRAY_REF, type, op, min_val, NULL_TREE, NULL_TREE);
3254 /* *(foo *)fooarrptr => (*fooarrptr)[0] */
3255 if (TREE_CODE (TREE_TYPE (subtype)) == ARRAY_TYPE
3256 && lang_hooks.types_compatible_p (type, TREE_TYPE (TREE_TYPE (subtype))))
3258 tree type_domain;
3259 tree min_val = size_zero_node;
3260 tree osub = sub;
3261 sub = fold_indirect_ref_rhs (sub);
3262 if (! sub)
3263 sub = build1 (INDIRECT_REF, TREE_TYPE (subtype), osub);
3264 type_domain = TYPE_DOMAIN (TREE_TYPE (sub));
3265 if (type_domain && TYPE_MIN_VALUE (type_domain))
3266 min_val = TYPE_MIN_VALUE (type_domain);
3267 return build4 (ARRAY_REF, type, sub, min_val, NULL_TREE, NULL_TREE);
3270 return NULL_TREE;
3273 /* Subroutine of gimplify_modify_expr to do simplifications of MODIFY_EXPRs
3274 based on the code of the RHS. We loop for as long as something changes. */
3276 static enum gimplify_status
3277 gimplify_modify_expr_rhs (tree *expr_p, tree *from_p, tree *to_p, tree *pre_p,
3278 tree *post_p, bool want_value)
3280 enum gimplify_status ret = GS_OK;
3282 while (ret != GS_UNHANDLED)
3283 switch (TREE_CODE (*from_p))
3285 case INDIRECT_REF:
3287 /* If we have code like
3289 *(const A*)(A*)&x
3291 where the type of "x" is a (possibly cv-qualified variant
3292 of "A"), treat the entire expression as identical to "x".
3293 This kind of code arises in C++ when an object is bound
3294 to a const reference, and if "x" is a TARGET_EXPR we want
3295 to take advantage of the optimization below. */
3296 tree t = fold_indirect_ref_rhs (TREE_OPERAND (*from_p, 0));
3297 if (t)
3299 *from_p = t;
3300 ret = GS_OK;
3302 else
3303 ret = GS_UNHANDLED;
3304 break;
3307 case TARGET_EXPR:
3309 /* If we are initializing something from a TARGET_EXPR, strip the
3310 TARGET_EXPR and initialize it directly, if possible. This can't
3311 be done if the initializer is void, since that implies that the
3312 temporary is set in some non-trivial way.
3314 ??? What about code that pulls out the temp and uses it
3315 elsewhere? I think that such code never uses the TARGET_EXPR as
3316 an initializer. If I'm wrong, we'll die because the temp won't
3317 have any RTL. In that case, I guess we'll need to replace
3318 references somehow. */
3319 tree init = TARGET_EXPR_INITIAL (*from_p);
3321 if (!VOID_TYPE_P (TREE_TYPE (init)))
3323 *from_p = init;
3324 ret = GS_OK;
3326 else
3327 ret = GS_UNHANDLED;
3329 break;
3331 case COMPOUND_EXPR:
3332 /* Remove any COMPOUND_EXPR in the RHS so the following cases will be
3333 caught. */
3334 gimplify_compound_expr (from_p, pre_p, true);
3335 ret = GS_OK;
3336 break;
3338 case CONSTRUCTOR:
3339 /* If we're initializing from a CONSTRUCTOR, break this into
3340 individual MODIFY_EXPRs. */
3341 return gimplify_init_constructor (expr_p, pre_p, post_p, want_value);
3343 case COND_EXPR:
3344 /* If we're assigning to a non-register type, push the assignment
3345 down into the branches. This is mandatory for ADDRESSABLE types,
3346 since we cannot generate temporaries for such, but it saves a
3347 copy in other cases as well. */
3348 if (!is_gimple_reg_type (TREE_TYPE (*from_p)))
3350 /* This code should mirror the code in gimplify_cond_expr. */
3351 enum tree_code code = TREE_CODE (*expr_p);
3352 tree cond = *from_p;
3353 tree result = *to_p;
3355 ret = gimplify_expr (&result, pre_p, post_p,
3356 is_gimple_min_lval, fb_lvalue);
3357 if (ret != GS_ERROR)
3358 ret = GS_OK;
3360 if (TREE_TYPE (TREE_OPERAND (cond, 1)) != void_type_node)
3361 TREE_OPERAND (cond, 1)
3362 = build2 (code, void_type_node, result,
3363 TREE_OPERAND (cond, 1));
3364 if (TREE_TYPE (TREE_OPERAND (cond, 2)) != void_type_node)
3365 TREE_OPERAND (cond, 2)
3366 = build2 (code, void_type_node, unshare_expr (result),
3367 TREE_OPERAND (cond, 2));
3369 TREE_TYPE (cond) = void_type_node;
3370 recalculate_side_effects (cond);
3372 if (want_value)
3374 gimplify_and_add (cond, pre_p);
3375 *expr_p = unshare_expr (result);
3377 else
3378 *expr_p = cond;
3379 return ret;
3381 else
3382 ret = GS_UNHANDLED;
3383 break;
3385 case CALL_EXPR:
3386 /* For calls that return in memory, give *to_p as the CALL_EXPR's
3387 return slot so that we don't generate a temporary. */
3388 if (!CALL_EXPR_RETURN_SLOT_OPT (*from_p)
3389 && aggregate_value_p (*from_p, *from_p))
3391 bool use_target;
3393 if (!(rhs_predicate_for (*to_p))(*from_p))
3394 /* If we need a temporary, *to_p isn't accurate. */
3395 use_target = false;
3396 else if (TREE_CODE (*to_p) == RESULT_DECL
3397 && DECL_NAME (*to_p) == NULL_TREE
3398 && needs_to_live_in_memory (*to_p))
3399 /* It's OK to use the return slot directly unless it's an NRV. */
3400 use_target = true;
3401 else if (is_gimple_reg_type (TREE_TYPE (*to_p))
3402 || (DECL_P (*to_p) && DECL_REGISTER (*to_p)))
3403 /* Don't force regs into memory. */
3404 use_target = false;
3405 else if (TREE_CODE (*to_p) == VAR_DECL
3406 && DECL_GIMPLE_FORMAL_TEMP_P (*to_p))
3407 /* Don't use the original target if it's a formal temp; we
3408 don't want to take their addresses. */
3409 use_target = false;
3410 else if (TREE_CODE (*expr_p) == INIT_EXPR)
3411 /* It's OK to use the target directly if it's being
3412 initialized. */
3413 use_target = true;
3414 else if (!is_gimple_non_addressable (*to_p))
3415 /* Don't use the original target if it's already addressable;
3416 if its address escapes, and the called function uses the
3417 NRV optimization, a conforming program could see *to_p
3418 change before the called function returns; see c++/19317.
3419 When optimizing, the return_slot pass marks more functions
3420 as safe after we have escape info. */
3421 use_target = false;
3422 else
3423 use_target = true;
3425 if (use_target)
3427 CALL_EXPR_RETURN_SLOT_OPT (*from_p) = 1;
3428 lang_hooks.mark_addressable (*to_p);
3432 ret = GS_UNHANDLED;
3433 break;
3435 /* If we're initializing from a container, push the initialization
3436 inside it. */
3437 case CLEANUP_POINT_EXPR:
3438 case BIND_EXPR:
3439 case STATEMENT_LIST:
3441 tree wrap = *from_p;
3442 tree t;
3444 ret = gimplify_expr (to_p, pre_p, post_p,
3445 is_gimple_min_lval, fb_lvalue);
3446 if (ret != GS_ERROR)
3447 ret = GS_OK;
3449 t = voidify_wrapper_expr (wrap, *expr_p);
3450 gcc_assert (t == *expr_p);
3452 if (want_value)
3454 gimplify_and_add (wrap, pre_p);
3455 *expr_p = unshare_expr (*to_p);
3457 else
3458 *expr_p = wrap;
3459 return GS_OK;
3462 default:
3463 ret = GS_UNHANDLED;
3464 break;
3467 return ret;
3470 /* Destructively convert the TREE pointer in TP into a gimple tuple if
3471 appropriate. */
3473 static void
3474 tree_to_gimple_tuple (tree *tp)
3477 switch (TREE_CODE (*tp))
3479 case GIMPLE_MODIFY_STMT:
3480 return;
3481 case MODIFY_EXPR:
3483 struct gimple_stmt *gs;
3484 tree lhs = TREE_OPERAND (*tp, 0);
3485 bool def_stmt_self_p = false;
3487 if (TREE_CODE (lhs) == SSA_NAME)
3489 if (SSA_NAME_DEF_STMT (lhs) == *tp)
3490 def_stmt_self_p = true;
3493 gs = &make_node (GIMPLE_MODIFY_STMT)->gstmt;
3494 gs->base = (*tp)->base;
3495 /* The set to base above overwrites the CODE. */
3496 TREE_SET_CODE ((tree) gs, GIMPLE_MODIFY_STMT);
3498 gs->locus = EXPR_LOCUS (*tp);
3499 gs->operands[0] = TREE_OPERAND (*tp, 0);
3500 gs->operands[1] = TREE_OPERAND (*tp, 1);
3501 gs->block = TREE_BLOCK (*tp);
3502 *tp = (tree)gs;
3504 /* If we re-gimplify a set to an SSA_NAME, we must change the
3505 SSA name's DEF_STMT link. */
3506 if (def_stmt_self_p)
3507 SSA_NAME_DEF_STMT (GIMPLE_STMT_OPERAND (*tp, 0)) = *tp;
3509 return;
3511 default:
3512 break;
3516 /* Promote partial stores to COMPLEX variables to total stores. *EXPR_P is
3517 a MODIFY_EXPR with a lhs of a REAL/IMAGPART_EXPR of a variable with
3518 DECL_GIMPLE_REG_P set. */
3520 static enum gimplify_status
3521 gimplify_modify_expr_complex_part (tree *expr_p, tree *pre_p, bool want_value)
3523 enum tree_code code, ocode;
3524 tree lhs, rhs, new_rhs, other, realpart, imagpart;
3526 lhs = GENERIC_TREE_OPERAND (*expr_p, 0);
3527 rhs = GENERIC_TREE_OPERAND (*expr_p, 1);
3528 code = TREE_CODE (lhs);
3529 lhs = TREE_OPERAND (lhs, 0);
3531 ocode = code == REALPART_EXPR ? IMAGPART_EXPR : REALPART_EXPR;
3532 other = build1 (ocode, TREE_TYPE (rhs), lhs);
3533 other = get_formal_tmp_var (other, pre_p);
3535 realpart = code == REALPART_EXPR ? rhs : other;
3536 imagpart = code == REALPART_EXPR ? other : rhs;
3538 if (TREE_CONSTANT (realpart) && TREE_CONSTANT (imagpart))
3539 new_rhs = build_complex (TREE_TYPE (lhs), realpart, imagpart);
3540 else
3541 new_rhs = build2 (COMPLEX_EXPR, TREE_TYPE (lhs), realpart, imagpart);
3543 GENERIC_TREE_OPERAND (*expr_p, 0) = lhs;
3544 GENERIC_TREE_OPERAND (*expr_p, 1) = new_rhs;
3546 if (want_value)
3548 tree_to_gimple_tuple (expr_p);
3550 append_to_statement_list (*expr_p, pre_p);
3551 *expr_p = rhs;
3554 return GS_ALL_DONE;
3557 /* Gimplify the MODIFY_EXPR node pointed to by EXPR_P.
3559 modify_expr
3560 : varname '=' rhs
3561 | '*' ID '=' rhs
3563 PRE_P points to the list where side effects that must happen before
3564 *EXPR_P should be stored.
3566 POST_P points to the list where side effects that must happen after
3567 *EXPR_P should be stored.
3569 WANT_VALUE is nonzero iff we want to use the value of this expression
3570 in another expression. */
3572 static enum gimplify_status
3573 gimplify_modify_expr (tree *expr_p, tree *pre_p, tree *post_p, bool want_value)
3575 tree *from_p = &GENERIC_TREE_OPERAND (*expr_p, 1);
3576 tree *to_p = &GENERIC_TREE_OPERAND (*expr_p, 0);
3577 enum gimplify_status ret = GS_UNHANDLED;
3579 gcc_assert (TREE_CODE (*expr_p) == MODIFY_EXPR
3580 || TREE_CODE (*expr_p) == GIMPLE_MODIFY_STMT
3581 || TREE_CODE (*expr_p) == INIT_EXPR);
3583 /* For zero sized types only gimplify the left hand side and right hand side
3584 as statements and throw away the assignment. */
3585 if (zero_sized_type (TREE_TYPE (*from_p)))
3587 gimplify_stmt (from_p);
3588 gimplify_stmt (to_p);
3589 append_to_statement_list (*from_p, pre_p);
3590 append_to_statement_list (*to_p, pre_p);
3591 *expr_p = NULL_TREE;
3592 return GS_ALL_DONE;
3595 /* See if any simplifications can be done based on what the RHS is. */
3596 ret = gimplify_modify_expr_rhs (expr_p, from_p, to_p, pre_p, post_p,
3597 want_value);
3598 if (ret != GS_UNHANDLED)
3599 return ret;
3601 /* If the value being copied is of variable width, compute the length
3602 of the copy into a WITH_SIZE_EXPR. Note that we need to do this
3603 before gimplifying any of the operands so that we can resolve any
3604 PLACEHOLDER_EXPRs in the size. Also note that the RTL expander uses
3605 the size of the expression to be copied, not of the destination, so
3606 that is what we must here. */
3607 maybe_with_size_expr (from_p);
3609 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
3610 if (ret == GS_ERROR)
3611 return ret;
3613 ret = gimplify_expr (from_p, pre_p, post_p,
3614 rhs_predicate_for (*to_p), fb_rvalue);
3615 if (ret == GS_ERROR)
3616 return ret;
3618 /* Now see if the above changed *from_p to something we handle specially. */
3619 ret = gimplify_modify_expr_rhs (expr_p, from_p, to_p, pre_p, post_p,
3620 want_value);
3621 if (ret != GS_UNHANDLED)
3622 return ret;
3624 /* If we've got a variable sized assignment between two lvalues (i.e. does
3625 not involve a call), then we can make things a bit more straightforward
3626 by converting the assignment to memcpy or memset. */
3627 if (TREE_CODE (*from_p) == WITH_SIZE_EXPR)
3629 tree from = TREE_OPERAND (*from_p, 0);
3630 tree size = TREE_OPERAND (*from_p, 1);
3632 if (TREE_CODE (from) == CONSTRUCTOR)
3633 return gimplify_modify_expr_to_memset (expr_p, size, want_value);
3634 if (is_gimple_addressable (from))
3636 *from_p = from;
3637 return gimplify_modify_expr_to_memcpy (expr_p, size, want_value);
3641 /* Transform partial stores to non-addressable complex variables into
3642 total stores. This allows us to use real instead of virtual operands
3643 for these variables, which improves optimization. */
3644 if ((TREE_CODE (*to_p) == REALPART_EXPR
3645 || TREE_CODE (*to_p) == IMAGPART_EXPR)
3646 && is_gimple_reg (TREE_OPERAND (*to_p, 0)))
3647 return gimplify_modify_expr_complex_part (expr_p, pre_p, want_value);
3649 if (gimplify_ctxp->into_ssa && is_gimple_reg (*to_p))
3651 /* If we've somehow already got an SSA_NAME on the LHS, then
3652 we're probably modified it twice. Not good. */
3653 gcc_assert (TREE_CODE (*to_p) != SSA_NAME);
3654 *to_p = make_ssa_name (*to_p, *expr_p);
3657 if (want_value)
3659 tree_to_gimple_tuple (expr_p);
3661 append_to_statement_list (*expr_p, pre_p);
3662 *expr_p = *to_p;
3663 return GS_OK;
3666 return GS_ALL_DONE;
3669 /* Gimplify a comparison between two variable-sized objects. Do this
3670 with a call to BUILT_IN_MEMCMP. */
3672 static enum gimplify_status
3673 gimplify_variable_sized_compare (tree *expr_p)
3675 tree op0 = TREE_OPERAND (*expr_p, 0);
3676 tree op1 = TREE_OPERAND (*expr_p, 1);
3677 tree args, t, dest;
3679 t = TYPE_SIZE_UNIT (TREE_TYPE (op0));
3680 t = unshare_expr (t);
3681 t = SUBSTITUTE_PLACEHOLDER_IN_EXPR (t, op0);
3682 args = tree_cons (NULL, t, NULL);
3683 t = build_fold_addr_expr (op1);
3684 args = tree_cons (NULL, t, args);
3685 dest = build_fold_addr_expr (op0);
3686 args = tree_cons (NULL, dest, args);
3687 t = implicit_built_in_decls[BUILT_IN_MEMCMP];
3688 t = build_function_call_expr (t, args);
3689 *expr_p
3690 = build2 (TREE_CODE (*expr_p), TREE_TYPE (*expr_p), t, integer_zero_node);
3692 return GS_OK;
3695 /* Gimplify a comparison between two aggregate objects of integral scalar
3696 mode as a comparison between the bitwise equivalent scalar values. */
3698 static enum gimplify_status
3699 gimplify_scalar_mode_aggregate_compare (tree *expr_p)
3701 tree op0 = TREE_OPERAND (*expr_p, 0);
3702 tree op1 = TREE_OPERAND (*expr_p, 1);
3704 tree type = TREE_TYPE (op0);
3705 tree scalar_type = lang_hooks.types.type_for_mode (TYPE_MODE (type), 1);
3707 op0 = fold_build1 (VIEW_CONVERT_EXPR, scalar_type, op0);
3708 op1 = fold_build1 (VIEW_CONVERT_EXPR, scalar_type, op1);
3710 *expr_p
3711 = fold_build2 (TREE_CODE (*expr_p), TREE_TYPE (*expr_p), op0, op1);
3713 return GS_OK;
3716 /* Gimplify TRUTH_ANDIF_EXPR and TRUTH_ORIF_EXPR expressions. EXPR_P
3717 points to the expression to gimplify.
3719 Expressions of the form 'a && b' are gimplified to:
3721 a && b ? true : false
3723 gimplify_cond_expr will do the rest.
3725 PRE_P points to the list where side effects that must happen before
3726 *EXPR_P should be stored. */
3728 static enum gimplify_status
3729 gimplify_boolean_expr (tree *expr_p)
3731 /* Preserve the original type of the expression. */
3732 tree type = TREE_TYPE (*expr_p);
3734 *expr_p = build3 (COND_EXPR, type, *expr_p,
3735 fold_convert (type, boolean_true_node),
3736 fold_convert (type, boolean_false_node));
3738 return GS_OK;
3741 /* Gimplifies an expression sequence. This function gimplifies each
3742 expression and re-writes the original expression with the last
3743 expression of the sequence in GIMPLE form.
3745 PRE_P points to the list where the side effects for all the
3746 expressions in the sequence will be emitted.
3748 WANT_VALUE is true when the result of the last COMPOUND_EXPR is used. */
3749 /* ??? Should rearrange to share the pre-queue with all the indirect
3750 invocations of gimplify_expr. Would probably save on creations
3751 of statement_list nodes. */
3753 static enum gimplify_status
3754 gimplify_compound_expr (tree *expr_p, tree *pre_p, bool want_value)
3756 tree t = *expr_p;
3760 tree *sub_p = &TREE_OPERAND (t, 0);
3762 if (TREE_CODE (*sub_p) == COMPOUND_EXPR)
3763 gimplify_compound_expr (sub_p, pre_p, false);
3764 else
3765 gimplify_stmt (sub_p);
3766 append_to_statement_list (*sub_p, pre_p);
3768 t = TREE_OPERAND (t, 1);
3770 while (TREE_CODE (t) == COMPOUND_EXPR);
3772 *expr_p = t;
3773 if (want_value)
3774 return GS_OK;
3775 else
3777 gimplify_stmt (expr_p);
3778 return GS_ALL_DONE;
3782 /* Gimplifies a statement list. These may be created either by an
3783 enlightened front-end, or by shortcut_cond_expr. */
3785 static enum gimplify_status
3786 gimplify_statement_list (tree *expr_p, tree *pre_p)
3788 tree temp = voidify_wrapper_expr (*expr_p, NULL);
3790 tree_stmt_iterator i = tsi_start (*expr_p);
3792 while (!tsi_end_p (i))
3794 tree t;
3796 gimplify_stmt (tsi_stmt_ptr (i));
3798 t = tsi_stmt (i);
3799 if (t == NULL)
3800 tsi_delink (&i);
3801 else if (TREE_CODE (t) == STATEMENT_LIST)
3803 tsi_link_before (&i, t, TSI_SAME_STMT);
3804 tsi_delink (&i);
3806 else
3807 tsi_next (&i);
3810 if (temp)
3812 append_to_statement_list (*expr_p, pre_p);
3813 *expr_p = temp;
3814 return GS_OK;
3817 return GS_ALL_DONE;
3820 /* Gimplify a SAVE_EXPR node. EXPR_P points to the expression to
3821 gimplify. After gimplification, EXPR_P will point to a new temporary
3822 that holds the original value of the SAVE_EXPR node.
3824 PRE_P points to the list where side effects that must happen before
3825 *EXPR_P should be stored. */
3827 static enum gimplify_status
3828 gimplify_save_expr (tree *expr_p, tree *pre_p, tree *post_p)
3830 enum gimplify_status ret = GS_ALL_DONE;
3831 tree val;
3833 gcc_assert (TREE_CODE (*expr_p) == SAVE_EXPR);
3834 val = TREE_OPERAND (*expr_p, 0);
3836 /* If the SAVE_EXPR has not been resolved, then evaluate it once. */
3837 if (!SAVE_EXPR_RESOLVED_P (*expr_p))
3839 /* The operand may be a void-valued expression such as SAVE_EXPRs
3840 generated by the Java frontend for class initialization. It is
3841 being executed only for its side-effects. */
3842 if (TREE_TYPE (val) == void_type_node)
3844 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
3845 is_gimple_stmt, fb_none);
3846 append_to_statement_list (TREE_OPERAND (*expr_p, 0), pre_p);
3847 val = NULL;
3849 else
3850 val = get_initialized_tmp_var (val, pre_p, post_p);
3852 TREE_OPERAND (*expr_p, 0) = val;
3853 SAVE_EXPR_RESOLVED_P (*expr_p) = 1;
3856 *expr_p = val;
3858 return ret;
3861 /* Re-write the ADDR_EXPR node pointed to by EXPR_P
3863 unary_expr
3864 : ...
3865 | '&' varname
3868 PRE_P points to the list where side effects that must happen before
3869 *EXPR_P should be stored.
3871 POST_P points to the list where side effects that must happen after
3872 *EXPR_P should be stored. */
3874 static enum gimplify_status
3875 gimplify_addr_expr (tree *expr_p, tree *pre_p, tree *post_p)
3877 tree expr = *expr_p;
3878 tree op0 = TREE_OPERAND (expr, 0);
3879 enum gimplify_status ret;
3881 switch (TREE_CODE (op0))
3883 case INDIRECT_REF:
3884 case MISALIGNED_INDIRECT_REF:
3885 do_indirect_ref:
3886 /* Check if we are dealing with an expression of the form '&*ptr'.
3887 While the front end folds away '&*ptr' into 'ptr', these
3888 expressions may be generated internally by the compiler (e.g.,
3889 builtins like __builtin_va_end). */
3890 /* Caution: the silent array decomposition semantics we allow for
3891 ADDR_EXPR means we can't always discard the pair. */
3892 /* Gimplification of the ADDR_EXPR operand may drop
3893 cv-qualification conversions, so make sure we add them if
3894 needed. */
3896 tree op00 = TREE_OPERAND (op0, 0);
3897 tree t_expr = TREE_TYPE (expr);
3898 tree t_op00 = TREE_TYPE (op00);
3900 if (!lang_hooks.types_compatible_p (t_expr, t_op00))
3902 #ifdef ENABLE_CHECKING
3903 tree t_op0 = TREE_TYPE (op0);
3904 gcc_assert (POINTER_TYPE_P (t_expr)
3905 && cpt_same_type (TREE_CODE (t_op0) == ARRAY_TYPE
3906 ? TREE_TYPE (t_op0) : t_op0,
3907 TREE_TYPE (t_expr))
3908 && POINTER_TYPE_P (t_op00)
3909 && cpt_same_type (t_op0, TREE_TYPE (t_op00)));
3910 #endif
3911 op00 = fold_convert (TREE_TYPE (expr), op00);
3913 *expr_p = op00;
3914 ret = GS_OK;
3916 break;
3918 case VIEW_CONVERT_EXPR:
3919 /* Take the address of our operand and then convert it to the type of
3920 this ADDR_EXPR.
3922 ??? The interactions of VIEW_CONVERT_EXPR and aliasing is not at
3923 all clear. The impact of this transformation is even less clear. */
3925 /* If the operand is a useless conversion, look through it. Doing so
3926 guarantees that the ADDR_EXPR and its operand will remain of the
3927 same type. */
3928 if (tree_ssa_useless_type_conversion (TREE_OPERAND (op0, 0)))
3929 op0 = TREE_OPERAND (op0, 0);
3931 *expr_p = fold_convert (TREE_TYPE (expr),
3932 build_fold_addr_expr (TREE_OPERAND (op0, 0)));
3933 ret = GS_OK;
3934 break;
3936 default:
3937 /* We use fb_either here because the C frontend sometimes takes
3938 the address of a call that returns a struct; see
3939 gcc.dg/c99-array-lval-1.c. The gimplifier will correctly make
3940 the implied temporary explicit. */
3941 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, post_p,
3942 is_gimple_addressable, fb_either);
3943 if (ret != GS_ERROR)
3945 op0 = TREE_OPERAND (expr, 0);
3947 /* For various reasons, the gimplification of the expression
3948 may have made a new INDIRECT_REF. */
3949 if (TREE_CODE (op0) == INDIRECT_REF)
3950 goto do_indirect_ref;
3952 /* Make sure TREE_INVARIANT, TREE_CONSTANT, and TREE_SIDE_EFFECTS
3953 is set properly. */
3954 recompute_tree_invariant_for_addr_expr (expr);
3956 /* Mark the RHS addressable. */
3957 lang_hooks.mark_addressable (TREE_OPERAND (expr, 0));
3959 break;
3962 return ret;
3965 /* Gimplify the operands of an ASM_EXPR. Input operands should be a gimple
3966 value; output operands should be a gimple lvalue. */
3968 static enum gimplify_status
3969 gimplify_asm_expr (tree *expr_p, tree *pre_p, tree *post_p)
3971 tree expr = *expr_p;
3972 int noutputs = list_length (ASM_OUTPUTS (expr));
3973 const char **oconstraints
3974 = (const char **) alloca ((noutputs) * sizeof (const char *));
3975 int i;
3976 tree link;
3977 const char *constraint;
3978 bool allows_mem, allows_reg, is_inout;
3979 enum gimplify_status ret, tret;
3981 ret = GS_ALL_DONE;
3982 for (i = 0, link = ASM_OUTPUTS (expr); link; ++i, link = TREE_CHAIN (link))
3984 size_t constraint_len;
3985 oconstraints[i] = constraint
3986 = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link)));
3987 constraint_len = strlen (constraint);
3988 if (constraint_len == 0)
3989 continue;
3991 parse_output_constraint (&constraint, i, 0, 0,
3992 &allows_mem, &allows_reg, &is_inout);
3994 if (!allows_reg && allows_mem)
3995 lang_hooks.mark_addressable (TREE_VALUE (link));
3997 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
3998 is_inout ? is_gimple_min_lval : is_gimple_lvalue,
3999 fb_lvalue | fb_mayfail);
4000 if (tret == GS_ERROR)
4002 error ("invalid lvalue in asm output %d", i);
4003 ret = tret;
4006 if (is_inout)
4008 /* An input/output operand. To give the optimizers more
4009 flexibility, split it into separate input and output
4010 operands. */
4011 tree input;
4012 char buf[10];
4014 /* Turn the in/out constraint into an output constraint. */
4015 char *p = xstrdup (constraint);
4016 p[0] = '=';
4017 TREE_VALUE (TREE_PURPOSE (link)) = build_string (constraint_len, p);
4019 /* And add a matching input constraint. */
4020 if (allows_reg)
4022 sprintf (buf, "%d", i);
4024 /* If there are multiple alternatives in the constraint,
4025 handle each of them individually. Those that allow register
4026 will be replaced with operand number, the others will stay
4027 unchanged. */
4028 if (strchr (p, ',') != NULL)
4030 size_t len = 0, buflen = strlen (buf);
4031 char *beg, *end, *str, *dst;
4033 for (beg = p + 1;;)
4035 end = strchr (beg, ',');
4036 if (end == NULL)
4037 end = strchr (beg, '\0');
4038 if ((size_t) (end - beg) < buflen)
4039 len += buflen + 1;
4040 else
4041 len += end - beg + 1;
4042 if (*end)
4043 beg = end + 1;
4044 else
4045 break;
4048 str = (char *) alloca (len);
4049 for (beg = p + 1, dst = str;;)
4051 const char *tem;
4052 bool mem_p, reg_p, inout_p;
4054 end = strchr (beg, ',');
4055 if (end)
4056 *end = '\0';
4057 beg[-1] = '=';
4058 tem = beg - 1;
4059 parse_output_constraint (&tem, i, 0, 0,
4060 &mem_p, &reg_p, &inout_p);
4061 if (dst != str)
4062 *dst++ = ',';
4063 if (reg_p)
4065 memcpy (dst, buf, buflen);
4066 dst += buflen;
4068 else
4070 if (end)
4071 len = end - beg;
4072 else
4073 len = strlen (beg);
4074 memcpy (dst, beg, len);
4075 dst += len;
4077 if (end)
4078 beg = end + 1;
4079 else
4080 break;
4082 *dst = '\0';
4083 input = build_string (dst - str, str);
4085 else
4086 input = build_string (strlen (buf), buf);
4088 else
4089 input = build_string (constraint_len - 1, constraint + 1);
4091 free (p);
4093 input = build_tree_list (build_tree_list (NULL_TREE, input),
4094 unshare_expr (TREE_VALUE (link)));
4095 ASM_INPUTS (expr) = chainon (ASM_INPUTS (expr), input);
4099 for (link = ASM_INPUTS (expr); link; ++i, link = TREE_CHAIN (link))
4101 constraint
4102 = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link)));
4103 parse_input_constraint (&constraint, 0, 0, noutputs, 0,
4104 oconstraints, &allows_mem, &allows_reg);
4106 /* If the operand is a memory input, it should be an lvalue. */
4107 if (!allows_reg && allows_mem)
4109 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
4110 is_gimple_lvalue, fb_lvalue | fb_mayfail);
4111 lang_hooks.mark_addressable (TREE_VALUE (link));
4112 if (tret == GS_ERROR)
4114 error ("memory input %d is not directly addressable", i);
4115 ret = tret;
4118 else
4120 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
4121 is_gimple_asm_val, fb_rvalue);
4122 if (tret == GS_ERROR)
4123 ret = tret;
4127 return ret;
4130 /* Gimplify a CLEANUP_POINT_EXPR. Currently this works by adding
4131 WITH_CLEANUP_EXPRs to the prequeue as we encounter cleanups while
4132 gimplifying the body, and converting them to TRY_FINALLY_EXPRs when we
4133 return to this function.
4135 FIXME should we complexify the prequeue handling instead? Or use flags
4136 for all the cleanups and let the optimizer tighten them up? The current
4137 code seems pretty fragile; it will break on a cleanup within any
4138 non-conditional nesting. But any such nesting would be broken, anyway;
4139 we can't write a TRY_FINALLY_EXPR that starts inside a nesting construct
4140 and continues out of it. We can do that at the RTL level, though, so
4141 having an optimizer to tighten up try/finally regions would be a Good
4142 Thing. */
4144 static enum gimplify_status
4145 gimplify_cleanup_point_expr (tree *expr_p, tree *pre_p)
4147 tree_stmt_iterator iter;
4148 tree body;
4150 tree temp = voidify_wrapper_expr (*expr_p, NULL);
4152 /* We only care about the number of conditions between the innermost
4153 CLEANUP_POINT_EXPR and the cleanup. So save and reset the count and
4154 any cleanups collected outside the CLEANUP_POINT_EXPR. */
4155 int old_conds = gimplify_ctxp->conditions;
4156 tree old_cleanups = gimplify_ctxp->conditional_cleanups;
4157 gimplify_ctxp->conditions = 0;
4158 gimplify_ctxp->conditional_cleanups = NULL_TREE;
4160 body = TREE_OPERAND (*expr_p, 0);
4161 gimplify_to_stmt_list (&body);
4163 gimplify_ctxp->conditions = old_conds;
4164 gimplify_ctxp->conditional_cleanups = old_cleanups;
4166 for (iter = tsi_start (body); !tsi_end_p (iter); )
4168 tree *wce_p = tsi_stmt_ptr (iter);
4169 tree wce = *wce_p;
4171 if (TREE_CODE (wce) == WITH_CLEANUP_EXPR)
4173 if (tsi_one_before_end_p (iter))
4175 tsi_link_before (&iter, TREE_OPERAND (wce, 0), TSI_SAME_STMT);
4176 tsi_delink (&iter);
4177 break;
4179 else
4181 tree sl, tfe;
4182 enum tree_code code;
4184 if (CLEANUP_EH_ONLY (wce))
4185 code = TRY_CATCH_EXPR;
4186 else
4187 code = TRY_FINALLY_EXPR;
4189 sl = tsi_split_statement_list_after (&iter);
4190 tfe = build2 (code, void_type_node, sl, NULL_TREE);
4191 append_to_statement_list (TREE_OPERAND (wce, 0),
4192 &TREE_OPERAND (tfe, 1));
4193 *wce_p = tfe;
4194 iter = tsi_start (sl);
4197 else
4198 tsi_next (&iter);
4201 if (temp)
4203 *expr_p = temp;
4204 append_to_statement_list (body, pre_p);
4205 return GS_OK;
4207 else
4209 *expr_p = body;
4210 return GS_ALL_DONE;
4214 /* Insert a cleanup marker for gimplify_cleanup_point_expr. CLEANUP
4215 is the cleanup action required. */
4217 static void
4218 gimple_push_cleanup (tree var, tree cleanup, bool eh_only, tree *pre_p)
4220 tree wce;
4222 /* Errors can result in improperly nested cleanups. Which results in
4223 confusion when trying to resolve the WITH_CLEANUP_EXPR. */
4224 if (errorcount || sorrycount)
4225 return;
4227 if (gimple_conditional_context ())
4229 /* If we're in a conditional context, this is more complex. We only
4230 want to run the cleanup if we actually ran the initialization that
4231 necessitates it, but we want to run it after the end of the
4232 conditional context. So we wrap the try/finally around the
4233 condition and use a flag to determine whether or not to actually
4234 run the destructor. Thus
4236 test ? f(A()) : 0
4238 becomes (approximately)
4240 flag = 0;
4241 try {
4242 if (test) { A::A(temp); flag = 1; val = f(temp); }
4243 else { val = 0; }
4244 } finally {
4245 if (flag) A::~A(temp);
4250 tree flag = create_tmp_var (boolean_type_node, "cleanup");
4251 tree ffalse = build2 (GIMPLE_MODIFY_STMT, void_type_node, flag,
4252 boolean_false_node);
4253 tree ftrue = build2 (GIMPLE_MODIFY_STMT, void_type_node, flag,
4254 boolean_true_node);
4255 cleanup = build3 (COND_EXPR, void_type_node, flag, cleanup, NULL);
4256 wce = build1 (WITH_CLEANUP_EXPR, void_type_node, cleanup);
4257 append_to_statement_list (ffalse, &gimplify_ctxp->conditional_cleanups);
4258 append_to_statement_list (wce, &gimplify_ctxp->conditional_cleanups);
4259 append_to_statement_list (ftrue, pre_p);
4261 /* Because of this manipulation, and the EH edges that jump
4262 threading cannot redirect, the temporary (VAR) will appear
4263 to be used uninitialized. Don't warn. */
4264 TREE_NO_WARNING (var) = 1;
4266 else
4268 wce = build1 (WITH_CLEANUP_EXPR, void_type_node, cleanup);
4269 CLEANUP_EH_ONLY (wce) = eh_only;
4270 append_to_statement_list (wce, pre_p);
4273 gimplify_stmt (&TREE_OPERAND (wce, 0));
4276 /* Gimplify a TARGET_EXPR which doesn't appear on the rhs of an INIT_EXPR. */
4278 static enum gimplify_status
4279 gimplify_target_expr (tree *expr_p, tree *pre_p, tree *post_p)
4281 tree targ = *expr_p;
4282 tree temp = TARGET_EXPR_SLOT (targ);
4283 tree init = TARGET_EXPR_INITIAL (targ);
4284 enum gimplify_status ret;
4286 if (init)
4288 /* TARGET_EXPR temps aren't part of the enclosing block, so add it
4289 to the temps list. */
4290 gimple_add_tmp_var (temp);
4292 /* If TARGET_EXPR_INITIAL is void, then the mere evaluation of the
4293 expression is supposed to initialize the slot. */
4294 if (VOID_TYPE_P (TREE_TYPE (init)))
4295 ret = gimplify_expr (&init, pre_p, post_p, is_gimple_stmt, fb_none);
4296 else
4298 init = build2 (INIT_EXPR, void_type_node, temp, init);
4299 ret = gimplify_expr (&init, pre_p, post_p, is_gimple_stmt,
4300 fb_none);
4302 if (ret == GS_ERROR)
4304 /* PR c++/28266 Make sure this is expanded only once. */
4305 TARGET_EXPR_INITIAL (targ) = NULL_TREE;
4306 return GS_ERROR;
4308 append_to_statement_list (init, pre_p);
4310 /* If needed, push the cleanup for the temp. */
4311 if (TARGET_EXPR_CLEANUP (targ))
4313 gimplify_stmt (&TARGET_EXPR_CLEANUP (targ));
4314 gimple_push_cleanup (temp, TARGET_EXPR_CLEANUP (targ),
4315 CLEANUP_EH_ONLY (targ), pre_p);
4318 /* Only expand this once. */
4319 TREE_OPERAND (targ, 3) = init;
4320 TARGET_EXPR_INITIAL (targ) = NULL_TREE;
4322 else
4323 /* We should have expanded this before. */
4324 gcc_assert (DECL_SEEN_IN_BIND_EXPR_P (temp));
4326 *expr_p = temp;
4327 return GS_OK;
4330 /* Gimplification of expression trees. */
4332 /* Gimplify an expression which appears at statement context; usually, this
4333 means replacing it with a suitably gimple STATEMENT_LIST. */
4335 void
4336 gimplify_stmt (tree *stmt_p)
4338 gimplify_expr (stmt_p, NULL, NULL, is_gimple_stmt, fb_none);
4341 /* Similarly, but force the result to be a STATEMENT_LIST. */
4343 void
4344 gimplify_to_stmt_list (tree *stmt_p)
4346 gimplify_stmt (stmt_p);
4347 if (!*stmt_p)
4348 *stmt_p = alloc_stmt_list ();
4349 else if (TREE_CODE (*stmt_p) != STATEMENT_LIST)
4351 tree t = *stmt_p;
4352 *stmt_p = alloc_stmt_list ();
4353 append_to_statement_list (t, stmt_p);
4358 /* Add FIRSTPRIVATE entries for DECL in the OpenMP the surrounding parallels
4359 to CTX. If entries already exist, force them to be some flavor of private.
4360 If there is no enclosing parallel, do nothing. */
4362 void
4363 omp_firstprivatize_variable (struct gimplify_omp_ctx *ctx, tree decl)
4365 splay_tree_node n;
4367 if (decl == NULL || !DECL_P (decl))
4368 return;
4372 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
4373 if (n != NULL)
4375 if (n->value & GOVD_SHARED)
4376 n->value = GOVD_FIRSTPRIVATE | (n->value & GOVD_SEEN);
4377 else
4378 return;
4380 else if (ctx->is_parallel)
4381 omp_add_variable (ctx, decl, GOVD_FIRSTPRIVATE);
4383 ctx = ctx->outer_context;
4385 while (ctx);
4388 /* Similarly for each of the type sizes of TYPE. */
4390 static void
4391 omp_firstprivatize_type_sizes (struct gimplify_omp_ctx *ctx, tree type)
4393 if (type == NULL || type == error_mark_node)
4394 return;
4395 type = TYPE_MAIN_VARIANT (type);
4397 if (pointer_set_insert (ctx->privatized_types, type))
4398 return;
4400 switch (TREE_CODE (type))
4402 case INTEGER_TYPE:
4403 case ENUMERAL_TYPE:
4404 case BOOLEAN_TYPE:
4405 case REAL_TYPE:
4406 omp_firstprivatize_variable (ctx, TYPE_MIN_VALUE (type));
4407 omp_firstprivatize_variable (ctx, TYPE_MAX_VALUE (type));
4408 break;
4410 case ARRAY_TYPE:
4411 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (type));
4412 omp_firstprivatize_type_sizes (ctx, TYPE_DOMAIN (type));
4413 break;
4415 case RECORD_TYPE:
4416 case UNION_TYPE:
4417 case QUAL_UNION_TYPE:
4419 tree field;
4420 for (field = TYPE_FIELDS (type); field; field = TREE_CHAIN (field))
4421 if (TREE_CODE (field) == FIELD_DECL)
4423 omp_firstprivatize_variable (ctx, DECL_FIELD_OFFSET (field));
4424 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (field));
4427 break;
4429 case POINTER_TYPE:
4430 case REFERENCE_TYPE:
4431 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (type));
4432 break;
4434 default:
4435 break;
4438 omp_firstprivatize_variable (ctx, TYPE_SIZE (type));
4439 omp_firstprivatize_variable (ctx, TYPE_SIZE_UNIT (type));
4440 lang_hooks.types.omp_firstprivatize_type_sizes (ctx, type);
4443 /* Add an entry for DECL in the OpenMP context CTX with FLAGS. */
4445 static void
4446 omp_add_variable (struct gimplify_omp_ctx *ctx, tree decl, unsigned int flags)
4448 splay_tree_node n;
4449 unsigned int nflags;
4450 tree t;
4452 if (decl == error_mark_node || TREE_TYPE (decl) == error_mark_node)
4453 return;
4455 /* Never elide decls whose type has TREE_ADDRESSABLE set. This means
4456 there are constructors involved somewhere. */
4457 if (TREE_ADDRESSABLE (TREE_TYPE (decl))
4458 || TYPE_NEEDS_CONSTRUCTING (TREE_TYPE (decl)))
4459 flags |= GOVD_SEEN;
4461 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
4462 if (n != NULL)
4464 /* We shouldn't be re-adding the decl with the same data
4465 sharing class. */
4466 gcc_assert ((n->value & GOVD_DATA_SHARE_CLASS & flags) == 0);
4467 /* The only combination of data sharing classes we should see is
4468 FIRSTPRIVATE and LASTPRIVATE. */
4469 nflags = n->value | flags;
4470 gcc_assert ((nflags & GOVD_DATA_SHARE_CLASS)
4471 == (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE));
4472 n->value = nflags;
4473 return;
4476 /* When adding a variable-sized variable, we have to handle all sorts
4477 of additional bits of data: the pointer replacement variable, and
4478 the parameters of the type. */
4479 if (DECL_SIZE (decl) && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
4481 /* Add the pointer replacement variable as PRIVATE if the variable
4482 replacement is private, else FIRSTPRIVATE since we'll need the
4483 address of the original variable either for SHARED, or for the
4484 copy into or out of the context. */
4485 if (!(flags & GOVD_LOCAL))
4487 nflags = flags & GOVD_PRIVATE ? GOVD_PRIVATE : GOVD_FIRSTPRIVATE;
4488 nflags |= flags & GOVD_SEEN;
4489 t = DECL_VALUE_EXPR (decl);
4490 gcc_assert (TREE_CODE (t) == INDIRECT_REF);
4491 t = TREE_OPERAND (t, 0);
4492 gcc_assert (DECL_P (t));
4493 omp_add_variable (ctx, t, nflags);
4496 /* Add all of the variable and type parameters (which should have
4497 been gimplified to a formal temporary) as FIRSTPRIVATE. */
4498 omp_firstprivatize_variable (ctx, DECL_SIZE_UNIT (decl));
4499 omp_firstprivatize_variable (ctx, DECL_SIZE (decl));
4500 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (decl));
4502 /* The variable-sized variable itself is never SHARED, only some form
4503 of PRIVATE. The sharing would take place via the pointer variable
4504 which we remapped above. */
4505 if (flags & GOVD_SHARED)
4506 flags = GOVD_PRIVATE | GOVD_DEBUG_PRIVATE
4507 | (flags & (GOVD_SEEN | GOVD_EXPLICIT));
4509 /* We're going to make use of the TYPE_SIZE_UNIT at least in the
4510 alloca statement we generate for the variable, so make sure it
4511 is available. This isn't automatically needed for the SHARED
4512 case, since we won't be allocating local storage then.
4513 For local variables TYPE_SIZE_UNIT might not be gimplified yet,
4514 in this case omp_notice_variable will be called later
4515 on when it is gimplified. */
4516 else if (! (flags & GOVD_LOCAL))
4517 omp_notice_variable (ctx, TYPE_SIZE_UNIT (TREE_TYPE (decl)), true);
4519 else if (lang_hooks.decls.omp_privatize_by_reference (decl))
4521 gcc_assert ((flags & GOVD_LOCAL) == 0);
4522 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (decl));
4524 /* Similar to the direct variable sized case above, we'll need the
4525 size of references being privatized. */
4526 if ((flags & GOVD_SHARED) == 0)
4528 t = TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl)));
4529 if (TREE_CODE (t) != INTEGER_CST)
4530 omp_notice_variable (ctx, t, true);
4534 splay_tree_insert (ctx->variables, (splay_tree_key)decl, flags);
4537 /* Record the fact that DECL was used within the OpenMP context CTX.
4538 IN_CODE is true when real code uses DECL, and false when we should
4539 merely emit default(none) errors. Return true if DECL is going to
4540 be remapped and thus DECL shouldn't be gimplified into its
4541 DECL_VALUE_EXPR (if any). */
4543 static bool
4544 omp_notice_variable (struct gimplify_omp_ctx *ctx, tree decl, bool in_code)
4546 splay_tree_node n;
4547 unsigned flags = in_code ? GOVD_SEEN : 0;
4548 bool ret = false, shared;
4550 if (decl == error_mark_node || TREE_TYPE (decl) == error_mark_node)
4551 return false;
4553 /* Threadprivate variables are predetermined. */
4554 if (is_global_var (decl))
4556 if (DECL_THREAD_LOCAL_P (decl))
4557 return false;
4559 if (DECL_HAS_VALUE_EXPR_P (decl))
4561 tree value = get_base_address (DECL_VALUE_EXPR (decl));
4563 if (value && DECL_P (value) && DECL_THREAD_LOCAL_P (value))
4564 return false;
4568 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
4569 if (n == NULL)
4571 enum omp_clause_default_kind default_kind, kind;
4573 if (!ctx->is_parallel)
4574 goto do_outer;
4576 /* ??? Some compiler-generated variables (like SAVE_EXPRs) could be
4577 remapped firstprivate instead of shared. To some extent this is
4578 addressed in omp_firstprivatize_type_sizes, but not effectively. */
4579 default_kind = ctx->default_kind;
4580 kind = lang_hooks.decls.omp_predetermined_sharing (decl);
4581 if (kind != OMP_CLAUSE_DEFAULT_UNSPECIFIED)
4582 default_kind = kind;
4584 switch (default_kind)
4586 case OMP_CLAUSE_DEFAULT_NONE:
4587 error ("%qs not specified in enclosing parallel",
4588 IDENTIFIER_POINTER (DECL_NAME (decl)));
4589 error ("%Henclosing parallel", &ctx->location);
4590 /* FALLTHRU */
4591 case OMP_CLAUSE_DEFAULT_SHARED:
4592 flags |= GOVD_SHARED;
4593 break;
4594 case OMP_CLAUSE_DEFAULT_PRIVATE:
4595 flags |= GOVD_PRIVATE;
4596 break;
4597 default:
4598 gcc_unreachable ();
4601 omp_add_variable (ctx, decl, flags);
4603 shared = (flags & GOVD_SHARED) != 0;
4604 ret = lang_hooks.decls.omp_disregard_value_expr (decl, shared);
4605 goto do_outer;
4608 shared = ((flags | n->value) & GOVD_SHARED) != 0;
4609 ret = lang_hooks.decls.omp_disregard_value_expr (decl, shared);
4611 /* If nothing changed, there's nothing left to do. */
4612 if ((n->value & flags) == flags)
4613 return ret;
4614 flags |= n->value;
4615 n->value = flags;
4617 do_outer:
4618 /* If the variable is private in the current context, then we don't
4619 need to propagate anything to an outer context. */
4620 if (flags & GOVD_PRIVATE)
4621 return ret;
4622 if (ctx->outer_context
4623 && omp_notice_variable (ctx->outer_context, decl, in_code))
4624 return true;
4625 return ret;
4628 /* Verify that DECL is private within CTX. If there's specific information
4629 to the contrary in the innermost scope, generate an error. */
4631 static bool
4632 omp_is_private (struct gimplify_omp_ctx *ctx, tree decl)
4634 splay_tree_node n;
4636 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
4637 if (n != NULL)
4639 if (n->value & GOVD_SHARED)
4641 if (ctx == gimplify_omp_ctxp)
4643 error ("iteration variable %qs should be private",
4644 IDENTIFIER_POINTER (DECL_NAME (decl)));
4645 n->value = GOVD_PRIVATE;
4646 return true;
4648 else
4649 return false;
4651 else if ((n->value & GOVD_EXPLICIT) != 0
4652 && (ctx == gimplify_omp_ctxp
4653 || (ctx->is_combined_parallel
4654 && gimplify_omp_ctxp->outer_context == ctx)))
4656 if ((n->value & GOVD_FIRSTPRIVATE) != 0)
4657 error ("iteration variable %qs should not be firstprivate",
4658 IDENTIFIER_POINTER (DECL_NAME (decl)));
4659 else if ((n->value & GOVD_REDUCTION) != 0)
4660 error ("iteration variable %qs should not be reduction",
4661 IDENTIFIER_POINTER (DECL_NAME (decl)));
4663 return true;
4666 if (ctx->is_parallel)
4667 return false;
4668 else if (ctx->outer_context)
4669 return omp_is_private (ctx->outer_context, decl);
4670 else
4671 return !is_global_var (decl);
4674 /* Return true if DECL is private within a parallel region
4675 that binds to the current construct's context or in parallel
4676 region's REDUCTION clause. */
4678 static bool
4679 omp_check_private (struct gimplify_omp_ctx *ctx, tree decl)
4681 splay_tree_node n;
4685 ctx = ctx->outer_context;
4686 if (ctx == NULL)
4687 return !(is_global_var (decl)
4688 /* References might be private, but might be shared too. */
4689 || lang_hooks.decls.omp_privatize_by_reference (decl));
4691 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
4692 if (n != NULL)
4693 return (n->value & GOVD_SHARED) == 0;
4695 while (!ctx->is_parallel);
4696 return false;
4699 /* Scan the OpenMP clauses in *LIST_P, installing mappings into a new
4700 and previous omp contexts. */
4702 static void
4703 gimplify_scan_omp_clauses (tree *list_p, tree *pre_p, bool in_parallel,
4704 bool in_combined_parallel)
4706 struct gimplify_omp_ctx *ctx, *outer_ctx;
4707 tree c;
4709 ctx = new_omp_context (in_parallel, in_combined_parallel);
4710 outer_ctx = ctx->outer_context;
4712 while ((c = *list_p) != NULL)
4714 enum gimplify_status gs;
4715 bool remove = false;
4716 bool notice_outer = true;
4717 const char *check_non_private = NULL;
4718 unsigned int flags;
4719 tree decl;
4721 switch (OMP_CLAUSE_CODE (c))
4723 case OMP_CLAUSE_PRIVATE:
4724 flags = GOVD_PRIVATE | GOVD_EXPLICIT;
4725 notice_outer = false;
4726 goto do_add;
4727 case OMP_CLAUSE_SHARED:
4728 flags = GOVD_SHARED | GOVD_EXPLICIT;
4729 goto do_add;
4730 case OMP_CLAUSE_FIRSTPRIVATE:
4731 flags = GOVD_FIRSTPRIVATE | GOVD_EXPLICIT;
4732 check_non_private = "firstprivate";
4733 goto do_add;
4734 case OMP_CLAUSE_LASTPRIVATE:
4735 flags = GOVD_LASTPRIVATE | GOVD_SEEN | GOVD_EXPLICIT;
4736 check_non_private = "lastprivate";
4737 goto do_add;
4738 case OMP_CLAUSE_REDUCTION:
4739 flags = GOVD_REDUCTION | GOVD_SEEN | GOVD_EXPLICIT;
4740 check_non_private = "reduction";
4741 goto do_add;
4743 do_add:
4744 decl = OMP_CLAUSE_DECL (c);
4745 if (decl == error_mark_node || TREE_TYPE (decl) == error_mark_node)
4747 remove = true;
4748 break;
4750 /* Handle NRV results passed by reference. */
4751 if (TREE_CODE (decl) == INDIRECT_REF
4752 && TREE_CODE (TREE_OPERAND (decl, 0)) == RESULT_DECL
4753 && DECL_BY_REFERENCE (TREE_OPERAND (decl, 0)))
4754 OMP_CLAUSE_DECL (c) = decl = TREE_OPERAND (decl, 0);
4755 omp_add_variable (ctx, decl, flags);
4756 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_REDUCTION
4757 && OMP_CLAUSE_REDUCTION_PLACEHOLDER (c))
4759 omp_add_variable (ctx, OMP_CLAUSE_REDUCTION_PLACEHOLDER (c),
4760 GOVD_LOCAL | GOVD_SEEN);
4761 gimplify_omp_ctxp = ctx;
4762 push_gimplify_context ();
4763 gimplify_stmt (&OMP_CLAUSE_REDUCTION_INIT (c));
4764 pop_gimplify_context (OMP_CLAUSE_REDUCTION_INIT (c));
4765 push_gimplify_context ();
4766 gimplify_stmt (&OMP_CLAUSE_REDUCTION_MERGE (c));
4767 pop_gimplify_context (OMP_CLAUSE_REDUCTION_MERGE (c));
4768 gimplify_omp_ctxp = outer_ctx;
4770 if (notice_outer)
4771 goto do_notice;
4772 break;
4774 case OMP_CLAUSE_COPYIN:
4775 case OMP_CLAUSE_COPYPRIVATE:
4776 decl = OMP_CLAUSE_DECL (c);
4777 if (decl == error_mark_node || TREE_TYPE (decl) == error_mark_node)
4779 remove = true;
4780 break;
4782 /* Handle NRV results passed by reference. */
4783 if (TREE_CODE (decl) == INDIRECT_REF
4784 && TREE_CODE (TREE_OPERAND (decl, 0)) == RESULT_DECL
4785 && DECL_BY_REFERENCE (TREE_OPERAND (decl, 0)))
4786 OMP_CLAUSE_DECL (c) = decl = TREE_OPERAND (decl, 0);
4787 do_notice:
4788 if (outer_ctx)
4789 omp_notice_variable (outer_ctx, decl, true);
4790 if (check_non_private
4791 && !in_parallel
4792 && omp_check_private (ctx, decl))
4794 error ("%s variable %qs is private in outer context",
4795 check_non_private, IDENTIFIER_POINTER (DECL_NAME (decl)));
4796 remove = true;
4798 break;
4800 case OMP_CLAUSE_IF:
4801 OMP_CLAUSE_OPERAND (c, 0)
4802 = gimple_boolify (OMP_CLAUSE_OPERAND (c, 0));
4803 /* Fall through. */
4805 case OMP_CLAUSE_SCHEDULE:
4806 case OMP_CLAUSE_NUM_THREADS:
4807 gs = gimplify_expr (&OMP_CLAUSE_OPERAND (c, 0), pre_p, NULL,
4808 is_gimple_val, fb_rvalue);
4809 if (gs == GS_ERROR)
4810 remove = true;
4811 break;
4813 case OMP_CLAUSE_NOWAIT:
4814 case OMP_CLAUSE_ORDERED:
4815 break;
4817 case OMP_CLAUSE_DEFAULT:
4818 ctx->default_kind = OMP_CLAUSE_DEFAULT_KIND (c);
4819 break;
4821 default:
4822 gcc_unreachable ();
4825 if (remove)
4826 *list_p = OMP_CLAUSE_CHAIN (c);
4827 else
4828 list_p = &OMP_CLAUSE_CHAIN (c);
4831 gimplify_omp_ctxp = ctx;
4834 /* For all variables that were not actually used within the context,
4835 remove PRIVATE, SHARED, and FIRSTPRIVATE clauses. */
4837 static int
4838 gimplify_adjust_omp_clauses_1 (splay_tree_node n, void *data)
4840 tree *list_p = (tree *) data;
4841 tree decl = (tree) n->key;
4842 unsigned flags = n->value;
4843 enum omp_clause_code code;
4844 tree clause;
4845 bool private_debug;
4847 if (flags & (GOVD_EXPLICIT | GOVD_LOCAL))
4848 return 0;
4849 if ((flags & GOVD_SEEN) == 0)
4850 return 0;
4851 if (flags & GOVD_DEBUG_PRIVATE)
4853 gcc_assert ((flags & GOVD_DATA_SHARE_CLASS) == GOVD_PRIVATE);
4854 private_debug = true;
4856 else
4857 private_debug
4858 = lang_hooks.decls.omp_private_debug_clause (decl,
4859 !!(flags & GOVD_SHARED));
4860 if (private_debug)
4861 code = OMP_CLAUSE_PRIVATE;
4862 else if (flags & GOVD_SHARED)
4864 if (is_global_var (decl))
4865 return 0;
4866 code = OMP_CLAUSE_SHARED;
4868 else if (flags & GOVD_PRIVATE)
4869 code = OMP_CLAUSE_PRIVATE;
4870 else if (flags & GOVD_FIRSTPRIVATE)
4871 code = OMP_CLAUSE_FIRSTPRIVATE;
4872 else
4873 gcc_unreachable ();
4875 clause = build_omp_clause (code);
4876 OMP_CLAUSE_DECL (clause) = decl;
4877 OMP_CLAUSE_CHAIN (clause) = *list_p;
4878 if (private_debug)
4879 OMP_CLAUSE_PRIVATE_DEBUG (clause) = 1;
4880 *list_p = clause;
4882 return 0;
4885 static void
4886 gimplify_adjust_omp_clauses (tree *list_p)
4888 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
4889 tree c, decl;
4891 while ((c = *list_p) != NULL)
4893 splay_tree_node n;
4894 bool remove = false;
4896 switch (OMP_CLAUSE_CODE (c))
4898 case OMP_CLAUSE_PRIVATE:
4899 case OMP_CLAUSE_SHARED:
4900 case OMP_CLAUSE_FIRSTPRIVATE:
4901 decl = OMP_CLAUSE_DECL (c);
4902 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
4903 remove = !(n->value & GOVD_SEEN);
4904 if (! remove)
4906 bool shared = OMP_CLAUSE_CODE (c) == OMP_CLAUSE_SHARED;
4907 if ((n->value & GOVD_DEBUG_PRIVATE)
4908 || lang_hooks.decls.omp_private_debug_clause (decl, shared))
4910 gcc_assert ((n->value & GOVD_DEBUG_PRIVATE) == 0
4911 || ((n->value & GOVD_DATA_SHARE_CLASS)
4912 == GOVD_PRIVATE));
4913 OMP_CLAUSE_SET_CODE (c, OMP_CLAUSE_PRIVATE);
4914 OMP_CLAUSE_PRIVATE_DEBUG (c) = 1;
4917 break;
4919 case OMP_CLAUSE_LASTPRIVATE:
4920 /* Make sure OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE is set to
4921 accurately reflect the presence of a FIRSTPRIVATE clause. */
4922 decl = OMP_CLAUSE_DECL (c);
4923 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
4924 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c)
4925 = (n->value & GOVD_FIRSTPRIVATE) != 0;
4926 break;
4928 case OMP_CLAUSE_REDUCTION:
4929 case OMP_CLAUSE_COPYIN:
4930 case OMP_CLAUSE_COPYPRIVATE:
4931 case OMP_CLAUSE_IF:
4932 case OMP_CLAUSE_NUM_THREADS:
4933 case OMP_CLAUSE_SCHEDULE:
4934 case OMP_CLAUSE_NOWAIT:
4935 case OMP_CLAUSE_ORDERED:
4936 case OMP_CLAUSE_DEFAULT:
4937 break;
4939 default:
4940 gcc_unreachable ();
4943 if (remove)
4944 *list_p = OMP_CLAUSE_CHAIN (c);
4945 else
4946 list_p = &OMP_CLAUSE_CHAIN (c);
4949 /* Add in any implicit data sharing. */
4950 splay_tree_foreach (ctx->variables, gimplify_adjust_omp_clauses_1, list_p);
4952 gimplify_omp_ctxp = ctx->outer_context;
4953 delete_omp_context (ctx);
4956 /* Gimplify the contents of an OMP_PARALLEL statement. This involves
4957 gimplification of the body, as well as scanning the body for used
4958 variables. We need to do this scan now, because variable-sized
4959 decls will be decomposed during gimplification. */
4961 static enum gimplify_status
4962 gimplify_omp_parallel (tree *expr_p, tree *pre_p)
4964 tree expr = *expr_p;
4966 gimplify_scan_omp_clauses (&OMP_PARALLEL_CLAUSES (expr), pre_p, true,
4967 OMP_PARALLEL_COMBINED (expr));
4969 push_gimplify_context ();
4971 gimplify_stmt (&OMP_PARALLEL_BODY (expr));
4973 if (TREE_CODE (OMP_PARALLEL_BODY (expr)) == BIND_EXPR)
4974 pop_gimplify_context (OMP_PARALLEL_BODY (expr));
4975 else
4976 pop_gimplify_context (NULL_TREE);
4978 gimplify_adjust_omp_clauses (&OMP_PARALLEL_CLAUSES (expr));
4980 return GS_ALL_DONE;
4983 /* Gimplify the gross structure of an OMP_FOR statement. */
4985 static enum gimplify_status
4986 gimplify_omp_for (tree *expr_p, tree *pre_p)
4988 tree for_stmt, decl, t;
4989 enum gimplify_status ret = GS_OK;
4991 for_stmt = *expr_p;
4993 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (for_stmt), pre_p, false, false);
4995 t = OMP_FOR_INIT (for_stmt);
4996 gcc_assert (TREE_CODE (t) == MODIFY_EXPR
4997 || TREE_CODE (t) == GIMPLE_MODIFY_STMT);
4998 decl = GENERIC_TREE_OPERAND (t, 0);
4999 gcc_assert (DECL_P (decl));
5000 gcc_assert (INTEGRAL_TYPE_P (TREE_TYPE (decl)));
5002 /* Make sure the iteration variable is private. */
5003 if (omp_is_private (gimplify_omp_ctxp, decl))
5004 omp_notice_variable (gimplify_omp_ctxp, decl, true);
5005 else
5006 omp_add_variable (gimplify_omp_ctxp, decl, GOVD_PRIVATE | GOVD_SEEN);
5008 ret |= gimplify_expr (&GENERIC_TREE_OPERAND (t, 1),
5009 &OMP_FOR_PRE_BODY (for_stmt),
5010 NULL, is_gimple_val, fb_rvalue);
5012 tree_to_gimple_tuple (&OMP_FOR_INIT (for_stmt));
5014 t = OMP_FOR_COND (for_stmt);
5015 gcc_assert (COMPARISON_CLASS_P (t));
5016 gcc_assert (GENERIC_TREE_OPERAND (t, 0) == decl);
5018 ret |= gimplify_expr (&GENERIC_TREE_OPERAND (t, 1),
5019 &OMP_FOR_PRE_BODY (for_stmt),
5020 NULL, is_gimple_val, fb_rvalue);
5022 tree_to_gimple_tuple (&OMP_FOR_INCR (for_stmt));
5023 t = OMP_FOR_INCR (for_stmt);
5024 switch (TREE_CODE (t))
5026 case PREINCREMENT_EXPR:
5027 case POSTINCREMENT_EXPR:
5028 t = build_int_cst (TREE_TYPE (decl), 1);
5029 goto build_modify;
5030 case PREDECREMENT_EXPR:
5031 case POSTDECREMENT_EXPR:
5032 t = build_int_cst (TREE_TYPE (decl), -1);
5033 goto build_modify;
5034 build_modify:
5035 t = build2 (PLUS_EXPR, TREE_TYPE (decl), decl, t);
5036 t = build2 (GIMPLE_MODIFY_STMT, void_type_node, decl, t);
5037 OMP_FOR_INCR (for_stmt) = t;
5038 break;
5040 case GIMPLE_MODIFY_STMT:
5041 gcc_assert (GIMPLE_STMT_OPERAND (t, 0) == decl);
5042 t = GIMPLE_STMT_OPERAND (t, 1);
5043 switch (TREE_CODE (t))
5045 case PLUS_EXPR:
5046 if (TREE_OPERAND (t, 1) == decl)
5048 TREE_OPERAND (t, 1) = TREE_OPERAND (t, 0);
5049 TREE_OPERAND (t, 0) = decl;
5050 break;
5052 case MINUS_EXPR:
5053 gcc_assert (TREE_OPERAND (t, 0) == decl);
5054 break;
5055 default:
5056 gcc_unreachable ();
5059 ret |= gimplify_expr (&TREE_OPERAND (t, 1), &OMP_FOR_PRE_BODY (for_stmt),
5060 NULL, is_gimple_val, fb_rvalue);
5061 break;
5063 default:
5064 gcc_unreachable ();
5067 gimplify_to_stmt_list (&OMP_FOR_BODY (for_stmt));
5068 gimplify_adjust_omp_clauses (&OMP_FOR_CLAUSES (for_stmt));
5070 return ret == GS_ALL_DONE ? GS_ALL_DONE : GS_ERROR;
5073 /* Gimplify the gross structure of other OpenMP worksharing constructs.
5074 In particular, OMP_SECTIONS and OMP_SINGLE. */
5076 static enum gimplify_status
5077 gimplify_omp_workshare (tree *expr_p, tree *pre_p)
5079 tree stmt = *expr_p;
5081 gimplify_scan_omp_clauses (&OMP_CLAUSES (stmt), pre_p, false, false);
5082 gimplify_to_stmt_list (&OMP_BODY (stmt));
5083 gimplify_adjust_omp_clauses (&OMP_CLAUSES (stmt));
5085 return GS_ALL_DONE;
5088 /* A subroutine of gimplify_omp_atomic. The front end is supposed to have
5089 stabilized the lhs of the atomic operation as *ADDR. Return true if
5090 EXPR is this stabilized form. */
5092 static bool
5093 goa_lhs_expr_p (tree expr, tree addr)
5095 /* Also include casts to other type variants. The C front end is fond
5096 of adding these for e.g. volatile variables. This is like
5097 STRIP_TYPE_NOPS but includes the main variant lookup. */
5098 while ((TREE_CODE (expr) == NOP_EXPR
5099 || TREE_CODE (expr) == CONVERT_EXPR
5100 || TREE_CODE (expr) == NON_LVALUE_EXPR)
5101 && TREE_OPERAND (expr, 0) != error_mark_node
5102 && (TYPE_MAIN_VARIANT (TREE_TYPE (expr))
5103 == TYPE_MAIN_VARIANT (TREE_TYPE (TREE_OPERAND (expr, 0)))))
5104 expr = TREE_OPERAND (expr, 0);
5106 if (TREE_CODE (expr) == INDIRECT_REF && TREE_OPERAND (expr, 0) == addr)
5107 return true;
5108 if (TREE_CODE (addr) == ADDR_EXPR && expr == TREE_OPERAND (addr, 0))
5109 return true;
5110 return false;
5113 /* A subroutine of gimplify_omp_atomic. Attempt to implement the atomic
5114 operation as a __sync_fetch_and_op builtin. INDEX is log2 of the
5115 size of the data type, and thus usable to find the index of the builtin
5116 decl. Returns GS_UNHANDLED if the expression is not of the proper form. */
5118 static enum gimplify_status
5119 gimplify_omp_atomic_fetch_op (tree *expr_p, tree addr, tree rhs, int index)
5121 enum built_in_function base;
5122 tree decl, args, itype;
5123 enum insn_code *optab;
5125 /* Check for one of the supported fetch-op operations. */
5126 switch (TREE_CODE (rhs))
5128 case PLUS_EXPR:
5129 base = BUILT_IN_FETCH_AND_ADD_N;
5130 optab = sync_add_optab;
5131 break;
5132 case MINUS_EXPR:
5133 base = BUILT_IN_FETCH_AND_SUB_N;
5134 optab = sync_add_optab;
5135 break;
5136 case BIT_AND_EXPR:
5137 base = BUILT_IN_FETCH_AND_AND_N;
5138 optab = sync_and_optab;
5139 break;
5140 case BIT_IOR_EXPR:
5141 base = BUILT_IN_FETCH_AND_OR_N;
5142 optab = sync_ior_optab;
5143 break;
5144 case BIT_XOR_EXPR:
5145 base = BUILT_IN_FETCH_AND_XOR_N;
5146 optab = sync_xor_optab;
5147 break;
5148 default:
5149 return GS_UNHANDLED;
5152 /* Make sure the expression is of the proper form. */
5153 if (goa_lhs_expr_p (TREE_OPERAND (rhs, 0), addr))
5154 rhs = TREE_OPERAND (rhs, 1);
5155 else if (commutative_tree_code (TREE_CODE (rhs))
5156 && goa_lhs_expr_p (TREE_OPERAND (rhs, 1), addr))
5157 rhs = TREE_OPERAND (rhs, 0);
5158 else
5159 return GS_UNHANDLED;
5161 decl = built_in_decls[base + index + 1];
5162 itype = TREE_TYPE (TREE_TYPE (decl));
5164 if (optab[TYPE_MODE (itype)] == CODE_FOR_nothing)
5165 return GS_UNHANDLED;
5167 args = tree_cons (NULL, fold_convert (itype, rhs), NULL);
5168 args = tree_cons (NULL, addr, args);
5169 *expr_p = build_function_call_expr (decl, args);
5170 return GS_OK;
5173 /* A subroutine of gimplify_omp_atomic_pipeline. Walk *EXPR_P and replace
5174 appearances of *LHS_ADDR with LHS_VAR. If an expression does not involve
5175 the lhs, evaluate it into a temporary. Return 1 if the lhs appeared as
5176 a subexpression, 0 if it did not, or -1 if an error was encountered. */
5178 static int
5179 goa_stabilize_expr (tree *expr_p, tree *pre_p, tree lhs_addr, tree lhs_var)
5181 tree expr = *expr_p;
5182 int saw_lhs;
5184 if (goa_lhs_expr_p (expr, lhs_addr))
5186 *expr_p = lhs_var;
5187 return 1;
5189 if (is_gimple_val (expr))
5190 return 0;
5192 saw_lhs = 0;
5193 switch (TREE_CODE_CLASS (TREE_CODE (expr)))
5195 case tcc_binary:
5196 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 1), pre_p,
5197 lhs_addr, lhs_var);
5198 case tcc_unary:
5199 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 0), pre_p,
5200 lhs_addr, lhs_var);
5201 break;
5202 default:
5203 break;
5206 if (saw_lhs == 0)
5208 enum gimplify_status gs;
5209 gs = gimplify_expr (expr_p, pre_p, NULL, is_gimple_val, fb_rvalue);
5210 if (gs != GS_ALL_DONE)
5211 saw_lhs = -1;
5214 return saw_lhs;
5217 /* A subroutine of gimplify_omp_atomic. Implement the atomic operation as:
5219 oldval = *addr;
5220 repeat:
5221 newval = rhs; // with oldval replacing *addr in rhs
5222 oldval = __sync_val_compare_and_swap (addr, oldval, newval);
5223 if (oldval != newval)
5224 goto repeat;
5226 INDEX is log2 of the size of the data type, and thus usable to find the
5227 index of the builtin decl. */
5229 static enum gimplify_status
5230 gimplify_omp_atomic_pipeline (tree *expr_p, tree *pre_p, tree addr,
5231 tree rhs, int index)
5233 tree oldval, oldival, oldival2, newval, newival, label;
5234 tree type, itype, cmpxchg, args, x, iaddr;
5236 cmpxchg = built_in_decls[BUILT_IN_VAL_COMPARE_AND_SWAP_N + index + 1];
5237 type = TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (addr)));
5238 itype = TREE_TYPE (TREE_TYPE (cmpxchg));
5240 if (sync_compare_and_swap[TYPE_MODE (itype)] == CODE_FOR_nothing)
5241 return GS_UNHANDLED;
5243 oldval = create_tmp_var (type, NULL);
5244 newval = create_tmp_var (type, NULL);
5246 /* Precompute as much of RHS as possible. In the same walk, replace
5247 occurrences of the lhs value with our temporary. */
5248 if (goa_stabilize_expr (&rhs, pre_p, addr, oldval) < 0)
5249 return GS_ERROR;
5251 x = build_fold_indirect_ref (addr);
5252 x = build2 (GIMPLE_MODIFY_STMT, void_type_node, oldval, x);
5253 gimplify_and_add (x, pre_p);
5255 /* For floating-point values, we'll need to view-convert them to integers
5256 so that we can perform the atomic compare and swap. Simplify the
5257 following code by always setting up the "i"ntegral variables. */
5258 if (INTEGRAL_TYPE_P (type) || POINTER_TYPE_P (type))
5260 oldival = oldval;
5261 newival = newval;
5262 iaddr = addr;
5264 else
5266 oldival = create_tmp_var (itype, NULL);
5267 newival = create_tmp_var (itype, NULL);
5269 x = build1 (VIEW_CONVERT_EXPR, itype, oldval);
5270 x = build2 (GIMPLE_MODIFY_STMT, void_type_node, oldival, x);
5271 gimplify_and_add (x, pre_p);
5272 iaddr = fold_convert (build_pointer_type (itype), addr);
5275 oldival2 = create_tmp_var (itype, NULL);
5277 label = create_artificial_label ();
5278 x = build1 (LABEL_EXPR, void_type_node, label);
5279 gimplify_and_add (x, pre_p);
5281 x = build2 (GIMPLE_MODIFY_STMT, void_type_node, newval, rhs);
5282 gimplify_and_add (x, pre_p);
5284 if (newval != newival)
5286 x = build1 (VIEW_CONVERT_EXPR, itype, newval);
5287 x = build2 (GIMPLE_MODIFY_STMT, void_type_node, newival, x);
5288 gimplify_and_add (x, pre_p);
5291 x = build2 (GIMPLE_MODIFY_STMT, void_type_node, oldival2,
5292 fold_convert (itype, oldival));
5293 gimplify_and_add (x, pre_p);
5295 args = tree_cons (NULL, fold_convert (itype, newival), NULL);
5296 args = tree_cons (NULL, fold_convert (itype, oldival), args);
5297 args = tree_cons (NULL, iaddr, args);
5298 x = build_function_call_expr (cmpxchg, args);
5299 if (oldval == oldival)
5300 x = fold_convert (type, x);
5301 x = build2 (GIMPLE_MODIFY_STMT, void_type_node, oldival, x);
5302 gimplify_and_add (x, pre_p);
5304 /* For floating point, be prepared for the loop backedge. */
5305 if (oldval != oldival)
5307 x = build1 (VIEW_CONVERT_EXPR, type, oldival);
5308 x = build2 (GIMPLE_MODIFY_STMT, void_type_node, oldval, x);
5309 gimplify_and_add (x, pre_p);
5312 /* Note that we always perform the comparison as an integer, even for
5313 floating point. This allows the atomic operation to properly
5314 succeed even with NaNs and -0.0. */
5315 x = build3 (COND_EXPR, void_type_node,
5316 build2 (NE_EXPR, boolean_type_node, oldival, oldival2),
5317 build1 (GOTO_EXPR, void_type_node, label), NULL);
5318 gimplify_and_add (x, pre_p);
5320 *expr_p = NULL;
5321 return GS_ALL_DONE;
5324 /* A subroutine of gimplify_omp_atomic. Implement the atomic operation as:
5326 GOMP_atomic_start ();
5327 *addr = rhs;
5328 GOMP_atomic_end ();
5330 The result is not globally atomic, but works so long as all parallel
5331 references are within #pragma omp atomic directives. According to
5332 responses received from omp@openmp.org, appears to be within spec.
5333 Which makes sense, since that's how several other compilers handle
5334 this situation as well. */
5336 static enum gimplify_status
5337 gimplify_omp_atomic_mutex (tree *expr_p, tree *pre_p, tree addr, tree rhs)
5339 tree t;
5341 t = built_in_decls[BUILT_IN_GOMP_ATOMIC_START];
5342 t = build_function_call_expr (t, NULL);
5343 gimplify_and_add (t, pre_p);
5345 t = build_fold_indirect_ref (addr);
5346 t = build2 (GIMPLE_MODIFY_STMT, void_type_node, t, rhs);
5347 gimplify_and_add (t, pre_p);
5349 t = built_in_decls[BUILT_IN_GOMP_ATOMIC_END];
5350 t = build_function_call_expr (t, NULL);
5351 gimplify_and_add (t, pre_p);
5353 *expr_p = NULL;
5354 return GS_ALL_DONE;
5357 /* Gimplify an OMP_ATOMIC statement. */
5359 static enum gimplify_status
5360 gimplify_omp_atomic (tree *expr_p, tree *pre_p)
5362 tree addr = TREE_OPERAND (*expr_p, 0);
5363 tree rhs = TREE_OPERAND (*expr_p, 1);
5364 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (addr)));
5365 HOST_WIDE_INT index;
5367 /* Make sure the type is one of the supported sizes. */
5368 index = tree_low_cst (TYPE_SIZE_UNIT (type), 1);
5369 index = exact_log2 (index);
5370 if (index >= 0 && index <= 4)
5372 enum gimplify_status gs;
5373 unsigned int align;
5375 if (DECL_P (TREE_OPERAND (addr, 0)))
5376 align = DECL_ALIGN_UNIT (TREE_OPERAND (addr, 0));
5377 else if (TREE_CODE (TREE_OPERAND (addr, 0)) == COMPONENT_REF
5378 && TREE_CODE (TREE_OPERAND (TREE_OPERAND (addr, 0), 1))
5379 == FIELD_DECL)
5380 align = DECL_ALIGN_UNIT (TREE_OPERAND (TREE_OPERAND (addr, 0), 1));
5381 else
5382 align = TYPE_ALIGN_UNIT (type);
5384 /* __sync builtins require strict data alignment. */
5385 if (exact_log2 (align) >= index)
5387 /* When possible, use specialized atomic update functions. */
5388 if (INTEGRAL_TYPE_P (type) || POINTER_TYPE_P (type))
5390 gs = gimplify_omp_atomic_fetch_op (expr_p, addr, rhs, index);
5391 if (gs != GS_UNHANDLED)
5392 return gs;
5395 /* If we don't have specialized __sync builtins, try and implement
5396 as a compare and swap loop. */
5397 gs = gimplify_omp_atomic_pipeline (expr_p, pre_p, addr, rhs, index);
5398 if (gs != GS_UNHANDLED)
5399 return gs;
5403 /* The ultimate fallback is wrapping the operation in a mutex. */
5404 return gimplify_omp_atomic_mutex (expr_p, pre_p, addr, rhs);
5407 /* Gimplifies the expression tree pointed to by EXPR_P. Return 0 if
5408 gimplification failed.
5410 PRE_P points to the list where side effects that must happen before
5411 EXPR should be stored.
5413 POST_P points to the list where side effects that must happen after
5414 EXPR should be stored, or NULL if there is no suitable list. In
5415 that case, we copy the result to a temporary, emit the
5416 post-effects, and then return the temporary.
5418 GIMPLE_TEST_F points to a function that takes a tree T and
5419 returns nonzero if T is in the GIMPLE form requested by the
5420 caller. The GIMPLE predicates are in tree-gimple.c.
5422 This test is used twice. Before gimplification, the test is
5423 invoked to determine whether *EXPR_P is already gimple enough. If
5424 that fails, *EXPR_P is gimplified according to its code and
5425 GIMPLE_TEST_F is called again. If the test still fails, then a new
5426 temporary variable is created and assigned the value of the
5427 gimplified expression.
5429 FALLBACK tells the function what sort of a temporary we want. If the 1
5430 bit is set, an rvalue is OK. If the 2 bit is set, an lvalue is OK.
5431 If both are set, either is OK, but an lvalue is preferable.
5433 The return value is either GS_ERROR or GS_ALL_DONE, since this function
5434 iterates until solution. */
5436 enum gimplify_status
5437 gimplify_expr (tree *expr_p, tree *pre_p, tree *post_p,
5438 bool (* gimple_test_f) (tree), fallback_t fallback)
5440 tree tmp;
5441 tree internal_pre = NULL_TREE;
5442 tree internal_post = NULL_TREE;
5443 tree save_expr;
5444 int is_statement = (pre_p == NULL);
5445 location_t saved_location;
5446 enum gimplify_status ret;
5448 save_expr = *expr_p;
5449 if (save_expr == NULL_TREE)
5450 return GS_ALL_DONE;
5452 /* We used to check the predicate here and return immediately if it
5453 succeeds. This is wrong; the design is for gimplification to be
5454 idempotent, and for the predicates to only test for valid forms, not
5455 whether they are fully simplified. */
5457 /* Set up our internal queues if needed. */
5458 if (pre_p == NULL)
5459 pre_p = &internal_pre;
5460 if (post_p == NULL)
5461 post_p = &internal_post;
5463 saved_location = input_location;
5464 if (save_expr != error_mark_node
5465 && EXPR_HAS_LOCATION (*expr_p))
5466 input_location = EXPR_LOCATION (*expr_p);
5468 /* Loop over the specific gimplifiers until the toplevel node
5469 remains the same. */
5472 /* Strip away as many useless type conversions as possible
5473 at the toplevel. */
5474 STRIP_USELESS_TYPE_CONVERSION (*expr_p);
5476 /* Remember the expr. */
5477 save_expr = *expr_p;
5479 /* Die, die, die, my darling. */
5480 if (save_expr == error_mark_node
5481 || (!GIMPLE_STMT_P (save_expr)
5482 && TREE_TYPE (save_expr)
5483 && TREE_TYPE (save_expr) == error_mark_node))
5485 ret = GS_ERROR;
5486 break;
5489 /* Do any language-specific gimplification. */
5490 ret = lang_hooks.gimplify_expr (expr_p, pre_p, post_p);
5491 if (ret == GS_OK)
5493 if (*expr_p == NULL_TREE)
5494 break;
5495 if (*expr_p != save_expr)
5496 continue;
5498 else if (ret != GS_UNHANDLED)
5499 break;
5501 ret = GS_OK;
5502 switch (TREE_CODE (*expr_p))
5504 /* First deal with the special cases. */
5506 case POSTINCREMENT_EXPR:
5507 case POSTDECREMENT_EXPR:
5508 case PREINCREMENT_EXPR:
5509 case PREDECREMENT_EXPR:
5510 ret = gimplify_self_mod_expr (expr_p, pre_p, post_p,
5511 fallback != fb_none);
5512 break;
5514 case ARRAY_REF:
5515 case ARRAY_RANGE_REF:
5516 case REALPART_EXPR:
5517 case IMAGPART_EXPR:
5518 case COMPONENT_REF:
5519 case VIEW_CONVERT_EXPR:
5520 ret = gimplify_compound_lval (expr_p, pre_p, post_p,
5521 fallback ? fallback : fb_rvalue);
5522 break;
5524 case COND_EXPR:
5525 ret = gimplify_cond_expr (expr_p, pre_p, fallback);
5526 /* C99 code may assign to an array in a structure value of a
5527 conditional expression, and this has undefined behavior
5528 only on execution, so create a temporary if an lvalue is
5529 required. */
5530 if (fallback == fb_lvalue)
5532 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
5533 lang_hooks.mark_addressable (*expr_p);
5535 break;
5537 case CALL_EXPR:
5538 ret = gimplify_call_expr (expr_p, pre_p, fallback != fb_none);
5539 /* C99 code may assign to an array in a structure returned
5540 from a function, and this has undefined behavior only on
5541 execution, so create a temporary if an lvalue is
5542 required. */
5543 if (fallback == fb_lvalue)
5545 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
5546 lang_hooks.mark_addressable (*expr_p);
5548 break;
5550 case TREE_LIST:
5551 gcc_unreachable ();
5553 case COMPOUND_EXPR:
5554 ret = gimplify_compound_expr (expr_p, pre_p, fallback != fb_none);
5555 break;
5557 case MODIFY_EXPR:
5558 case GIMPLE_MODIFY_STMT:
5559 case INIT_EXPR:
5560 ret = gimplify_modify_expr (expr_p, pre_p, post_p,
5561 fallback != fb_none);
5563 if (*expr_p)
5565 /* The distinction between MODIFY_EXPR and INIT_EXPR is no longer
5566 useful. */
5567 if (TREE_CODE (*expr_p) == INIT_EXPR)
5568 TREE_SET_CODE (*expr_p, MODIFY_EXPR);
5570 /* Convert MODIFY_EXPR to GIMPLE_MODIFY_STMT. */
5571 if (TREE_CODE (*expr_p) == MODIFY_EXPR)
5572 tree_to_gimple_tuple (expr_p);
5575 break;
5577 case TRUTH_ANDIF_EXPR:
5578 case TRUTH_ORIF_EXPR:
5579 ret = gimplify_boolean_expr (expr_p);
5580 break;
5582 case TRUTH_NOT_EXPR:
5583 TREE_OPERAND (*expr_p, 0)
5584 = gimple_boolify (TREE_OPERAND (*expr_p, 0));
5585 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
5586 is_gimple_val, fb_rvalue);
5587 recalculate_side_effects (*expr_p);
5588 break;
5590 case ADDR_EXPR:
5591 ret = gimplify_addr_expr (expr_p, pre_p, post_p);
5592 break;
5594 case VA_ARG_EXPR:
5595 ret = gimplify_va_arg_expr (expr_p, pre_p, post_p);
5596 break;
5598 case CONVERT_EXPR:
5599 case NOP_EXPR:
5600 if (IS_EMPTY_STMT (*expr_p))
5602 ret = GS_ALL_DONE;
5603 break;
5606 if (VOID_TYPE_P (TREE_TYPE (*expr_p))
5607 || fallback == fb_none)
5609 /* Just strip a conversion to void (or in void context) and
5610 try again. */
5611 *expr_p = TREE_OPERAND (*expr_p, 0);
5612 break;
5615 ret = gimplify_conversion (expr_p);
5616 if (ret == GS_ERROR)
5617 break;
5618 if (*expr_p != save_expr)
5619 break;
5620 /* FALLTHRU */
5622 case FIX_TRUNC_EXPR:
5623 /* unary_expr: ... | '(' cast ')' val | ... */
5624 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
5625 is_gimple_val, fb_rvalue);
5626 recalculate_side_effects (*expr_p);
5627 break;
5629 case INDIRECT_REF:
5630 *expr_p = fold_indirect_ref (*expr_p);
5631 if (*expr_p != save_expr)
5632 break;
5633 /* else fall through. */
5634 case ALIGN_INDIRECT_REF:
5635 case MISALIGNED_INDIRECT_REF:
5636 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
5637 is_gimple_reg, fb_rvalue);
5638 recalculate_side_effects (*expr_p);
5639 break;
5641 /* Constants need not be gimplified. */
5642 case INTEGER_CST:
5643 case REAL_CST:
5644 case STRING_CST:
5645 case COMPLEX_CST:
5646 case VECTOR_CST:
5647 ret = GS_ALL_DONE;
5648 break;
5650 case CONST_DECL:
5651 /* If we require an lvalue, such as for ADDR_EXPR, retain the
5652 CONST_DECL node. Otherwise the decl is replaceable by its
5653 value. */
5654 /* ??? Should be == fb_lvalue, but ADDR_EXPR passes fb_either. */
5655 if (fallback & fb_lvalue)
5656 ret = GS_ALL_DONE;
5657 else
5658 *expr_p = DECL_INITIAL (*expr_p);
5659 break;
5661 case DECL_EXPR:
5662 ret = gimplify_decl_expr (expr_p);
5663 break;
5665 case EXC_PTR_EXPR:
5666 /* FIXME make this a decl. */
5667 ret = GS_ALL_DONE;
5668 break;
5670 case BIND_EXPR:
5671 ret = gimplify_bind_expr (expr_p, pre_p);
5672 break;
5674 case LOOP_EXPR:
5675 ret = gimplify_loop_expr (expr_p, pre_p);
5676 break;
5678 case SWITCH_EXPR:
5679 ret = gimplify_switch_expr (expr_p, pre_p);
5680 break;
5682 case EXIT_EXPR:
5683 ret = gimplify_exit_expr (expr_p);
5684 break;
5686 case GOTO_EXPR:
5687 /* If the target is not LABEL, then it is a computed jump
5688 and the target needs to be gimplified. */
5689 if (TREE_CODE (GOTO_DESTINATION (*expr_p)) != LABEL_DECL)
5690 ret = gimplify_expr (&GOTO_DESTINATION (*expr_p), pre_p,
5691 NULL, is_gimple_val, fb_rvalue);
5692 break;
5694 case LABEL_EXPR:
5695 ret = GS_ALL_DONE;
5696 gcc_assert (decl_function_context (LABEL_EXPR_LABEL (*expr_p))
5697 == current_function_decl);
5698 break;
5700 case CASE_LABEL_EXPR:
5701 ret = gimplify_case_label_expr (expr_p);
5702 break;
5704 case RETURN_EXPR:
5705 ret = gimplify_return_expr (*expr_p, pre_p);
5706 break;
5708 case CONSTRUCTOR:
5709 /* Don't reduce this in place; let gimplify_init_constructor work its
5710 magic. Buf if we're just elaborating this for side effects, just
5711 gimplify any element that has side-effects. */
5712 if (fallback == fb_none)
5714 unsigned HOST_WIDE_INT ix;
5715 constructor_elt *ce;
5716 tree temp = NULL_TREE;
5717 for (ix = 0;
5718 VEC_iterate (constructor_elt, CONSTRUCTOR_ELTS (*expr_p),
5719 ix, ce);
5720 ix++)
5721 if (TREE_SIDE_EFFECTS (ce->value))
5722 append_to_statement_list (ce->value, &temp);
5724 *expr_p = temp;
5725 ret = GS_OK;
5727 /* C99 code may assign to an array in a constructed
5728 structure or union, and this has undefined behavior only
5729 on execution, so create a temporary if an lvalue is
5730 required. */
5731 else if (fallback == fb_lvalue)
5733 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
5734 lang_hooks.mark_addressable (*expr_p);
5736 else
5737 ret = GS_ALL_DONE;
5738 break;
5740 /* The following are special cases that are not handled by the
5741 original GIMPLE grammar. */
5743 /* SAVE_EXPR nodes are converted into a GIMPLE identifier and
5744 eliminated. */
5745 case SAVE_EXPR:
5746 ret = gimplify_save_expr (expr_p, pre_p, post_p);
5747 break;
5749 case BIT_FIELD_REF:
5751 enum gimplify_status r0, r1, r2;
5753 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
5754 is_gimple_lvalue, fb_either);
5755 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
5756 is_gimple_val, fb_rvalue);
5757 r2 = gimplify_expr (&TREE_OPERAND (*expr_p, 2), pre_p, post_p,
5758 is_gimple_val, fb_rvalue);
5759 recalculate_side_effects (*expr_p);
5761 ret = MIN (r0, MIN (r1, r2));
5763 break;
5765 case NON_LVALUE_EXPR:
5766 /* This should have been stripped above. */
5767 gcc_unreachable ();
5769 case ASM_EXPR:
5770 ret = gimplify_asm_expr (expr_p, pre_p, post_p);
5771 break;
5773 case TRY_FINALLY_EXPR:
5774 case TRY_CATCH_EXPR:
5775 gimplify_to_stmt_list (&TREE_OPERAND (*expr_p, 0));
5776 gimplify_to_stmt_list (&TREE_OPERAND (*expr_p, 1));
5777 ret = GS_ALL_DONE;
5778 break;
5780 case CLEANUP_POINT_EXPR:
5781 ret = gimplify_cleanup_point_expr (expr_p, pre_p);
5782 break;
5784 case TARGET_EXPR:
5785 ret = gimplify_target_expr (expr_p, pre_p, post_p);
5786 break;
5788 case CATCH_EXPR:
5789 gimplify_to_stmt_list (&CATCH_BODY (*expr_p));
5790 ret = GS_ALL_DONE;
5791 break;
5793 case EH_FILTER_EXPR:
5794 gimplify_to_stmt_list (&EH_FILTER_FAILURE (*expr_p));
5795 ret = GS_ALL_DONE;
5796 break;
5798 case OBJ_TYPE_REF:
5800 enum gimplify_status r0, r1;
5801 r0 = gimplify_expr (&OBJ_TYPE_REF_OBJECT (*expr_p), pre_p, post_p,
5802 is_gimple_val, fb_rvalue);
5803 r1 = gimplify_expr (&OBJ_TYPE_REF_EXPR (*expr_p), pre_p, post_p,
5804 is_gimple_val, fb_rvalue);
5805 ret = MIN (r0, r1);
5807 break;
5809 case LABEL_DECL:
5810 /* We get here when taking the address of a label. We mark
5811 the label as "forced"; meaning it can never be removed and
5812 it is a potential target for any computed goto. */
5813 FORCED_LABEL (*expr_p) = 1;
5814 ret = GS_ALL_DONE;
5815 break;
5817 case STATEMENT_LIST:
5818 ret = gimplify_statement_list (expr_p, pre_p);
5819 break;
5821 case WITH_SIZE_EXPR:
5823 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
5824 post_p == &internal_post ? NULL : post_p,
5825 gimple_test_f, fallback);
5826 gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
5827 is_gimple_val, fb_rvalue);
5829 break;
5831 case VAR_DECL:
5832 case PARM_DECL:
5833 ret = gimplify_var_or_parm_decl (expr_p);
5834 break;
5836 case RESULT_DECL:
5837 /* When within an OpenMP context, notice uses of variables. */
5838 if (gimplify_omp_ctxp)
5839 omp_notice_variable (gimplify_omp_ctxp, *expr_p, true);
5840 ret = GS_ALL_DONE;
5841 break;
5843 case SSA_NAME:
5844 /* Allow callbacks into the gimplifier during optimization. */
5845 ret = GS_ALL_DONE;
5846 break;
5848 case OMP_PARALLEL:
5849 ret = gimplify_omp_parallel (expr_p, pre_p);
5850 break;
5852 case OMP_FOR:
5853 ret = gimplify_omp_for (expr_p, pre_p);
5854 break;
5856 case OMP_SECTIONS:
5857 case OMP_SINGLE:
5858 ret = gimplify_omp_workshare (expr_p, pre_p);
5859 break;
5861 case OMP_SECTION:
5862 case OMP_MASTER:
5863 case OMP_ORDERED:
5864 case OMP_CRITICAL:
5865 gimplify_to_stmt_list (&OMP_BODY (*expr_p));
5866 break;
5868 case OMP_ATOMIC:
5869 ret = gimplify_omp_atomic (expr_p, pre_p);
5870 break;
5872 case OMP_RETURN:
5873 case OMP_CONTINUE:
5874 ret = GS_ALL_DONE;
5875 break;
5877 default:
5878 switch (TREE_CODE_CLASS (TREE_CODE (*expr_p)))
5880 case tcc_comparison:
5881 /* Handle comparison of objects of non scalar mode aggregates
5882 with a call to memcmp. It would be nice to only have to do
5883 this for variable-sized objects, but then we'd have to allow
5884 the same nest of reference nodes we allow for MODIFY_EXPR and
5885 that's too complex.
5887 Compare scalar mode aggregates as scalar mode values. Using
5888 memcmp for them would be very inefficient at best, and is
5889 plain wrong if bitfields are involved. */
5892 tree type = TREE_TYPE (TREE_OPERAND (*expr_p, 1));
5894 if (!AGGREGATE_TYPE_P (type))
5895 goto expr_2;
5896 else if (TYPE_MODE (type) != BLKmode)
5897 ret = gimplify_scalar_mode_aggregate_compare (expr_p);
5898 else
5899 ret = gimplify_variable_sized_compare (expr_p);
5901 break;
5904 /* If *EXPR_P does not need to be special-cased, handle it
5905 according to its class. */
5906 case tcc_unary:
5907 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
5908 post_p, is_gimple_val, fb_rvalue);
5909 break;
5911 case tcc_binary:
5912 expr_2:
5914 enum gimplify_status r0, r1;
5916 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
5917 post_p, is_gimple_val, fb_rvalue);
5918 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
5919 post_p, is_gimple_val, fb_rvalue);
5921 ret = MIN (r0, r1);
5922 break;
5925 case tcc_declaration:
5926 case tcc_constant:
5927 ret = GS_ALL_DONE;
5928 goto dont_recalculate;
5930 default:
5931 gcc_assert (TREE_CODE (*expr_p) == TRUTH_AND_EXPR
5932 || TREE_CODE (*expr_p) == TRUTH_OR_EXPR
5933 || TREE_CODE (*expr_p) == TRUTH_XOR_EXPR);
5934 goto expr_2;
5937 recalculate_side_effects (*expr_p);
5938 dont_recalculate:
5939 break;
5942 /* If we replaced *expr_p, gimplify again. */
5943 if (ret == GS_OK && (*expr_p == NULL || *expr_p == save_expr))
5944 ret = GS_ALL_DONE;
5946 while (ret == GS_OK);
5948 /* If we encountered an error_mark somewhere nested inside, either
5949 stub out the statement or propagate the error back out. */
5950 if (ret == GS_ERROR)
5952 if (is_statement)
5953 *expr_p = NULL;
5954 goto out;
5957 /* This was only valid as a return value from the langhook, which
5958 we handled. Make sure it doesn't escape from any other context. */
5959 gcc_assert (ret != GS_UNHANDLED);
5961 if (fallback == fb_none && *expr_p && !is_gimple_stmt (*expr_p))
5963 /* We aren't looking for a value, and we don't have a valid
5964 statement. If it doesn't have side-effects, throw it away. */
5965 if (!TREE_SIDE_EFFECTS (*expr_p))
5966 *expr_p = NULL;
5967 else if (!TREE_THIS_VOLATILE (*expr_p))
5969 /* This is probably a _REF that contains something nested that
5970 has side effects. Recurse through the operands to find it. */
5971 enum tree_code code = TREE_CODE (*expr_p);
5973 switch (code)
5975 case COMPONENT_REF:
5976 case REALPART_EXPR:
5977 case IMAGPART_EXPR:
5978 case VIEW_CONVERT_EXPR:
5979 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
5980 gimple_test_f, fallback);
5981 break;
5983 case ARRAY_REF:
5984 case ARRAY_RANGE_REF:
5985 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
5986 gimple_test_f, fallback);
5987 gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
5988 gimple_test_f, fallback);
5989 break;
5991 default:
5992 /* Anything else with side-effects must be converted to
5993 a valid statement before we get here. */
5994 gcc_unreachable ();
5997 *expr_p = NULL;
5999 else if (COMPLETE_TYPE_P (TREE_TYPE (*expr_p))
6000 && TYPE_MODE (TREE_TYPE (*expr_p)) != BLKmode)
6002 /* Historically, the compiler has treated a bare reference
6003 to a non-BLKmode volatile lvalue as forcing a load. */
6004 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (*expr_p));
6005 /* Normally, we do not want to create a temporary for a
6006 TREE_ADDRESSABLE type because such a type should not be
6007 copied by bitwise-assignment. However, we make an
6008 exception here, as all we are doing here is ensuring that
6009 we read the bytes that make up the type. We use
6010 create_tmp_var_raw because create_tmp_var will abort when
6011 given a TREE_ADDRESSABLE type. */
6012 tree tmp = create_tmp_var_raw (type, "vol");
6013 gimple_add_tmp_var (tmp);
6014 *expr_p = build2 (GIMPLE_MODIFY_STMT, type, tmp, *expr_p);
6016 else
6017 /* We can't do anything useful with a volatile reference to
6018 an incomplete type, so just throw it away. Likewise for
6019 a BLKmode type, since any implicit inner load should
6020 already have been turned into an explicit one by the
6021 gimplification process. */
6022 *expr_p = NULL;
6025 /* If we are gimplifying at the statement level, we're done. Tack
6026 everything together and replace the original statement with the
6027 gimplified form. */
6028 if (fallback == fb_none || is_statement)
6030 if (internal_pre || internal_post)
6032 append_to_statement_list (*expr_p, &internal_pre);
6033 append_to_statement_list (internal_post, &internal_pre);
6034 annotate_all_with_locus (&internal_pre, input_location);
6035 *expr_p = internal_pre;
6037 else if (!*expr_p)
6039 else if (TREE_CODE (*expr_p) == STATEMENT_LIST)
6040 annotate_all_with_locus (expr_p, input_location);
6041 else
6042 annotate_one_with_locus (*expr_p, input_location);
6043 goto out;
6046 /* Otherwise we're gimplifying a subexpression, so the resulting value is
6047 interesting. */
6049 /* If it's sufficiently simple already, we're done. Unless we are
6050 handling some post-effects internally; if that's the case, we need to
6051 copy into a temp before adding the post-effects to the tree. */
6052 if (!internal_post && (*gimple_test_f) (*expr_p))
6053 goto out;
6055 /* Otherwise, we need to create a new temporary for the gimplified
6056 expression. */
6058 /* We can't return an lvalue if we have an internal postqueue. The
6059 object the lvalue refers to would (probably) be modified by the
6060 postqueue; we need to copy the value out first, which means an
6061 rvalue. */
6062 if ((fallback & fb_lvalue) && !internal_post
6063 && is_gimple_addressable (*expr_p))
6065 /* An lvalue will do. Take the address of the expression, store it
6066 in a temporary, and replace the expression with an INDIRECT_REF of
6067 that temporary. */
6068 tmp = build_fold_addr_expr (*expr_p);
6069 gimplify_expr (&tmp, pre_p, post_p, is_gimple_reg, fb_rvalue);
6070 *expr_p = build1 (INDIRECT_REF, TREE_TYPE (TREE_TYPE (tmp)), tmp);
6072 else if ((fallback & fb_rvalue) && is_gimple_formal_tmp_rhs (*expr_p))
6074 gcc_assert (!VOID_TYPE_P (TREE_TYPE (*expr_p)));
6076 /* An rvalue will do. Assign the gimplified expression into a new
6077 temporary TMP and replace the original expression with TMP. */
6079 if (internal_post || (fallback & fb_lvalue))
6080 /* The postqueue might change the value of the expression between
6081 the initialization and use of the temporary, so we can't use a
6082 formal temp. FIXME do we care? */
6083 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
6084 else
6085 *expr_p = get_formal_tmp_var (*expr_p, pre_p);
6087 if (TREE_CODE (*expr_p) != SSA_NAME)
6088 DECL_GIMPLE_FORMAL_TEMP_P (*expr_p) = 1;
6090 else
6092 #ifdef ENABLE_CHECKING
6093 if (!(fallback & fb_mayfail))
6095 fprintf (stderr, "gimplification failed:\n");
6096 print_generic_expr (stderr, *expr_p, 0);
6097 debug_tree (*expr_p);
6098 internal_error ("gimplification failed");
6100 #endif
6101 gcc_assert (fallback & fb_mayfail);
6102 /* If this is an asm statement, and the user asked for the
6103 impossible, don't die. Fail and let gimplify_asm_expr
6104 issue an error. */
6105 ret = GS_ERROR;
6106 goto out;
6109 /* Make sure the temporary matches our predicate. */
6110 gcc_assert ((*gimple_test_f) (*expr_p));
6112 if (internal_post)
6114 annotate_all_with_locus (&internal_post, input_location);
6115 append_to_statement_list (internal_post, pre_p);
6118 out:
6119 input_location = saved_location;
6120 return ret;
6123 /* Look through TYPE for variable-sized objects and gimplify each such
6124 size that we find. Add to LIST_P any statements generated. */
6126 void
6127 gimplify_type_sizes (tree type, tree *list_p)
6129 tree field, t;
6131 if (type == NULL || type == error_mark_node)
6132 return;
6134 /* We first do the main variant, then copy into any other variants. */
6135 type = TYPE_MAIN_VARIANT (type);
6137 /* Avoid infinite recursion. */
6138 if (TYPE_SIZES_GIMPLIFIED (type))
6139 return;
6141 TYPE_SIZES_GIMPLIFIED (type) = 1;
6143 switch (TREE_CODE (type))
6145 case INTEGER_TYPE:
6146 case ENUMERAL_TYPE:
6147 case BOOLEAN_TYPE:
6148 case REAL_TYPE:
6149 gimplify_one_sizepos (&TYPE_MIN_VALUE (type), list_p);
6150 gimplify_one_sizepos (&TYPE_MAX_VALUE (type), list_p);
6152 for (t = TYPE_NEXT_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
6154 TYPE_MIN_VALUE (t) = TYPE_MIN_VALUE (type);
6155 TYPE_MAX_VALUE (t) = TYPE_MAX_VALUE (type);
6157 break;
6159 case ARRAY_TYPE:
6160 /* These types may not have declarations, so handle them here. */
6161 gimplify_type_sizes (TREE_TYPE (type), list_p);
6162 gimplify_type_sizes (TYPE_DOMAIN (type), list_p);
6163 break;
6165 case RECORD_TYPE:
6166 case UNION_TYPE:
6167 case QUAL_UNION_TYPE:
6168 for (field = TYPE_FIELDS (type); field; field = TREE_CHAIN (field))
6169 if (TREE_CODE (field) == FIELD_DECL)
6171 gimplify_one_sizepos (&DECL_FIELD_OFFSET (field), list_p);
6172 gimplify_type_sizes (TREE_TYPE (field), list_p);
6174 break;
6176 case POINTER_TYPE:
6177 case REFERENCE_TYPE:
6178 /* We used to recurse on the pointed-to type here, which turned out to
6179 be incorrect because its definition might refer to variables not
6180 yet initialized at this point if a forward declaration is involved.
6182 It was actually useful for anonymous pointed-to types to ensure
6183 that the sizes evaluation dominates every possible later use of the
6184 values. Restricting to such types here would be safe since there
6185 is no possible forward declaration around, but would introduce an
6186 undesirable middle-end semantic to anonymity. We then defer to
6187 front-ends the responsibility of ensuring that the sizes are
6188 evaluated both early and late enough, e.g. by attaching artificial
6189 type declarations to the tree. */
6190 break;
6192 default:
6193 break;
6196 gimplify_one_sizepos (&TYPE_SIZE (type), list_p);
6197 gimplify_one_sizepos (&TYPE_SIZE_UNIT (type), list_p);
6199 for (t = TYPE_NEXT_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
6201 TYPE_SIZE (t) = TYPE_SIZE (type);
6202 TYPE_SIZE_UNIT (t) = TYPE_SIZE_UNIT (type);
6203 TYPE_SIZES_GIMPLIFIED (t) = 1;
6207 /* A subroutine of gimplify_type_sizes to make sure that *EXPR_P,
6208 a size or position, has had all of its SAVE_EXPRs evaluated.
6209 We add any required statements to STMT_P. */
6211 void
6212 gimplify_one_sizepos (tree *expr_p, tree *stmt_p)
6214 tree type, expr = *expr_p;
6216 /* We don't do anything if the value isn't there, is constant, or contains
6217 A PLACEHOLDER_EXPR. We also don't want to do anything if it's already
6218 a VAR_DECL. If it's a VAR_DECL from another function, the gimplifier
6219 will want to replace it with a new variable, but that will cause problems
6220 if this type is from outside the function. It's OK to have that here. */
6221 if (expr == NULL_TREE || TREE_CONSTANT (expr)
6222 || TREE_CODE (expr) == VAR_DECL
6223 || CONTAINS_PLACEHOLDER_P (expr))
6224 return;
6226 type = TREE_TYPE (expr);
6227 *expr_p = unshare_expr (expr);
6229 gimplify_expr (expr_p, stmt_p, NULL, is_gimple_val, fb_rvalue);
6230 expr = *expr_p;
6232 /* Verify that we've an exact type match with the original expression.
6233 In particular, we do not wish to drop a "sizetype" in favour of a
6234 type of similar dimensions. We don't want to pollute the generic
6235 type-stripping code with this knowledge because it doesn't matter
6236 for the bulk of GENERIC/GIMPLE. It only matters that TYPE_SIZE_UNIT
6237 and friends retain their "sizetype-ness". */
6238 if (TREE_TYPE (expr) != type
6239 && TREE_CODE (type) == INTEGER_TYPE
6240 && TYPE_IS_SIZETYPE (type))
6242 tree tmp;
6244 *expr_p = create_tmp_var (type, NULL);
6245 tmp = build1 (NOP_EXPR, type, expr);
6246 tmp = build2 (GIMPLE_MODIFY_STMT, type, *expr_p, tmp);
6247 if (EXPR_HAS_LOCATION (expr))
6248 SET_EXPR_LOCUS (tmp, EXPR_LOCUS (expr));
6249 else
6250 SET_EXPR_LOCATION (tmp, input_location);
6252 gimplify_and_add (tmp, stmt_p);
6256 #ifdef ENABLE_CHECKING
6257 /* Compare types A and B for a "close enough" match. */
6259 static bool
6260 cpt_same_type (tree a, tree b)
6262 if (lang_hooks.types_compatible_p (a, b))
6263 return true;
6265 /* ??? The C++ FE decomposes METHOD_TYPES to FUNCTION_TYPES and doesn't
6266 link them together. This routine is intended to catch type errors
6267 that will affect the optimizers, and the optimizers don't add new
6268 dereferences of function pointers, so ignore it. */
6269 if ((TREE_CODE (a) == FUNCTION_TYPE || TREE_CODE (a) == METHOD_TYPE)
6270 && (TREE_CODE (b) == FUNCTION_TYPE || TREE_CODE (b) == METHOD_TYPE))
6271 return true;
6273 /* ??? The C FE pushes type qualifiers after the fact into the type of
6274 the element from the type of the array. See build_unary_op's handling
6275 of ADDR_EXPR. This seems wrong -- if we were going to do this, we
6276 should have done it when creating the variable in the first place.
6277 Alternately, why aren't the two array types made variants? */
6278 if (TREE_CODE (a) == ARRAY_TYPE && TREE_CODE (b) == ARRAY_TYPE)
6279 return cpt_same_type (TREE_TYPE (a), TREE_TYPE (b));
6281 /* And because of those, we have to recurse down through pointers. */
6282 if (POINTER_TYPE_P (a) && POINTER_TYPE_P (b))
6283 return cpt_same_type (TREE_TYPE (a), TREE_TYPE (b));
6285 return false;
6288 /* Check for some cases of the front end missing cast expressions.
6289 The type of a dereference should correspond to the pointer type;
6290 similarly the type of an address should match its object. */
6292 static tree
6293 check_pointer_types_r (tree *tp, int *walk_subtrees ATTRIBUTE_UNUSED,
6294 void *data ATTRIBUTE_UNUSED)
6296 tree t = *tp;
6297 tree ptype, otype, dtype;
6299 switch (TREE_CODE (t))
6301 case INDIRECT_REF:
6302 case ARRAY_REF:
6303 otype = TREE_TYPE (t);
6304 ptype = TREE_TYPE (TREE_OPERAND (t, 0));
6305 dtype = TREE_TYPE (ptype);
6306 gcc_assert (cpt_same_type (otype, dtype));
6307 break;
6309 case ADDR_EXPR:
6310 ptype = TREE_TYPE (t);
6311 otype = TREE_TYPE (TREE_OPERAND (t, 0));
6312 dtype = TREE_TYPE (ptype);
6313 if (!cpt_same_type (otype, dtype))
6315 /* &array is allowed to produce a pointer to the element, rather than
6316 a pointer to the array type. We must allow this in order to
6317 properly represent assigning the address of an array in C into
6318 pointer to the element type. */
6319 gcc_assert (TREE_CODE (otype) == ARRAY_TYPE
6320 && POINTER_TYPE_P (ptype)
6321 && cpt_same_type (TREE_TYPE (otype), dtype));
6322 break;
6324 break;
6326 default:
6327 return NULL_TREE;
6331 return NULL_TREE;
6333 #endif
6335 /* Gimplify the body of statements pointed to by BODY_P. FNDECL is the
6336 function decl containing BODY. */
6338 void
6339 gimplify_body (tree *body_p, tree fndecl, bool do_parms)
6341 location_t saved_location = input_location;
6342 tree body, parm_stmts;
6344 timevar_push (TV_TREE_GIMPLIFY);
6346 gcc_assert (gimplify_ctxp == NULL);
6347 push_gimplify_context ();
6349 /* Unshare most shared trees in the body and in that of any nested functions.
6350 It would seem we don't have to do this for nested functions because
6351 they are supposed to be output and then the outer function gimplified
6352 first, but the g++ front end doesn't always do it that way. */
6353 unshare_body (body_p, fndecl);
6354 unvisit_body (body_p, fndecl);
6356 /* Make sure input_location isn't set to something wierd. */
6357 input_location = DECL_SOURCE_LOCATION (fndecl);
6359 /* Resolve callee-copies. This has to be done before processing
6360 the body so that DECL_VALUE_EXPR gets processed correctly. */
6361 parm_stmts = do_parms ? gimplify_parameters () : NULL;
6363 /* Gimplify the function's body. */
6364 gimplify_stmt (body_p);
6365 body = *body_p;
6367 if (!body)
6368 body = alloc_stmt_list ();
6369 else if (TREE_CODE (body) == STATEMENT_LIST)
6371 tree t = expr_only (*body_p);
6372 if (t)
6373 body = t;
6376 /* If there isn't an outer BIND_EXPR, add one. */
6377 if (TREE_CODE (body) != BIND_EXPR)
6379 tree b = build3 (BIND_EXPR, void_type_node, NULL_TREE,
6380 NULL_TREE, NULL_TREE);
6381 TREE_SIDE_EFFECTS (b) = 1;
6382 append_to_statement_list_force (body, &BIND_EXPR_BODY (b));
6383 body = b;
6386 /* If we had callee-copies statements, insert them at the beginning
6387 of the function. */
6388 if (parm_stmts)
6390 append_to_statement_list_force (BIND_EXPR_BODY (body), &parm_stmts);
6391 BIND_EXPR_BODY (body) = parm_stmts;
6394 /* Unshare again, in case gimplification was sloppy. */
6395 unshare_all_trees (body);
6397 *body_p = body;
6399 pop_gimplify_context (body);
6400 gcc_assert (gimplify_ctxp == NULL);
6402 #ifdef ENABLE_CHECKING
6403 walk_tree (body_p, check_pointer_types_r, NULL, NULL);
6404 #endif
6406 timevar_pop (TV_TREE_GIMPLIFY);
6407 input_location = saved_location;
6410 /* Entry point to the gimplification pass. FNDECL is the FUNCTION_DECL
6411 node for the function we want to gimplify. */
6413 void
6414 gimplify_function_tree (tree fndecl)
6416 tree oldfn, parm, ret;
6418 oldfn = current_function_decl;
6419 current_function_decl = fndecl;
6420 cfun = DECL_STRUCT_FUNCTION (fndecl);
6421 if (cfun == NULL)
6422 allocate_struct_function (fndecl);
6424 for (parm = DECL_ARGUMENTS (fndecl); parm ; parm = TREE_CHAIN (parm))
6426 /* Preliminarily mark non-addressed complex variables as eligible
6427 for promotion to gimple registers. We'll transform their uses
6428 as we find them. */
6429 if ((TREE_CODE (TREE_TYPE (parm)) == COMPLEX_TYPE
6430 || TREE_CODE (TREE_TYPE (parm)) == VECTOR_TYPE)
6431 && !TREE_THIS_VOLATILE (parm)
6432 && !needs_to_live_in_memory (parm))
6433 DECL_GIMPLE_REG_P (parm) = 1;
6436 ret = DECL_RESULT (fndecl);
6437 if ((TREE_CODE (TREE_TYPE (ret)) == COMPLEX_TYPE
6438 || TREE_CODE (TREE_TYPE (ret)) == VECTOR_TYPE)
6439 && !needs_to_live_in_memory (ret))
6440 DECL_GIMPLE_REG_P (ret) = 1;
6442 gimplify_body (&DECL_SAVED_TREE (fndecl), fndecl, true);
6444 /* If we're instrumenting function entry/exit, then prepend the call to
6445 the entry hook and wrap the whole function in a TRY_FINALLY_EXPR to
6446 catch the exit hook. */
6447 /* ??? Add some way to ignore exceptions for this TFE. */
6448 if (flag_instrument_function_entry_exit
6449 && ! DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (fndecl))
6451 tree tf, x, bind;
6453 tf = build2 (TRY_FINALLY_EXPR, void_type_node, NULL, NULL);
6454 TREE_SIDE_EFFECTS (tf) = 1;
6455 x = DECL_SAVED_TREE (fndecl);
6456 append_to_statement_list (x, &TREE_OPERAND (tf, 0));
6457 x = implicit_built_in_decls[BUILT_IN_PROFILE_FUNC_EXIT];
6458 x = build_function_call_expr (x, NULL);
6459 append_to_statement_list (x, &TREE_OPERAND (tf, 1));
6461 bind = build3 (BIND_EXPR, void_type_node, NULL, NULL, NULL);
6462 TREE_SIDE_EFFECTS (bind) = 1;
6463 x = implicit_built_in_decls[BUILT_IN_PROFILE_FUNC_ENTER];
6464 x = build_function_call_expr (x, NULL);
6465 append_to_statement_list (x, &BIND_EXPR_BODY (bind));
6466 append_to_statement_list (tf, &BIND_EXPR_BODY (bind));
6468 DECL_SAVED_TREE (fndecl) = bind;
6471 cfun->gimplified = true;
6472 current_function_decl = oldfn;
6473 cfun = oldfn ? DECL_STRUCT_FUNCTION (oldfn) : NULL;
6476 /* Expands EXPR to list of gimple statements STMTS. If SIMPLE is true,
6477 force the result to be either ssa_name or an invariant, otherwise
6478 just force it to be a rhs expression. If VAR is not NULL, make the
6479 base variable of the final destination be VAR if suitable. */
6481 tree
6482 force_gimple_operand (tree expr, tree *stmts, bool simple, tree var)
6484 tree t;
6485 enum gimplify_status ret;
6486 gimple_predicate gimple_test_f;
6488 *stmts = NULL_TREE;
6490 if (is_gimple_val (expr))
6491 return expr;
6493 gimple_test_f = simple ? is_gimple_val : is_gimple_reg_rhs;
6495 push_gimplify_context ();
6496 gimplify_ctxp->into_ssa = gimple_in_ssa_p (cfun);
6498 if (var)
6499 expr = build2 (GIMPLE_MODIFY_STMT, TREE_TYPE (var), var, expr);
6501 ret = gimplify_expr (&expr, stmts, NULL,
6502 gimple_test_f, fb_rvalue);
6503 gcc_assert (ret != GS_ERROR);
6505 if (gimple_referenced_vars (cfun))
6507 for (t = gimplify_ctxp->temps; t ; t = TREE_CHAIN (t))
6508 add_referenced_var (t);
6511 pop_gimplify_context (NULL);
6513 return expr;
6516 /* Invokes force_gimple_operand for EXPR with parameters SIMPLE_P and VAR. If
6517 some statements are produced, emits them before BSI. */
6519 tree
6520 force_gimple_operand_bsi (block_stmt_iterator *bsi, tree expr,
6521 bool simple_p, tree var)
6523 tree stmts;
6525 expr = force_gimple_operand (expr, &stmts, simple_p, var);
6526 if (stmts)
6527 bsi_insert_before (bsi, stmts, BSI_SAME_STMT);
6529 return expr;
6532 #include "gt-gimplify.h"