libgomp: Use pthread mutexes in the nvptx plugin.
[official-gcc.git] / gcc / gimplify.c
blob45bd5561cee883798f5633b731082f08b73fe30e
1 /* Tree lowering pass. This pass converts the GENERIC functions-as-trees
2 tree representation into the GIMPLE form.
3 Copyright (C) 2002-2015 Free Software Foundation, Inc.
4 Major work done by Sebastian Pop <s.pop@laposte.net>,
5 Diego Novillo <dnovillo@redhat.com> and Jason Merrill <jason@redhat.com>.
7 This file is part of GCC.
9 GCC is free software; you can redistribute it and/or modify it under
10 the terms of the GNU General Public License as published by the Free
11 Software Foundation; either version 3, or (at your option) any later
12 version.
14 GCC is distributed in the hope that it will be useful, but WITHOUT ANY
15 WARRANTY; without even the implied warranty of MERCHANTABILITY or
16 FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License
17 for more details.
19 You should have received a copy of the GNU General Public License
20 along with GCC; see the file COPYING3. If not see
21 <http://www.gnu.org/licenses/>. */
23 #include "config.h"
24 #include "system.h"
25 #include "coretypes.h"
26 #include "hash-set.h"
27 #include "machmode.h"
28 #include "vec.h"
29 #include "double-int.h"
30 #include "input.h"
31 #include "alias.h"
32 #include "symtab.h"
33 #include "options.h"
34 #include "wide-int.h"
35 #include "inchash.h"
36 #include "tree.h"
37 #include "fold-const.h"
38 #include "expr.h"
39 #include "predict.h"
40 #include "tm.h"
41 #include "hard-reg-set.h"
42 #include "input.h"
43 #include "function.h"
44 #include "basic-block.h"
45 #include "tree-ssa-alias.h"
46 #include "internal-fn.h"
47 #include "gimple-fold.h"
48 #include "tree-eh.h"
49 #include "gimple-expr.h"
50 #include "is-a.h"
51 #include "gimple.h"
52 #include "gimplify.h"
53 #include "gimple-iterator.h"
54 #include "stringpool.h"
55 #include "calls.h"
56 #include "varasm.h"
57 #include "stor-layout.h"
58 #include "stmt.h"
59 #include "print-tree.h"
60 #include "tree-iterator.h"
61 #include "tree-inline.h"
62 #include "tree-pretty-print.h"
63 #include "langhooks.h"
64 #include "bitmap.h"
65 #include "gimple-ssa.h"
66 #include "hash-map.h"
67 #include "plugin-api.h"
68 #include "ipa-ref.h"
69 #include "cgraph.h"
70 #include "tree-cfg.h"
71 #include "tree-ssanames.h"
72 #include "tree-ssa.h"
73 #include "diagnostic-core.h"
74 #include "target.h"
75 #include "splay-tree.h"
76 #include "omp-low.h"
77 #include "gimple-low.h"
78 #include "cilk.h"
80 #include "langhooks-def.h" /* FIXME: for lhd_set_decl_assembler_name */
81 #include "tree-pass.h" /* FIXME: only for PROP_gimple_any */
82 #include "builtins.h"
84 enum gimplify_omp_var_data
86 GOVD_SEEN = 1,
87 GOVD_EXPLICIT = 2,
88 GOVD_SHARED = 4,
89 GOVD_PRIVATE = 8,
90 GOVD_FIRSTPRIVATE = 16,
91 GOVD_LASTPRIVATE = 32,
92 GOVD_REDUCTION = 64,
93 GOVD_LOCAL = 128,
94 GOVD_MAP = 256,
95 GOVD_DEBUG_PRIVATE = 512,
96 GOVD_PRIVATE_OUTER_REF = 1024,
97 GOVD_LINEAR = 2048,
98 GOVD_ALIGNED = 4096,
100 /* Flag for GOVD_MAP: don't copy back. */
101 GOVD_MAP_TO_ONLY = 8192,
103 GOVD_DATA_SHARE_CLASS = (GOVD_SHARED | GOVD_PRIVATE | GOVD_FIRSTPRIVATE
104 | GOVD_LASTPRIVATE | GOVD_REDUCTION | GOVD_LINEAR
105 | GOVD_LOCAL)
109 enum omp_region_type
111 ORT_WORKSHARE = 0,
112 ORT_SIMD = 1,
113 ORT_PARALLEL = 2,
114 ORT_COMBINED_PARALLEL = 3,
115 ORT_TASK = 4,
116 ORT_UNTIED_TASK = 5,
117 ORT_TEAMS = 8,
118 /* Data region. */
119 ORT_TARGET_DATA = 16,
120 /* Data region with offloading. */
121 ORT_TARGET = 32
124 /* Gimplify hashtable helper. */
126 struct gimplify_hasher : typed_free_remove <elt_t>
128 typedef elt_t value_type;
129 typedef elt_t compare_type;
130 static inline hashval_t hash (const value_type *);
131 static inline bool equal (const value_type *, const compare_type *);
134 struct gimplify_ctx
136 struct gimplify_ctx *prev_context;
138 vec<gbind *> bind_expr_stack;
139 tree temps;
140 gimple_seq conditional_cleanups;
141 tree exit_label;
142 tree return_temp;
144 vec<tree> case_labels;
145 /* The formal temporary table. Should this be persistent? */
146 hash_table<gimplify_hasher> *temp_htab;
148 int conditions;
149 bool save_stack;
150 bool into_ssa;
151 bool allow_rhs_cond_expr;
152 bool in_cleanup_point_expr;
155 struct gimplify_omp_ctx
157 struct gimplify_omp_ctx *outer_context;
158 splay_tree variables;
159 hash_set<tree> *privatized_types;
160 location_t location;
161 enum omp_clause_default_kind default_kind;
162 enum omp_region_type region_type;
163 bool combined_loop;
164 bool distribute;
167 static struct gimplify_ctx *gimplify_ctxp;
168 static struct gimplify_omp_ctx *gimplify_omp_ctxp;
170 /* Forward declaration. */
171 static enum gimplify_status gimplify_compound_expr (tree *, gimple_seq *, bool);
173 /* Shorter alias name for the above function for use in gimplify.c
174 only. */
176 static inline void
177 gimplify_seq_add_stmt (gimple_seq *seq_p, gimple gs)
179 gimple_seq_add_stmt_without_update (seq_p, gs);
182 /* Append sequence SRC to the end of sequence *DST_P. If *DST_P is
183 NULL, a new sequence is allocated. This function is
184 similar to gimple_seq_add_seq, but does not scan the operands.
185 During gimplification, we need to manipulate statement sequences
186 before the def/use vectors have been constructed. */
188 static void
189 gimplify_seq_add_seq (gimple_seq *dst_p, gimple_seq src)
191 gimple_stmt_iterator si;
193 if (src == NULL)
194 return;
196 si = gsi_last (*dst_p);
197 gsi_insert_seq_after_without_update (&si, src, GSI_NEW_STMT);
201 /* Pointer to a list of allocated gimplify_ctx structs to be used for pushing
202 and popping gimplify contexts. */
204 static struct gimplify_ctx *ctx_pool = NULL;
206 /* Return a gimplify context struct from the pool. */
208 static inline struct gimplify_ctx *
209 ctx_alloc (void)
211 struct gimplify_ctx * c = ctx_pool;
213 if (c)
214 ctx_pool = c->prev_context;
215 else
216 c = XNEW (struct gimplify_ctx);
218 memset (c, '\0', sizeof (*c));
219 return c;
222 /* Put gimplify context C back into the pool. */
224 static inline void
225 ctx_free (struct gimplify_ctx *c)
227 c->prev_context = ctx_pool;
228 ctx_pool = c;
231 /* Free allocated ctx stack memory. */
233 void
234 free_gimplify_stack (void)
236 struct gimplify_ctx *c;
238 while ((c = ctx_pool))
240 ctx_pool = c->prev_context;
241 free (c);
246 /* Set up a context for the gimplifier. */
248 void
249 push_gimplify_context (bool in_ssa, bool rhs_cond_ok)
251 struct gimplify_ctx *c = ctx_alloc ();
253 c->prev_context = gimplify_ctxp;
254 gimplify_ctxp = c;
255 gimplify_ctxp->into_ssa = in_ssa;
256 gimplify_ctxp->allow_rhs_cond_expr = rhs_cond_ok;
259 /* Tear down a context for the gimplifier. If BODY is non-null, then
260 put the temporaries into the outer BIND_EXPR. Otherwise, put them
261 in the local_decls.
263 BODY is not a sequence, but the first tuple in a sequence. */
265 void
266 pop_gimplify_context (gimple body)
268 struct gimplify_ctx *c = gimplify_ctxp;
270 gcc_assert (c
271 && (!c->bind_expr_stack.exists ()
272 || c->bind_expr_stack.is_empty ()));
273 c->bind_expr_stack.release ();
274 gimplify_ctxp = c->prev_context;
276 if (body)
277 declare_vars (c->temps, body, false);
278 else
279 record_vars (c->temps);
281 delete c->temp_htab;
282 c->temp_htab = NULL;
283 ctx_free (c);
286 /* Push a GIMPLE_BIND tuple onto the stack of bindings. */
288 static void
289 gimple_push_bind_expr (gbind *bind_stmt)
291 gimplify_ctxp->bind_expr_stack.reserve (8);
292 gimplify_ctxp->bind_expr_stack.safe_push (bind_stmt);
295 /* Pop the first element off the stack of bindings. */
297 static void
298 gimple_pop_bind_expr (void)
300 gimplify_ctxp->bind_expr_stack.pop ();
303 /* Return the first element of the stack of bindings. */
305 gbind *
306 gimple_current_bind_expr (void)
308 return gimplify_ctxp->bind_expr_stack.last ();
311 /* Return the stack of bindings created during gimplification. */
313 vec<gbind *>
314 gimple_bind_expr_stack (void)
316 return gimplify_ctxp->bind_expr_stack;
319 /* Return true iff there is a COND_EXPR between us and the innermost
320 CLEANUP_POINT_EXPR. This info is used by gimple_push_cleanup. */
322 static bool
323 gimple_conditional_context (void)
325 return gimplify_ctxp->conditions > 0;
328 /* Note that we've entered a COND_EXPR. */
330 static void
331 gimple_push_condition (void)
333 #ifdef ENABLE_GIMPLE_CHECKING
334 if (gimplify_ctxp->conditions == 0)
335 gcc_assert (gimple_seq_empty_p (gimplify_ctxp->conditional_cleanups));
336 #endif
337 ++(gimplify_ctxp->conditions);
340 /* Note that we've left a COND_EXPR. If we're back at unconditional scope
341 now, add any conditional cleanups we've seen to the prequeue. */
343 static void
344 gimple_pop_condition (gimple_seq *pre_p)
346 int conds = --(gimplify_ctxp->conditions);
348 gcc_assert (conds >= 0);
349 if (conds == 0)
351 gimplify_seq_add_seq (pre_p, gimplify_ctxp->conditional_cleanups);
352 gimplify_ctxp->conditional_cleanups = NULL;
356 /* A stable comparison routine for use with splay trees and DECLs. */
358 static int
359 splay_tree_compare_decl_uid (splay_tree_key xa, splay_tree_key xb)
361 tree a = (tree) xa;
362 tree b = (tree) xb;
364 return DECL_UID (a) - DECL_UID (b);
367 /* Create a new omp construct that deals with variable remapping. */
369 static struct gimplify_omp_ctx *
370 new_omp_context (enum omp_region_type region_type)
372 struct gimplify_omp_ctx *c;
374 c = XCNEW (struct gimplify_omp_ctx);
375 c->outer_context = gimplify_omp_ctxp;
376 c->variables = splay_tree_new (splay_tree_compare_decl_uid, 0, 0);
377 c->privatized_types = new hash_set<tree>;
378 c->location = input_location;
379 c->region_type = region_type;
380 if ((region_type & ORT_TASK) == 0)
381 c->default_kind = OMP_CLAUSE_DEFAULT_SHARED;
382 else
383 c->default_kind = OMP_CLAUSE_DEFAULT_UNSPECIFIED;
385 return c;
388 /* Destroy an omp construct that deals with variable remapping. */
390 static void
391 delete_omp_context (struct gimplify_omp_ctx *c)
393 splay_tree_delete (c->variables);
394 delete c->privatized_types;
395 XDELETE (c);
398 static void omp_add_variable (struct gimplify_omp_ctx *, tree, unsigned int);
399 static bool omp_notice_variable (struct gimplify_omp_ctx *, tree, bool);
401 /* Both gimplify the statement T and append it to *SEQ_P. This function
402 behaves exactly as gimplify_stmt, but you don't have to pass T as a
403 reference. */
405 void
406 gimplify_and_add (tree t, gimple_seq *seq_p)
408 gimplify_stmt (&t, seq_p);
411 /* Gimplify statement T into sequence *SEQ_P, and return the first
412 tuple in the sequence of generated tuples for this statement.
413 Return NULL if gimplifying T produced no tuples. */
415 static gimple
416 gimplify_and_return_first (tree t, gimple_seq *seq_p)
418 gimple_stmt_iterator last = gsi_last (*seq_p);
420 gimplify_and_add (t, seq_p);
422 if (!gsi_end_p (last))
424 gsi_next (&last);
425 return gsi_stmt (last);
427 else
428 return gimple_seq_first_stmt (*seq_p);
431 /* Returns true iff T is a valid RHS for an assignment to an un-renamed
432 LHS, or for a call argument. */
434 static bool
435 is_gimple_mem_rhs (tree t)
437 /* If we're dealing with a renamable type, either source or dest must be
438 a renamed variable. */
439 if (is_gimple_reg_type (TREE_TYPE (t)))
440 return is_gimple_val (t);
441 else
442 return is_gimple_val (t) || is_gimple_lvalue (t);
445 /* Return true if T is a CALL_EXPR or an expression that can be
446 assigned to a temporary. Note that this predicate should only be
447 used during gimplification. See the rationale for this in
448 gimplify_modify_expr. */
450 static bool
451 is_gimple_reg_rhs_or_call (tree t)
453 return (get_gimple_rhs_class (TREE_CODE (t)) != GIMPLE_INVALID_RHS
454 || TREE_CODE (t) == CALL_EXPR);
457 /* Return true if T is a valid memory RHS or a CALL_EXPR. Note that
458 this predicate should only be used during gimplification. See the
459 rationale for this in gimplify_modify_expr. */
461 static bool
462 is_gimple_mem_rhs_or_call (tree t)
464 /* If we're dealing with a renamable type, either source or dest must be
465 a renamed variable. */
466 if (is_gimple_reg_type (TREE_TYPE (t)))
467 return is_gimple_val (t);
468 else
469 return (is_gimple_val (t) || is_gimple_lvalue (t)
470 || TREE_CODE (t) == CALL_EXPR);
473 /* Create a temporary with a name derived from VAL. Subroutine of
474 lookup_tmp_var; nobody else should call this function. */
476 static inline tree
477 create_tmp_from_val (tree val)
479 /* Drop all qualifiers and address-space information from the value type. */
480 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (val));
481 tree var = create_tmp_var (type, get_name (val));
482 if (TREE_CODE (TREE_TYPE (var)) == COMPLEX_TYPE
483 || TREE_CODE (TREE_TYPE (var)) == VECTOR_TYPE)
484 DECL_GIMPLE_REG_P (var) = 1;
485 return var;
488 /* Create a temporary to hold the value of VAL. If IS_FORMAL, try to reuse
489 an existing expression temporary. */
491 static tree
492 lookup_tmp_var (tree val, bool is_formal)
494 tree ret;
496 /* If not optimizing, never really reuse a temporary. local-alloc
497 won't allocate any variable that is used in more than one basic
498 block, which means it will go into memory, causing much extra
499 work in reload and final and poorer code generation, outweighing
500 the extra memory allocation here. */
501 if (!optimize || !is_formal || TREE_SIDE_EFFECTS (val))
502 ret = create_tmp_from_val (val);
503 else
505 elt_t elt, *elt_p;
506 elt_t **slot;
508 elt.val = val;
509 if (!gimplify_ctxp->temp_htab)
510 gimplify_ctxp->temp_htab = new hash_table<gimplify_hasher> (1000);
511 slot = gimplify_ctxp->temp_htab->find_slot (&elt, INSERT);
512 if (*slot == NULL)
514 elt_p = XNEW (elt_t);
515 elt_p->val = val;
516 elt_p->temp = ret = create_tmp_from_val (val);
517 *slot = elt_p;
519 else
521 elt_p = *slot;
522 ret = elt_p->temp;
526 return ret;
529 /* Helper for get_formal_tmp_var and get_initialized_tmp_var. */
531 static tree
532 internal_get_tmp_var (tree val, gimple_seq *pre_p, gimple_seq *post_p,
533 bool is_formal)
535 tree t, mod;
537 /* Notice that we explicitly allow VAL to be a CALL_EXPR so that we
538 can create an INIT_EXPR and convert it into a GIMPLE_CALL below. */
539 gimplify_expr (&val, pre_p, post_p, is_gimple_reg_rhs_or_call,
540 fb_rvalue);
542 if (gimplify_ctxp->into_ssa
543 && is_gimple_reg_type (TREE_TYPE (val)))
544 t = make_ssa_name (TYPE_MAIN_VARIANT (TREE_TYPE (val)));
545 else
546 t = lookup_tmp_var (val, is_formal);
548 mod = build2 (INIT_EXPR, TREE_TYPE (t), t, unshare_expr (val));
550 SET_EXPR_LOCATION (mod, EXPR_LOC_OR_LOC (val, input_location));
552 /* gimplify_modify_expr might want to reduce this further. */
553 gimplify_and_add (mod, pre_p);
554 ggc_free (mod);
556 return t;
559 /* Return a formal temporary variable initialized with VAL. PRE_P is as
560 in gimplify_expr. Only use this function if:
562 1) The value of the unfactored expression represented by VAL will not
563 change between the initialization and use of the temporary, and
564 2) The temporary will not be otherwise modified.
566 For instance, #1 means that this is inappropriate for SAVE_EXPR temps,
567 and #2 means it is inappropriate for && temps.
569 For other cases, use get_initialized_tmp_var instead. */
571 tree
572 get_formal_tmp_var (tree val, gimple_seq *pre_p)
574 return internal_get_tmp_var (val, pre_p, NULL, true);
577 /* Return a temporary variable initialized with VAL. PRE_P and POST_P
578 are as in gimplify_expr. */
580 tree
581 get_initialized_tmp_var (tree val, gimple_seq *pre_p, gimple_seq *post_p)
583 return internal_get_tmp_var (val, pre_p, post_p, false);
586 /* Declare all the variables in VARS in SCOPE. If DEBUG_INFO is true,
587 generate debug info for them; otherwise don't. */
589 void
590 declare_vars (tree vars, gimple gs, bool debug_info)
592 tree last = vars;
593 if (last)
595 tree temps, block;
597 gbind *scope = as_a <gbind *> (gs);
599 temps = nreverse (last);
601 block = gimple_bind_block (scope);
602 gcc_assert (!block || TREE_CODE (block) == BLOCK);
603 if (!block || !debug_info)
605 DECL_CHAIN (last) = gimple_bind_vars (scope);
606 gimple_bind_set_vars (scope, temps);
608 else
610 /* We need to attach the nodes both to the BIND_EXPR and to its
611 associated BLOCK for debugging purposes. The key point here
612 is that the BLOCK_VARS of the BIND_EXPR_BLOCK of a BIND_EXPR
613 is a subchain of the BIND_EXPR_VARS of the BIND_EXPR. */
614 if (BLOCK_VARS (block))
615 BLOCK_VARS (block) = chainon (BLOCK_VARS (block), temps);
616 else
618 gimple_bind_set_vars (scope,
619 chainon (gimple_bind_vars (scope), temps));
620 BLOCK_VARS (block) = temps;
626 /* For VAR a VAR_DECL of variable size, try to find a constant upper bound
627 for the size and adjust DECL_SIZE/DECL_SIZE_UNIT accordingly. Abort if
628 no such upper bound can be obtained. */
630 static void
631 force_constant_size (tree var)
633 /* The only attempt we make is by querying the maximum size of objects
634 of the variable's type. */
636 HOST_WIDE_INT max_size;
638 gcc_assert (TREE_CODE (var) == VAR_DECL);
640 max_size = max_int_size_in_bytes (TREE_TYPE (var));
642 gcc_assert (max_size >= 0);
644 DECL_SIZE_UNIT (var)
645 = build_int_cst (TREE_TYPE (DECL_SIZE_UNIT (var)), max_size);
646 DECL_SIZE (var)
647 = build_int_cst (TREE_TYPE (DECL_SIZE (var)), max_size * BITS_PER_UNIT);
650 /* Push the temporary variable TMP into the current binding. */
652 void
653 gimple_add_tmp_var_fn (struct function *fn, tree tmp)
655 gcc_assert (!DECL_CHAIN (tmp) && !DECL_SEEN_IN_BIND_EXPR_P (tmp));
657 /* Later processing assumes that the object size is constant, which might
658 not be true at this point. Force the use of a constant upper bound in
659 this case. */
660 if (!tree_fits_uhwi_p (DECL_SIZE_UNIT (tmp)))
661 force_constant_size (tmp);
663 DECL_CONTEXT (tmp) = fn->decl;
664 DECL_SEEN_IN_BIND_EXPR_P (tmp) = 1;
666 record_vars_into (tmp, fn->decl);
669 /* Push the temporary variable TMP into the current binding. */
671 void
672 gimple_add_tmp_var (tree tmp)
674 gcc_assert (!DECL_CHAIN (tmp) && !DECL_SEEN_IN_BIND_EXPR_P (tmp));
676 /* Later processing assumes that the object size is constant, which might
677 not be true at this point. Force the use of a constant upper bound in
678 this case. */
679 if (!tree_fits_uhwi_p (DECL_SIZE_UNIT (tmp)))
680 force_constant_size (tmp);
682 DECL_CONTEXT (tmp) = current_function_decl;
683 DECL_SEEN_IN_BIND_EXPR_P (tmp) = 1;
685 if (gimplify_ctxp)
687 DECL_CHAIN (tmp) = gimplify_ctxp->temps;
688 gimplify_ctxp->temps = tmp;
690 /* Mark temporaries local within the nearest enclosing parallel. */
691 if (gimplify_omp_ctxp)
693 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
694 while (ctx
695 && (ctx->region_type == ORT_WORKSHARE
696 || ctx->region_type == ORT_SIMD))
697 ctx = ctx->outer_context;
698 if (ctx)
699 omp_add_variable (ctx, tmp, GOVD_LOCAL | GOVD_SEEN);
702 else if (cfun)
703 record_vars (tmp);
704 else
706 gimple_seq body_seq;
708 /* This case is for nested functions. We need to expose the locals
709 they create. */
710 body_seq = gimple_body (current_function_decl);
711 declare_vars (tmp, gimple_seq_first_stmt (body_seq), false);
717 /* This page contains routines to unshare tree nodes, i.e. to duplicate tree
718 nodes that are referenced more than once in GENERIC functions. This is
719 necessary because gimplification (translation into GIMPLE) is performed
720 by modifying tree nodes in-place, so gimplication of a shared node in a
721 first context could generate an invalid GIMPLE form in a second context.
723 This is achieved with a simple mark/copy/unmark algorithm that walks the
724 GENERIC representation top-down, marks nodes with TREE_VISITED the first
725 time it encounters them, duplicates them if they already have TREE_VISITED
726 set, and finally removes the TREE_VISITED marks it has set.
728 The algorithm works only at the function level, i.e. it generates a GENERIC
729 representation of a function with no nodes shared within the function when
730 passed a GENERIC function (except for nodes that are allowed to be shared).
732 At the global level, it is also necessary to unshare tree nodes that are
733 referenced in more than one function, for the same aforementioned reason.
734 This requires some cooperation from the front-end. There are 2 strategies:
736 1. Manual unsharing. The front-end needs to call unshare_expr on every
737 expression that might end up being shared across functions.
739 2. Deep unsharing. This is an extension of regular unsharing. Instead
740 of calling unshare_expr on expressions that might be shared across
741 functions, the front-end pre-marks them with TREE_VISITED. This will
742 ensure that they are unshared on the first reference within functions
743 when the regular unsharing algorithm runs. The counterpart is that
744 this algorithm must look deeper than for manual unsharing, which is
745 specified by LANG_HOOKS_DEEP_UNSHARING.
747 If there are only few specific cases of node sharing across functions, it is
748 probably easier for a front-end to unshare the expressions manually. On the
749 contrary, if the expressions generated at the global level are as widespread
750 as expressions generated within functions, deep unsharing is very likely the
751 way to go. */
753 /* Similar to copy_tree_r but do not copy SAVE_EXPR or TARGET_EXPR nodes.
754 These nodes model computations that must be done once. If we were to
755 unshare something like SAVE_EXPR(i++), the gimplification process would
756 create wrong code. However, if DATA is non-null, it must hold a pointer
757 set that is used to unshare the subtrees of these nodes. */
759 static tree
760 mostly_copy_tree_r (tree *tp, int *walk_subtrees, void *data)
762 tree t = *tp;
763 enum tree_code code = TREE_CODE (t);
765 /* Do not copy SAVE_EXPR, TARGET_EXPR or BIND_EXPR nodes themselves, but
766 copy their subtrees if we can make sure to do it only once. */
767 if (code == SAVE_EXPR || code == TARGET_EXPR || code == BIND_EXPR)
769 if (data && !((hash_set<tree> *)data)->add (t))
771 else
772 *walk_subtrees = 0;
775 /* Stop at types, decls, constants like copy_tree_r. */
776 else if (TREE_CODE_CLASS (code) == tcc_type
777 || TREE_CODE_CLASS (code) == tcc_declaration
778 || TREE_CODE_CLASS (code) == tcc_constant
779 /* We can't do anything sensible with a BLOCK used as an
780 expression, but we also can't just die when we see it
781 because of non-expression uses. So we avert our eyes
782 and cross our fingers. Silly Java. */
783 || code == BLOCK)
784 *walk_subtrees = 0;
786 /* Cope with the statement expression extension. */
787 else if (code == STATEMENT_LIST)
790 /* Leave the bulk of the work to copy_tree_r itself. */
791 else
792 copy_tree_r (tp, walk_subtrees, NULL);
794 return NULL_TREE;
797 /* Callback for walk_tree to unshare most of the shared trees rooted at *TP.
798 If *TP has been visited already, then *TP is deeply copied by calling
799 mostly_copy_tree_r. DATA is passed to mostly_copy_tree_r unmodified. */
801 static tree
802 copy_if_shared_r (tree *tp, int *walk_subtrees, void *data)
804 tree t = *tp;
805 enum tree_code code = TREE_CODE (t);
807 /* Skip types, decls, and constants. But we do want to look at their
808 types and the bounds of types. Mark them as visited so we properly
809 unmark their subtrees on the unmark pass. If we've already seen them,
810 don't look down further. */
811 if (TREE_CODE_CLASS (code) == tcc_type
812 || TREE_CODE_CLASS (code) == tcc_declaration
813 || TREE_CODE_CLASS (code) == tcc_constant)
815 if (TREE_VISITED (t))
816 *walk_subtrees = 0;
817 else
818 TREE_VISITED (t) = 1;
821 /* If this node has been visited already, unshare it and don't look
822 any deeper. */
823 else if (TREE_VISITED (t))
825 walk_tree (tp, mostly_copy_tree_r, data, NULL);
826 *walk_subtrees = 0;
829 /* Otherwise, mark the node as visited and keep looking. */
830 else
831 TREE_VISITED (t) = 1;
833 return NULL_TREE;
836 /* Unshare most of the shared trees rooted at *TP. DATA is passed to the
837 copy_if_shared_r callback unmodified. */
839 static inline void
840 copy_if_shared (tree *tp, void *data)
842 walk_tree (tp, copy_if_shared_r, data, NULL);
845 /* Unshare all the trees in the body of FNDECL, as well as in the bodies of
846 any nested functions. */
848 static void
849 unshare_body (tree fndecl)
851 struct cgraph_node *cgn = cgraph_node::get (fndecl);
852 /* If the language requires deep unsharing, we need a pointer set to make
853 sure we don't repeatedly unshare subtrees of unshareable nodes. */
854 hash_set<tree> *visited
855 = lang_hooks.deep_unsharing ? new hash_set<tree> : NULL;
857 copy_if_shared (&DECL_SAVED_TREE (fndecl), visited);
858 copy_if_shared (&DECL_SIZE (DECL_RESULT (fndecl)), visited);
859 copy_if_shared (&DECL_SIZE_UNIT (DECL_RESULT (fndecl)), visited);
861 delete visited;
863 if (cgn)
864 for (cgn = cgn->nested; cgn; cgn = cgn->next_nested)
865 unshare_body (cgn->decl);
868 /* Callback for walk_tree to unmark the visited trees rooted at *TP.
869 Subtrees are walked until the first unvisited node is encountered. */
871 static tree
872 unmark_visited_r (tree *tp, int *walk_subtrees, void *data ATTRIBUTE_UNUSED)
874 tree t = *tp;
876 /* If this node has been visited, unmark it and keep looking. */
877 if (TREE_VISITED (t))
878 TREE_VISITED (t) = 0;
880 /* Otherwise, don't look any deeper. */
881 else
882 *walk_subtrees = 0;
884 return NULL_TREE;
887 /* Unmark the visited trees rooted at *TP. */
889 static inline void
890 unmark_visited (tree *tp)
892 walk_tree (tp, unmark_visited_r, NULL, NULL);
895 /* Likewise, but mark all trees as not visited. */
897 static void
898 unvisit_body (tree fndecl)
900 struct cgraph_node *cgn = cgraph_node::get (fndecl);
902 unmark_visited (&DECL_SAVED_TREE (fndecl));
903 unmark_visited (&DECL_SIZE (DECL_RESULT (fndecl)));
904 unmark_visited (&DECL_SIZE_UNIT (DECL_RESULT (fndecl)));
906 if (cgn)
907 for (cgn = cgn->nested; cgn; cgn = cgn->next_nested)
908 unvisit_body (cgn->decl);
911 /* Unconditionally make an unshared copy of EXPR. This is used when using
912 stored expressions which span multiple functions, such as BINFO_VTABLE,
913 as the normal unsharing process can't tell that they're shared. */
915 tree
916 unshare_expr (tree expr)
918 walk_tree (&expr, mostly_copy_tree_r, NULL, NULL);
919 return expr;
922 /* Worker for unshare_expr_without_location. */
924 static tree
925 prune_expr_location (tree *tp, int *walk_subtrees, void *)
927 if (EXPR_P (*tp))
928 SET_EXPR_LOCATION (*tp, UNKNOWN_LOCATION);
929 else
930 *walk_subtrees = 0;
931 return NULL_TREE;
934 /* Similar to unshare_expr but also prune all expression locations
935 from EXPR. */
937 tree
938 unshare_expr_without_location (tree expr)
940 walk_tree (&expr, mostly_copy_tree_r, NULL, NULL);
941 if (EXPR_P (expr))
942 walk_tree (&expr, prune_expr_location, NULL, NULL);
943 return expr;
946 /* WRAPPER is a code such as BIND_EXPR or CLEANUP_POINT_EXPR which can both
947 contain statements and have a value. Assign its value to a temporary
948 and give it void_type_node. Return the temporary, or NULL_TREE if
949 WRAPPER was already void. */
951 tree
952 voidify_wrapper_expr (tree wrapper, tree temp)
954 tree type = TREE_TYPE (wrapper);
955 if (type && !VOID_TYPE_P (type))
957 tree *p;
959 /* Set p to point to the body of the wrapper. Loop until we find
960 something that isn't a wrapper. */
961 for (p = &wrapper; p && *p; )
963 switch (TREE_CODE (*p))
965 case BIND_EXPR:
966 TREE_SIDE_EFFECTS (*p) = 1;
967 TREE_TYPE (*p) = void_type_node;
968 /* For a BIND_EXPR, the body is operand 1. */
969 p = &BIND_EXPR_BODY (*p);
970 break;
972 case CLEANUP_POINT_EXPR:
973 case TRY_FINALLY_EXPR:
974 case TRY_CATCH_EXPR:
975 TREE_SIDE_EFFECTS (*p) = 1;
976 TREE_TYPE (*p) = void_type_node;
977 p = &TREE_OPERAND (*p, 0);
978 break;
980 case STATEMENT_LIST:
982 tree_stmt_iterator i = tsi_last (*p);
983 TREE_SIDE_EFFECTS (*p) = 1;
984 TREE_TYPE (*p) = void_type_node;
985 p = tsi_end_p (i) ? NULL : tsi_stmt_ptr (i);
987 break;
989 case COMPOUND_EXPR:
990 /* Advance to the last statement. Set all container types to
991 void. */
992 for (; TREE_CODE (*p) == COMPOUND_EXPR; p = &TREE_OPERAND (*p, 1))
994 TREE_SIDE_EFFECTS (*p) = 1;
995 TREE_TYPE (*p) = void_type_node;
997 break;
999 case TRANSACTION_EXPR:
1000 TREE_SIDE_EFFECTS (*p) = 1;
1001 TREE_TYPE (*p) = void_type_node;
1002 p = &TRANSACTION_EXPR_BODY (*p);
1003 break;
1005 default:
1006 /* Assume that any tree upon which voidify_wrapper_expr is
1007 directly called is a wrapper, and that its body is op0. */
1008 if (p == &wrapper)
1010 TREE_SIDE_EFFECTS (*p) = 1;
1011 TREE_TYPE (*p) = void_type_node;
1012 p = &TREE_OPERAND (*p, 0);
1013 break;
1015 goto out;
1019 out:
1020 if (p == NULL || IS_EMPTY_STMT (*p))
1021 temp = NULL_TREE;
1022 else if (temp)
1024 /* The wrapper is on the RHS of an assignment that we're pushing
1025 down. */
1026 gcc_assert (TREE_CODE (temp) == INIT_EXPR
1027 || TREE_CODE (temp) == MODIFY_EXPR);
1028 TREE_OPERAND (temp, 1) = *p;
1029 *p = temp;
1031 else
1033 temp = create_tmp_var (type, "retval");
1034 *p = build2 (INIT_EXPR, type, temp, *p);
1037 return temp;
1040 return NULL_TREE;
1043 /* Prepare calls to builtins to SAVE and RESTORE the stack as well as
1044 a temporary through which they communicate. */
1046 static void
1047 build_stack_save_restore (gcall **save, gcall **restore)
1049 tree tmp_var;
1051 *save = gimple_build_call (builtin_decl_implicit (BUILT_IN_STACK_SAVE), 0);
1052 tmp_var = create_tmp_var (ptr_type_node, "saved_stack");
1053 gimple_call_set_lhs (*save, tmp_var);
1055 *restore
1056 = gimple_build_call (builtin_decl_implicit (BUILT_IN_STACK_RESTORE),
1057 1, tmp_var);
1060 /* Gimplify a BIND_EXPR. Just voidify and recurse. */
1062 static enum gimplify_status
1063 gimplify_bind_expr (tree *expr_p, gimple_seq *pre_p)
1065 tree bind_expr = *expr_p;
1066 bool old_save_stack = gimplify_ctxp->save_stack;
1067 tree t;
1068 gbind *bind_stmt;
1069 gimple_seq body, cleanup;
1070 gcall *stack_save;
1071 location_t start_locus = 0, end_locus = 0;
1073 tree temp = voidify_wrapper_expr (bind_expr, NULL);
1075 /* Mark variables seen in this bind expr. */
1076 for (t = BIND_EXPR_VARS (bind_expr); t ; t = DECL_CHAIN (t))
1078 if (TREE_CODE (t) == VAR_DECL)
1080 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
1082 /* Mark variable as local. */
1083 if (ctx && !DECL_EXTERNAL (t)
1084 && (! DECL_SEEN_IN_BIND_EXPR_P (t)
1085 || splay_tree_lookup (ctx->variables,
1086 (splay_tree_key) t) == NULL))
1088 if (ctx->region_type == ORT_SIMD
1089 && TREE_ADDRESSABLE (t)
1090 && !TREE_STATIC (t))
1091 omp_add_variable (ctx, t, GOVD_PRIVATE | GOVD_SEEN);
1092 else
1093 omp_add_variable (ctx, t, GOVD_LOCAL | GOVD_SEEN);
1096 DECL_SEEN_IN_BIND_EXPR_P (t) = 1;
1098 if (DECL_HARD_REGISTER (t) && !is_global_var (t) && cfun)
1099 cfun->has_local_explicit_reg_vars = true;
1102 /* Preliminarily mark non-addressed complex variables as eligible
1103 for promotion to gimple registers. We'll transform their uses
1104 as we find them. */
1105 if ((TREE_CODE (TREE_TYPE (t)) == COMPLEX_TYPE
1106 || TREE_CODE (TREE_TYPE (t)) == VECTOR_TYPE)
1107 && !TREE_THIS_VOLATILE (t)
1108 && (TREE_CODE (t) == VAR_DECL && !DECL_HARD_REGISTER (t))
1109 && !needs_to_live_in_memory (t))
1110 DECL_GIMPLE_REG_P (t) = 1;
1113 bind_stmt = gimple_build_bind (BIND_EXPR_VARS (bind_expr), NULL,
1114 BIND_EXPR_BLOCK (bind_expr));
1115 gimple_push_bind_expr (bind_stmt);
1117 gimplify_ctxp->save_stack = false;
1119 /* Gimplify the body into the GIMPLE_BIND tuple's body. */
1120 body = NULL;
1121 gimplify_stmt (&BIND_EXPR_BODY (bind_expr), &body);
1122 gimple_bind_set_body (bind_stmt, body);
1124 /* Source location wise, the cleanup code (stack_restore and clobbers)
1125 belongs to the end of the block, so propagate what we have. The
1126 stack_save operation belongs to the beginning of block, which we can
1127 infer from the bind_expr directly if the block has no explicit
1128 assignment. */
1129 if (BIND_EXPR_BLOCK (bind_expr))
1131 end_locus = BLOCK_SOURCE_END_LOCATION (BIND_EXPR_BLOCK (bind_expr));
1132 start_locus = BLOCK_SOURCE_LOCATION (BIND_EXPR_BLOCK (bind_expr));
1134 if (start_locus == 0)
1135 start_locus = EXPR_LOCATION (bind_expr);
1137 cleanup = NULL;
1138 stack_save = NULL;
1139 if (gimplify_ctxp->save_stack)
1141 gcall *stack_restore;
1143 /* Save stack on entry and restore it on exit. Add a try_finally
1144 block to achieve this. */
1145 build_stack_save_restore (&stack_save, &stack_restore);
1147 gimple_set_location (stack_save, start_locus);
1148 gimple_set_location (stack_restore, end_locus);
1150 gimplify_seq_add_stmt (&cleanup, stack_restore);
1153 /* Add clobbers for all variables that go out of scope. */
1154 for (t = BIND_EXPR_VARS (bind_expr); t ; t = DECL_CHAIN (t))
1156 if (TREE_CODE (t) == VAR_DECL
1157 && !is_global_var (t)
1158 && DECL_CONTEXT (t) == current_function_decl
1159 && !DECL_HARD_REGISTER (t)
1160 && !TREE_THIS_VOLATILE (t)
1161 && !DECL_HAS_VALUE_EXPR_P (t)
1162 /* Only care for variables that have to be in memory. Others
1163 will be rewritten into SSA names, hence moved to the top-level. */
1164 && !is_gimple_reg (t)
1165 && flag_stack_reuse != SR_NONE)
1167 tree clobber = build_constructor (TREE_TYPE (t), NULL);
1168 gimple clobber_stmt;
1169 TREE_THIS_VOLATILE (clobber) = 1;
1170 clobber_stmt = gimple_build_assign (t, clobber);
1171 gimple_set_location (clobber_stmt, end_locus);
1172 gimplify_seq_add_stmt (&cleanup, clobber_stmt);
1176 if (cleanup)
1178 gtry *gs;
1179 gimple_seq new_body;
1181 new_body = NULL;
1182 gs = gimple_build_try (gimple_bind_body (bind_stmt), cleanup,
1183 GIMPLE_TRY_FINALLY);
1185 if (stack_save)
1186 gimplify_seq_add_stmt (&new_body, stack_save);
1187 gimplify_seq_add_stmt (&new_body, gs);
1188 gimple_bind_set_body (bind_stmt, new_body);
1191 gimplify_ctxp->save_stack = old_save_stack;
1192 gimple_pop_bind_expr ();
1194 gimplify_seq_add_stmt (pre_p, bind_stmt);
1196 if (temp)
1198 *expr_p = temp;
1199 return GS_OK;
1202 *expr_p = NULL_TREE;
1203 return GS_ALL_DONE;
1206 /* Gimplify a RETURN_EXPR. If the expression to be returned is not a
1207 GIMPLE value, it is assigned to a new temporary and the statement is
1208 re-written to return the temporary.
1210 PRE_P points to the sequence where side effects that must happen before
1211 STMT should be stored. */
1213 static enum gimplify_status
1214 gimplify_return_expr (tree stmt, gimple_seq *pre_p)
1216 greturn *ret;
1217 tree ret_expr = TREE_OPERAND (stmt, 0);
1218 tree result_decl, result;
1220 if (ret_expr == error_mark_node)
1221 return GS_ERROR;
1223 /* Implicit _Cilk_sync must be inserted right before any return statement
1224 if there is a _Cilk_spawn in the function. If the user has provided a
1225 _Cilk_sync, the optimizer should remove this duplicate one. */
1226 if (fn_contains_cilk_spawn_p (cfun))
1228 tree impl_sync = build0 (CILK_SYNC_STMT, void_type_node);
1229 gimplify_and_add (impl_sync, pre_p);
1232 if (!ret_expr
1233 || TREE_CODE (ret_expr) == RESULT_DECL
1234 || ret_expr == error_mark_node)
1236 greturn *ret = gimple_build_return (ret_expr);
1237 gimple_set_no_warning (ret, TREE_NO_WARNING (stmt));
1238 gimplify_seq_add_stmt (pre_p, ret);
1239 return GS_ALL_DONE;
1242 if (VOID_TYPE_P (TREE_TYPE (TREE_TYPE (current_function_decl))))
1243 result_decl = NULL_TREE;
1244 else
1246 result_decl = TREE_OPERAND (ret_expr, 0);
1248 /* See through a return by reference. */
1249 if (TREE_CODE (result_decl) == INDIRECT_REF)
1250 result_decl = TREE_OPERAND (result_decl, 0);
1252 gcc_assert ((TREE_CODE (ret_expr) == MODIFY_EXPR
1253 || TREE_CODE (ret_expr) == INIT_EXPR)
1254 && TREE_CODE (result_decl) == RESULT_DECL);
1257 /* If aggregate_value_p is true, then we can return the bare RESULT_DECL.
1258 Recall that aggregate_value_p is FALSE for any aggregate type that is
1259 returned in registers. If we're returning values in registers, then
1260 we don't want to extend the lifetime of the RESULT_DECL, particularly
1261 across another call. In addition, for those aggregates for which
1262 hard_function_value generates a PARALLEL, we'll die during normal
1263 expansion of structure assignments; there's special code in expand_return
1264 to handle this case that does not exist in expand_expr. */
1265 if (!result_decl)
1266 result = NULL_TREE;
1267 else if (aggregate_value_p (result_decl, TREE_TYPE (current_function_decl)))
1269 if (TREE_CODE (DECL_SIZE (result_decl)) != INTEGER_CST)
1271 if (!TYPE_SIZES_GIMPLIFIED (TREE_TYPE (result_decl)))
1272 gimplify_type_sizes (TREE_TYPE (result_decl), pre_p);
1273 /* Note that we don't use gimplify_vla_decl because the RESULT_DECL
1274 should be effectively allocated by the caller, i.e. all calls to
1275 this function must be subject to the Return Slot Optimization. */
1276 gimplify_one_sizepos (&DECL_SIZE (result_decl), pre_p);
1277 gimplify_one_sizepos (&DECL_SIZE_UNIT (result_decl), pre_p);
1279 result = result_decl;
1281 else if (gimplify_ctxp->return_temp)
1282 result = gimplify_ctxp->return_temp;
1283 else
1285 result = create_tmp_reg (TREE_TYPE (result_decl));
1287 /* ??? With complex control flow (usually involving abnormal edges),
1288 we can wind up warning about an uninitialized value for this. Due
1289 to how this variable is constructed and initialized, this is never
1290 true. Give up and never warn. */
1291 TREE_NO_WARNING (result) = 1;
1293 gimplify_ctxp->return_temp = result;
1296 /* Smash the lhs of the MODIFY_EXPR to the temporary we plan to use.
1297 Then gimplify the whole thing. */
1298 if (result != result_decl)
1299 TREE_OPERAND (ret_expr, 0) = result;
1301 gimplify_and_add (TREE_OPERAND (stmt, 0), pre_p);
1303 ret = gimple_build_return (result);
1304 gimple_set_no_warning (ret, TREE_NO_WARNING (stmt));
1305 gimplify_seq_add_stmt (pre_p, ret);
1307 return GS_ALL_DONE;
1310 /* Gimplify a variable-length array DECL. */
1312 static void
1313 gimplify_vla_decl (tree decl, gimple_seq *seq_p)
1315 /* This is a variable-sized decl. Simplify its size and mark it
1316 for deferred expansion. */
1317 tree t, addr, ptr_type;
1319 gimplify_one_sizepos (&DECL_SIZE (decl), seq_p);
1320 gimplify_one_sizepos (&DECL_SIZE_UNIT (decl), seq_p);
1322 /* Don't mess with a DECL_VALUE_EXPR set by the front-end. */
1323 if (DECL_HAS_VALUE_EXPR_P (decl))
1324 return;
1326 /* All occurrences of this decl in final gimplified code will be
1327 replaced by indirection. Setting DECL_VALUE_EXPR does two
1328 things: First, it lets the rest of the gimplifier know what
1329 replacement to use. Second, it lets the debug info know
1330 where to find the value. */
1331 ptr_type = build_pointer_type (TREE_TYPE (decl));
1332 addr = create_tmp_var (ptr_type, get_name (decl));
1333 DECL_IGNORED_P (addr) = 0;
1334 t = build_fold_indirect_ref (addr);
1335 TREE_THIS_NOTRAP (t) = 1;
1336 SET_DECL_VALUE_EXPR (decl, t);
1337 DECL_HAS_VALUE_EXPR_P (decl) = 1;
1339 t = builtin_decl_explicit (BUILT_IN_ALLOCA_WITH_ALIGN);
1340 t = build_call_expr (t, 2, DECL_SIZE_UNIT (decl),
1341 size_int (DECL_ALIGN (decl)));
1342 /* The call has been built for a variable-sized object. */
1343 CALL_ALLOCA_FOR_VAR_P (t) = 1;
1344 t = fold_convert (ptr_type, t);
1345 t = build2 (MODIFY_EXPR, TREE_TYPE (addr), addr, t);
1347 gimplify_and_add (t, seq_p);
1349 /* Indicate that we need to restore the stack level when the
1350 enclosing BIND_EXPR is exited. */
1351 gimplify_ctxp->save_stack = true;
1354 /* A helper function to be called via walk_tree. Mark all labels under *TP
1355 as being forced. To be called for DECL_INITIAL of static variables. */
1357 static tree
1358 force_labels_r (tree *tp, int *walk_subtrees, void *data ATTRIBUTE_UNUSED)
1360 if (TYPE_P (*tp))
1361 *walk_subtrees = 0;
1362 if (TREE_CODE (*tp) == LABEL_DECL)
1363 FORCED_LABEL (*tp) = 1;
1365 return NULL_TREE;
1368 /* Gimplify a DECL_EXPR node *STMT_P by making any necessary allocation
1369 and initialization explicit. */
1371 static enum gimplify_status
1372 gimplify_decl_expr (tree *stmt_p, gimple_seq *seq_p)
1374 tree stmt = *stmt_p;
1375 tree decl = DECL_EXPR_DECL (stmt);
1377 *stmt_p = NULL_TREE;
1379 if (TREE_TYPE (decl) == error_mark_node)
1380 return GS_ERROR;
1382 if ((TREE_CODE (decl) == TYPE_DECL
1383 || TREE_CODE (decl) == VAR_DECL)
1384 && !TYPE_SIZES_GIMPLIFIED (TREE_TYPE (decl)))
1385 gimplify_type_sizes (TREE_TYPE (decl), seq_p);
1387 /* ??? DECL_ORIGINAL_TYPE is streamed for LTO so it needs to be gimplified
1388 in case its size expressions contain problematic nodes like CALL_EXPR. */
1389 if (TREE_CODE (decl) == TYPE_DECL
1390 && DECL_ORIGINAL_TYPE (decl)
1391 && !TYPE_SIZES_GIMPLIFIED (DECL_ORIGINAL_TYPE (decl)))
1392 gimplify_type_sizes (DECL_ORIGINAL_TYPE (decl), seq_p);
1394 if (TREE_CODE (decl) == VAR_DECL && !DECL_EXTERNAL (decl))
1396 tree init = DECL_INITIAL (decl);
1398 if (TREE_CODE (DECL_SIZE_UNIT (decl)) != INTEGER_CST
1399 || (!TREE_STATIC (decl)
1400 && flag_stack_check == GENERIC_STACK_CHECK
1401 && compare_tree_int (DECL_SIZE_UNIT (decl),
1402 STACK_CHECK_MAX_VAR_SIZE) > 0))
1403 gimplify_vla_decl (decl, seq_p);
1405 /* Some front ends do not explicitly declare all anonymous
1406 artificial variables. We compensate here by declaring the
1407 variables, though it would be better if the front ends would
1408 explicitly declare them. */
1409 if (!DECL_SEEN_IN_BIND_EXPR_P (decl)
1410 && DECL_ARTIFICIAL (decl) && DECL_NAME (decl) == NULL_TREE)
1411 gimple_add_tmp_var (decl);
1413 if (init && init != error_mark_node)
1415 if (!TREE_STATIC (decl))
1417 DECL_INITIAL (decl) = NULL_TREE;
1418 init = build2 (INIT_EXPR, void_type_node, decl, init);
1419 gimplify_and_add (init, seq_p);
1420 ggc_free (init);
1422 else
1423 /* We must still examine initializers for static variables
1424 as they may contain a label address. */
1425 walk_tree (&init, force_labels_r, NULL, NULL);
1429 return GS_ALL_DONE;
1432 /* Gimplify a LOOP_EXPR. Normally this just involves gimplifying the body
1433 and replacing the LOOP_EXPR with goto, but if the loop contains an
1434 EXIT_EXPR, we need to append a label for it to jump to. */
1436 static enum gimplify_status
1437 gimplify_loop_expr (tree *expr_p, gimple_seq *pre_p)
1439 tree saved_label = gimplify_ctxp->exit_label;
1440 tree start_label = create_artificial_label (UNKNOWN_LOCATION);
1442 gimplify_seq_add_stmt (pre_p, gimple_build_label (start_label));
1444 gimplify_ctxp->exit_label = NULL_TREE;
1446 gimplify_and_add (LOOP_EXPR_BODY (*expr_p), pre_p);
1448 gimplify_seq_add_stmt (pre_p, gimple_build_goto (start_label));
1450 if (gimplify_ctxp->exit_label)
1451 gimplify_seq_add_stmt (pre_p,
1452 gimple_build_label (gimplify_ctxp->exit_label));
1454 gimplify_ctxp->exit_label = saved_label;
1456 *expr_p = NULL;
1457 return GS_ALL_DONE;
1460 /* Gimplify a statement list onto a sequence. These may be created either
1461 by an enlightened front-end, or by shortcut_cond_expr. */
1463 static enum gimplify_status
1464 gimplify_statement_list (tree *expr_p, gimple_seq *pre_p)
1466 tree temp = voidify_wrapper_expr (*expr_p, NULL);
1468 tree_stmt_iterator i = tsi_start (*expr_p);
1470 while (!tsi_end_p (i))
1472 gimplify_stmt (tsi_stmt_ptr (i), pre_p);
1473 tsi_delink (&i);
1476 if (temp)
1478 *expr_p = temp;
1479 return GS_OK;
1482 return GS_ALL_DONE;
1486 /* Gimplify a SWITCH_EXPR, and collect the vector of labels it can
1487 branch to. */
1489 static enum gimplify_status
1490 gimplify_switch_expr (tree *expr_p, gimple_seq *pre_p)
1492 tree switch_expr = *expr_p;
1493 gimple_seq switch_body_seq = NULL;
1494 enum gimplify_status ret;
1495 tree index_type = TREE_TYPE (switch_expr);
1496 if (index_type == NULL_TREE)
1497 index_type = TREE_TYPE (SWITCH_COND (switch_expr));
1499 ret = gimplify_expr (&SWITCH_COND (switch_expr), pre_p, NULL, is_gimple_val,
1500 fb_rvalue);
1501 if (ret == GS_ERROR || ret == GS_UNHANDLED)
1502 return ret;
1504 if (SWITCH_BODY (switch_expr))
1506 vec<tree> labels;
1507 vec<tree> saved_labels;
1508 tree default_case = NULL_TREE;
1509 gswitch *switch_stmt;
1511 /* If someone can be bothered to fill in the labels, they can
1512 be bothered to null out the body too. */
1513 gcc_assert (!SWITCH_LABELS (switch_expr));
1515 /* Save old labels, get new ones from body, then restore the old
1516 labels. Save all the things from the switch body to append after. */
1517 saved_labels = gimplify_ctxp->case_labels;
1518 gimplify_ctxp->case_labels.create (8);
1520 gimplify_stmt (&SWITCH_BODY (switch_expr), &switch_body_seq);
1521 labels = gimplify_ctxp->case_labels;
1522 gimplify_ctxp->case_labels = saved_labels;
1524 preprocess_case_label_vec_for_gimple (labels, index_type,
1525 &default_case);
1527 if (!default_case)
1529 glabel *new_default;
1531 default_case
1532 = build_case_label (NULL_TREE, NULL_TREE,
1533 create_artificial_label (UNKNOWN_LOCATION));
1534 new_default = gimple_build_label (CASE_LABEL (default_case));
1535 gimplify_seq_add_stmt (&switch_body_seq, new_default);
1538 switch_stmt = gimple_build_switch (SWITCH_COND (switch_expr),
1539 default_case, labels);
1540 gimplify_seq_add_stmt (pre_p, switch_stmt);
1541 gimplify_seq_add_seq (pre_p, switch_body_seq);
1542 labels.release ();
1544 else
1545 gcc_assert (SWITCH_LABELS (switch_expr));
1547 return GS_ALL_DONE;
1550 /* Gimplify the CASE_LABEL_EXPR pointed to by EXPR_P. */
1552 static enum gimplify_status
1553 gimplify_case_label_expr (tree *expr_p, gimple_seq *pre_p)
1555 struct gimplify_ctx *ctxp;
1556 glabel *label_stmt;
1558 /* Invalid programs can play Duff's Device type games with, for example,
1559 #pragma omp parallel. At least in the C front end, we don't
1560 detect such invalid branches until after gimplification, in the
1561 diagnose_omp_blocks pass. */
1562 for (ctxp = gimplify_ctxp; ; ctxp = ctxp->prev_context)
1563 if (ctxp->case_labels.exists ())
1564 break;
1566 label_stmt = gimple_build_label (CASE_LABEL (*expr_p));
1567 ctxp->case_labels.safe_push (*expr_p);
1568 gimplify_seq_add_stmt (pre_p, label_stmt);
1570 return GS_ALL_DONE;
1573 /* Build a GOTO to the LABEL_DECL pointed to by LABEL_P, building it first
1574 if necessary. */
1576 tree
1577 build_and_jump (tree *label_p)
1579 if (label_p == NULL)
1580 /* If there's nowhere to jump, just fall through. */
1581 return NULL_TREE;
1583 if (*label_p == NULL_TREE)
1585 tree label = create_artificial_label (UNKNOWN_LOCATION);
1586 *label_p = label;
1589 return build1 (GOTO_EXPR, void_type_node, *label_p);
1592 /* Gimplify an EXIT_EXPR by converting to a GOTO_EXPR inside a COND_EXPR.
1593 This also involves building a label to jump to and communicating it to
1594 gimplify_loop_expr through gimplify_ctxp->exit_label. */
1596 static enum gimplify_status
1597 gimplify_exit_expr (tree *expr_p)
1599 tree cond = TREE_OPERAND (*expr_p, 0);
1600 tree expr;
1602 expr = build_and_jump (&gimplify_ctxp->exit_label);
1603 expr = build3 (COND_EXPR, void_type_node, cond, expr, NULL_TREE);
1604 *expr_p = expr;
1606 return GS_OK;
1609 /* *EXPR_P is a COMPONENT_REF being used as an rvalue. If its type is
1610 different from its canonical type, wrap the whole thing inside a
1611 NOP_EXPR and force the type of the COMPONENT_REF to be the canonical
1612 type.
1614 The canonical type of a COMPONENT_REF is the type of the field being
1615 referenced--unless the field is a bit-field which can be read directly
1616 in a smaller mode, in which case the canonical type is the
1617 sign-appropriate type corresponding to that mode. */
1619 static void
1620 canonicalize_component_ref (tree *expr_p)
1622 tree expr = *expr_p;
1623 tree type;
1625 gcc_assert (TREE_CODE (expr) == COMPONENT_REF);
1627 if (INTEGRAL_TYPE_P (TREE_TYPE (expr)))
1628 type = TREE_TYPE (get_unwidened (expr, NULL_TREE));
1629 else
1630 type = TREE_TYPE (TREE_OPERAND (expr, 1));
1632 /* One could argue that all the stuff below is not necessary for
1633 the non-bitfield case and declare it a FE error if type
1634 adjustment would be needed. */
1635 if (TREE_TYPE (expr) != type)
1637 #ifdef ENABLE_TYPES_CHECKING
1638 tree old_type = TREE_TYPE (expr);
1639 #endif
1640 int type_quals;
1642 /* We need to preserve qualifiers and propagate them from
1643 operand 0. */
1644 type_quals = TYPE_QUALS (type)
1645 | TYPE_QUALS (TREE_TYPE (TREE_OPERAND (expr, 0)));
1646 if (TYPE_QUALS (type) != type_quals)
1647 type = build_qualified_type (TYPE_MAIN_VARIANT (type), type_quals);
1649 /* Set the type of the COMPONENT_REF to the underlying type. */
1650 TREE_TYPE (expr) = type;
1652 #ifdef ENABLE_TYPES_CHECKING
1653 /* It is now a FE error, if the conversion from the canonical
1654 type to the original expression type is not useless. */
1655 gcc_assert (useless_type_conversion_p (old_type, type));
1656 #endif
1660 /* If a NOP conversion is changing a pointer to array of foo to a pointer
1661 to foo, embed that change in the ADDR_EXPR by converting
1662 T array[U];
1663 (T *)&array
1665 &array[L]
1666 where L is the lower bound. For simplicity, only do this for constant
1667 lower bound.
1668 The constraint is that the type of &array[L] is trivially convertible
1669 to T *. */
1671 static void
1672 canonicalize_addr_expr (tree *expr_p)
1674 tree expr = *expr_p;
1675 tree addr_expr = TREE_OPERAND (expr, 0);
1676 tree datype, ddatype, pddatype;
1678 /* We simplify only conversions from an ADDR_EXPR to a pointer type. */
1679 if (!POINTER_TYPE_P (TREE_TYPE (expr))
1680 || TREE_CODE (addr_expr) != ADDR_EXPR)
1681 return;
1683 /* The addr_expr type should be a pointer to an array. */
1684 datype = TREE_TYPE (TREE_TYPE (addr_expr));
1685 if (TREE_CODE (datype) != ARRAY_TYPE)
1686 return;
1688 /* The pointer to element type shall be trivially convertible to
1689 the expression pointer type. */
1690 ddatype = TREE_TYPE (datype);
1691 pddatype = build_pointer_type (ddatype);
1692 if (!useless_type_conversion_p (TYPE_MAIN_VARIANT (TREE_TYPE (expr)),
1693 pddatype))
1694 return;
1696 /* The lower bound and element sizes must be constant. */
1697 if (!TYPE_SIZE_UNIT (ddatype)
1698 || TREE_CODE (TYPE_SIZE_UNIT (ddatype)) != INTEGER_CST
1699 || !TYPE_DOMAIN (datype) || !TYPE_MIN_VALUE (TYPE_DOMAIN (datype))
1700 || TREE_CODE (TYPE_MIN_VALUE (TYPE_DOMAIN (datype))) != INTEGER_CST)
1701 return;
1703 /* All checks succeeded. Build a new node to merge the cast. */
1704 *expr_p = build4 (ARRAY_REF, ddatype, TREE_OPERAND (addr_expr, 0),
1705 TYPE_MIN_VALUE (TYPE_DOMAIN (datype)),
1706 NULL_TREE, NULL_TREE);
1707 *expr_p = build1 (ADDR_EXPR, pddatype, *expr_p);
1709 /* We can have stripped a required restrict qualifier above. */
1710 if (!useless_type_conversion_p (TREE_TYPE (expr), TREE_TYPE (*expr_p)))
1711 *expr_p = fold_convert (TREE_TYPE (expr), *expr_p);
1714 /* *EXPR_P is a NOP_EXPR or CONVERT_EXPR. Remove it and/or other conversions
1715 underneath as appropriate. */
1717 static enum gimplify_status
1718 gimplify_conversion (tree *expr_p)
1720 location_t loc = EXPR_LOCATION (*expr_p);
1721 gcc_assert (CONVERT_EXPR_P (*expr_p));
1723 /* Then strip away all but the outermost conversion. */
1724 STRIP_SIGN_NOPS (TREE_OPERAND (*expr_p, 0));
1726 /* And remove the outermost conversion if it's useless. */
1727 if (tree_ssa_useless_type_conversion (*expr_p))
1728 *expr_p = TREE_OPERAND (*expr_p, 0);
1730 /* If we still have a conversion at the toplevel,
1731 then canonicalize some constructs. */
1732 if (CONVERT_EXPR_P (*expr_p))
1734 tree sub = TREE_OPERAND (*expr_p, 0);
1736 /* If a NOP conversion is changing the type of a COMPONENT_REF
1737 expression, then canonicalize its type now in order to expose more
1738 redundant conversions. */
1739 if (TREE_CODE (sub) == COMPONENT_REF)
1740 canonicalize_component_ref (&TREE_OPERAND (*expr_p, 0));
1742 /* If a NOP conversion is changing a pointer to array of foo
1743 to a pointer to foo, embed that change in the ADDR_EXPR. */
1744 else if (TREE_CODE (sub) == ADDR_EXPR)
1745 canonicalize_addr_expr (expr_p);
1748 /* If we have a conversion to a non-register type force the
1749 use of a VIEW_CONVERT_EXPR instead. */
1750 if (CONVERT_EXPR_P (*expr_p) && !is_gimple_reg_type (TREE_TYPE (*expr_p)))
1751 *expr_p = fold_build1_loc (loc, VIEW_CONVERT_EXPR, TREE_TYPE (*expr_p),
1752 TREE_OPERAND (*expr_p, 0));
1754 /* Canonicalize CONVERT_EXPR to NOP_EXPR. */
1755 if (TREE_CODE (*expr_p) == CONVERT_EXPR)
1756 TREE_SET_CODE (*expr_p, NOP_EXPR);
1758 return GS_OK;
1761 /* Nonlocal VLAs seen in the current function. */
1762 static hash_set<tree> *nonlocal_vlas;
1764 /* The VAR_DECLs created for nonlocal VLAs for debug info purposes. */
1765 static tree nonlocal_vla_vars;
1767 /* Gimplify a VAR_DECL or PARM_DECL. Return GS_OK if we expanded a
1768 DECL_VALUE_EXPR, and it's worth re-examining things. */
1770 static enum gimplify_status
1771 gimplify_var_or_parm_decl (tree *expr_p)
1773 tree decl = *expr_p;
1775 /* ??? If this is a local variable, and it has not been seen in any
1776 outer BIND_EXPR, then it's probably the result of a duplicate
1777 declaration, for which we've already issued an error. It would
1778 be really nice if the front end wouldn't leak these at all.
1779 Currently the only known culprit is C++ destructors, as seen
1780 in g++.old-deja/g++.jason/binding.C. */
1781 if (TREE_CODE (decl) == VAR_DECL
1782 && !DECL_SEEN_IN_BIND_EXPR_P (decl)
1783 && !TREE_STATIC (decl) && !DECL_EXTERNAL (decl)
1784 && decl_function_context (decl) == current_function_decl)
1786 gcc_assert (seen_error ());
1787 return GS_ERROR;
1790 /* When within an OMP context, notice uses of variables. */
1791 if (gimplify_omp_ctxp && omp_notice_variable (gimplify_omp_ctxp, decl, true))
1792 return GS_ALL_DONE;
1794 /* If the decl is an alias for another expression, substitute it now. */
1795 if (DECL_HAS_VALUE_EXPR_P (decl))
1797 tree value_expr = DECL_VALUE_EXPR (decl);
1799 /* For referenced nonlocal VLAs add a decl for debugging purposes
1800 to the current function. */
1801 if (TREE_CODE (decl) == VAR_DECL
1802 && TREE_CODE (DECL_SIZE_UNIT (decl)) != INTEGER_CST
1803 && nonlocal_vlas != NULL
1804 && TREE_CODE (value_expr) == INDIRECT_REF
1805 && TREE_CODE (TREE_OPERAND (value_expr, 0)) == VAR_DECL
1806 && decl_function_context (decl) != current_function_decl)
1808 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
1809 while (ctx
1810 && (ctx->region_type == ORT_WORKSHARE
1811 || ctx->region_type == ORT_SIMD))
1812 ctx = ctx->outer_context;
1813 if (!ctx && !nonlocal_vlas->add (decl))
1815 tree copy = copy_node (decl);
1817 lang_hooks.dup_lang_specific_decl (copy);
1818 SET_DECL_RTL (copy, 0);
1819 TREE_USED (copy) = 1;
1820 DECL_CHAIN (copy) = nonlocal_vla_vars;
1821 nonlocal_vla_vars = copy;
1822 SET_DECL_VALUE_EXPR (copy, unshare_expr (value_expr));
1823 DECL_HAS_VALUE_EXPR_P (copy) = 1;
1827 *expr_p = unshare_expr (value_expr);
1828 return GS_OK;
1831 return GS_ALL_DONE;
1834 /* Recalculate the value of the TREE_SIDE_EFFECTS flag for T. */
1836 static void
1837 recalculate_side_effects (tree t)
1839 enum tree_code code = TREE_CODE (t);
1840 int len = TREE_OPERAND_LENGTH (t);
1841 int i;
1843 switch (TREE_CODE_CLASS (code))
1845 case tcc_expression:
1846 switch (code)
1848 case INIT_EXPR:
1849 case MODIFY_EXPR:
1850 case VA_ARG_EXPR:
1851 case PREDECREMENT_EXPR:
1852 case PREINCREMENT_EXPR:
1853 case POSTDECREMENT_EXPR:
1854 case POSTINCREMENT_EXPR:
1855 /* All of these have side-effects, no matter what their
1856 operands are. */
1857 return;
1859 default:
1860 break;
1862 /* Fall through. */
1864 case tcc_comparison: /* a comparison expression */
1865 case tcc_unary: /* a unary arithmetic expression */
1866 case tcc_binary: /* a binary arithmetic expression */
1867 case tcc_reference: /* a reference */
1868 case tcc_vl_exp: /* a function call */
1869 TREE_SIDE_EFFECTS (t) = TREE_THIS_VOLATILE (t);
1870 for (i = 0; i < len; ++i)
1872 tree op = TREE_OPERAND (t, i);
1873 if (op && TREE_SIDE_EFFECTS (op))
1874 TREE_SIDE_EFFECTS (t) = 1;
1876 break;
1878 case tcc_constant:
1879 /* No side-effects. */
1880 return;
1882 default:
1883 gcc_unreachable ();
1887 /* Gimplify the COMPONENT_REF, ARRAY_REF, REALPART_EXPR or IMAGPART_EXPR
1888 node *EXPR_P.
1890 compound_lval
1891 : min_lval '[' val ']'
1892 | min_lval '.' ID
1893 | compound_lval '[' val ']'
1894 | compound_lval '.' ID
1896 This is not part of the original SIMPLE definition, which separates
1897 array and member references, but it seems reasonable to handle them
1898 together. Also, this way we don't run into problems with union
1899 aliasing; gcc requires that for accesses through a union to alias, the
1900 union reference must be explicit, which was not always the case when we
1901 were splitting up array and member refs.
1903 PRE_P points to the sequence where side effects that must happen before
1904 *EXPR_P should be stored.
1906 POST_P points to the sequence where side effects that must happen after
1907 *EXPR_P should be stored. */
1909 static enum gimplify_status
1910 gimplify_compound_lval (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
1911 fallback_t fallback)
1913 tree *p;
1914 enum gimplify_status ret = GS_ALL_DONE, tret;
1915 int i;
1916 location_t loc = EXPR_LOCATION (*expr_p);
1917 tree expr = *expr_p;
1919 /* Create a stack of the subexpressions so later we can walk them in
1920 order from inner to outer. */
1921 auto_vec<tree, 10> expr_stack;
1923 /* We can handle anything that get_inner_reference can deal with. */
1924 for (p = expr_p; ; p = &TREE_OPERAND (*p, 0))
1926 restart:
1927 /* Fold INDIRECT_REFs now to turn them into ARRAY_REFs. */
1928 if (TREE_CODE (*p) == INDIRECT_REF)
1929 *p = fold_indirect_ref_loc (loc, *p);
1931 if (handled_component_p (*p))
1933 /* Expand DECL_VALUE_EXPR now. In some cases that may expose
1934 additional COMPONENT_REFs. */
1935 else if ((TREE_CODE (*p) == VAR_DECL || TREE_CODE (*p) == PARM_DECL)
1936 && gimplify_var_or_parm_decl (p) == GS_OK)
1937 goto restart;
1938 else
1939 break;
1941 expr_stack.safe_push (*p);
1944 gcc_assert (expr_stack.length ());
1946 /* Now EXPR_STACK is a stack of pointers to all the refs we've
1947 walked through and P points to the innermost expression.
1949 Java requires that we elaborated nodes in source order. That
1950 means we must gimplify the inner expression followed by each of
1951 the indices, in order. But we can't gimplify the inner
1952 expression until we deal with any variable bounds, sizes, or
1953 positions in order to deal with PLACEHOLDER_EXPRs.
1955 So we do this in three steps. First we deal with the annotations
1956 for any variables in the components, then we gimplify the base,
1957 then we gimplify any indices, from left to right. */
1958 for (i = expr_stack.length () - 1; i >= 0; i--)
1960 tree t = expr_stack[i];
1962 if (TREE_CODE (t) == ARRAY_REF || TREE_CODE (t) == ARRAY_RANGE_REF)
1964 /* Gimplify the low bound and element type size and put them into
1965 the ARRAY_REF. If these values are set, they have already been
1966 gimplified. */
1967 if (TREE_OPERAND (t, 2) == NULL_TREE)
1969 tree low = unshare_expr (array_ref_low_bound (t));
1970 if (!is_gimple_min_invariant (low))
1972 TREE_OPERAND (t, 2) = low;
1973 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p,
1974 post_p, is_gimple_reg,
1975 fb_rvalue);
1976 ret = MIN (ret, tret);
1979 else
1981 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p, post_p,
1982 is_gimple_reg, fb_rvalue);
1983 ret = MIN (ret, tret);
1986 if (TREE_OPERAND (t, 3) == NULL_TREE)
1988 tree elmt_type = TREE_TYPE (TREE_TYPE (TREE_OPERAND (t, 0)));
1989 tree elmt_size = unshare_expr (array_ref_element_size (t));
1990 tree factor = size_int (TYPE_ALIGN_UNIT (elmt_type));
1992 /* Divide the element size by the alignment of the element
1993 type (above). */
1994 elmt_size
1995 = size_binop_loc (loc, EXACT_DIV_EXPR, elmt_size, factor);
1997 if (!is_gimple_min_invariant (elmt_size))
1999 TREE_OPERAND (t, 3) = elmt_size;
2000 tret = gimplify_expr (&TREE_OPERAND (t, 3), pre_p,
2001 post_p, is_gimple_reg,
2002 fb_rvalue);
2003 ret = MIN (ret, tret);
2006 else
2008 tret = gimplify_expr (&TREE_OPERAND (t, 3), pre_p, post_p,
2009 is_gimple_reg, fb_rvalue);
2010 ret = MIN (ret, tret);
2013 else if (TREE_CODE (t) == COMPONENT_REF)
2015 /* Set the field offset into T and gimplify it. */
2016 if (TREE_OPERAND (t, 2) == NULL_TREE)
2018 tree offset = unshare_expr (component_ref_field_offset (t));
2019 tree field = TREE_OPERAND (t, 1);
2020 tree factor
2021 = size_int (DECL_OFFSET_ALIGN (field) / BITS_PER_UNIT);
2023 /* Divide the offset by its alignment. */
2024 offset = size_binop_loc (loc, EXACT_DIV_EXPR, offset, factor);
2026 if (!is_gimple_min_invariant (offset))
2028 TREE_OPERAND (t, 2) = offset;
2029 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p,
2030 post_p, is_gimple_reg,
2031 fb_rvalue);
2032 ret = MIN (ret, tret);
2035 else
2037 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p, post_p,
2038 is_gimple_reg, fb_rvalue);
2039 ret = MIN (ret, tret);
2044 /* Step 2 is to gimplify the base expression. Make sure lvalue is set
2045 so as to match the min_lval predicate. Failure to do so may result
2046 in the creation of large aggregate temporaries. */
2047 tret = gimplify_expr (p, pre_p, post_p, is_gimple_min_lval,
2048 fallback | fb_lvalue);
2049 ret = MIN (ret, tret);
2051 /* And finally, the indices and operands of ARRAY_REF. During this
2052 loop we also remove any useless conversions. */
2053 for (; expr_stack.length () > 0; )
2055 tree t = expr_stack.pop ();
2057 if (TREE_CODE (t) == ARRAY_REF || TREE_CODE (t) == ARRAY_RANGE_REF)
2059 /* Gimplify the dimension. */
2060 if (!is_gimple_min_invariant (TREE_OPERAND (t, 1)))
2062 tret = gimplify_expr (&TREE_OPERAND (t, 1), pre_p, post_p,
2063 is_gimple_val, fb_rvalue);
2064 ret = MIN (ret, tret);
2068 STRIP_USELESS_TYPE_CONVERSION (TREE_OPERAND (t, 0));
2070 /* The innermost expression P may have originally had
2071 TREE_SIDE_EFFECTS set which would have caused all the outer
2072 expressions in *EXPR_P leading to P to also have had
2073 TREE_SIDE_EFFECTS set. */
2074 recalculate_side_effects (t);
2077 /* If the outermost expression is a COMPONENT_REF, canonicalize its type. */
2078 if ((fallback & fb_rvalue) && TREE_CODE (*expr_p) == COMPONENT_REF)
2080 canonicalize_component_ref (expr_p);
2083 expr_stack.release ();
2085 gcc_assert (*expr_p == expr || ret != GS_ALL_DONE);
2087 return ret;
2090 /* Gimplify the self modifying expression pointed to by EXPR_P
2091 (++, --, +=, -=).
2093 PRE_P points to the list where side effects that must happen before
2094 *EXPR_P should be stored.
2096 POST_P points to the list where side effects that must happen after
2097 *EXPR_P should be stored.
2099 WANT_VALUE is nonzero iff we want to use the value of this expression
2100 in another expression.
2102 ARITH_TYPE is the type the computation should be performed in. */
2104 enum gimplify_status
2105 gimplify_self_mod_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
2106 bool want_value, tree arith_type)
2108 enum tree_code code;
2109 tree lhs, lvalue, rhs, t1;
2110 gimple_seq post = NULL, *orig_post_p = post_p;
2111 bool postfix;
2112 enum tree_code arith_code;
2113 enum gimplify_status ret;
2114 location_t loc = EXPR_LOCATION (*expr_p);
2116 code = TREE_CODE (*expr_p);
2118 gcc_assert (code == POSTINCREMENT_EXPR || code == POSTDECREMENT_EXPR
2119 || code == PREINCREMENT_EXPR || code == PREDECREMENT_EXPR);
2121 /* Prefix or postfix? */
2122 if (code == POSTINCREMENT_EXPR || code == POSTDECREMENT_EXPR)
2123 /* Faster to treat as prefix if result is not used. */
2124 postfix = want_value;
2125 else
2126 postfix = false;
2128 /* For postfix, make sure the inner expression's post side effects
2129 are executed after side effects from this expression. */
2130 if (postfix)
2131 post_p = &post;
2133 /* Add or subtract? */
2134 if (code == PREINCREMENT_EXPR || code == POSTINCREMENT_EXPR)
2135 arith_code = PLUS_EXPR;
2136 else
2137 arith_code = MINUS_EXPR;
2139 /* Gimplify the LHS into a GIMPLE lvalue. */
2140 lvalue = TREE_OPERAND (*expr_p, 0);
2141 ret = gimplify_expr (&lvalue, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
2142 if (ret == GS_ERROR)
2143 return ret;
2145 /* Extract the operands to the arithmetic operation. */
2146 lhs = lvalue;
2147 rhs = TREE_OPERAND (*expr_p, 1);
2149 /* For postfix operator, we evaluate the LHS to an rvalue and then use
2150 that as the result value and in the postqueue operation. */
2151 if (postfix)
2153 ret = gimplify_expr (&lhs, pre_p, post_p, is_gimple_val, fb_rvalue);
2154 if (ret == GS_ERROR)
2155 return ret;
2157 lhs = get_initialized_tmp_var (lhs, pre_p, NULL);
2160 /* For POINTERs increment, use POINTER_PLUS_EXPR. */
2161 if (POINTER_TYPE_P (TREE_TYPE (lhs)))
2163 rhs = convert_to_ptrofftype_loc (loc, rhs);
2164 if (arith_code == MINUS_EXPR)
2165 rhs = fold_build1_loc (loc, NEGATE_EXPR, TREE_TYPE (rhs), rhs);
2166 t1 = fold_build2 (POINTER_PLUS_EXPR, TREE_TYPE (*expr_p), lhs, rhs);
2168 else
2169 t1 = fold_convert (TREE_TYPE (*expr_p),
2170 fold_build2 (arith_code, arith_type,
2171 fold_convert (arith_type, lhs),
2172 fold_convert (arith_type, rhs)));
2174 if (postfix)
2176 gimplify_assign (lvalue, t1, pre_p);
2177 gimplify_seq_add_seq (orig_post_p, post);
2178 *expr_p = lhs;
2179 return GS_ALL_DONE;
2181 else
2183 *expr_p = build2 (MODIFY_EXPR, TREE_TYPE (lvalue), lvalue, t1);
2184 return GS_OK;
2188 /* If *EXPR_P has a variable sized type, wrap it in a WITH_SIZE_EXPR. */
2190 static void
2191 maybe_with_size_expr (tree *expr_p)
2193 tree expr = *expr_p;
2194 tree type = TREE_TYPE (expr);
2195 tree size;
2197 /* If we've already wrapped this or the type is error_mark_node, we can't do
2198 anything. */
2199 if (TREE_CODE (expr) == WITH_SIZE_EXPR
2200 || type == error_mark_node)
2201 return;
2203 /* If the size isn't known or is a constant, we have nothing to do. */
2204 size = TYPE_SIZE_UNIT (type);
2205 if (!size || TREE_CODE (size) == INTEGER_CST)
2206 return;
2208 /* Otherwise, make a WITH_SIZE_EXPR. */
2209 size = unshare_expr (size);
2210 size = SUBSTITUTE_PLACEHOLDER_IN_EXPR (size, expr);
2211 *expr_p = build2 (WITH_SIZE_EXPR, type, expr, size);
2214 /* Helper for gimplify_call_expr. Gimplify a single argument *ARG_P
2215 Store any side-effects in PRE_P. CALL_LOCATION is the location of
2216 the CALL_EXPR. */
2218 enum gimplify_status
2219 gimplify_arg (tree *arg_p, gimple_seq *pre_p, location_t call_location)
2221 bool (*test) (tree);
2222 fallback_t fb;
2224 /* In general, we allow lvalues for function arguments to avoid
2225 extra overhead of copying large aggregates out of even larger
2226 aggregates into temporaries only to copy the temporaries to
2227 the argument list. Make optimizers happy by pulling out to
2228 temporaries those types that fit in registers. */
2229 if (is_gimple_reg_type (TREE_TYPE (*arg_p)))
2230 test = is_gimple_val, fb = fb_rvalue;
2231 else
2233 test = is_gimple_lvalue, fb = fb_either;
2234 /* Also strip a TARGET_EXPR that would force an extra copy. */
2235 if (TREE_CODE (*arg_p) == TARGET_EXPR)
2237 tree init = TARGET_EXPR_INITIAL (*arg_p);
2238 if (init
2239 && !VOID_TYPE_P (TREE_TYPE (init)))
2240 *arg_p = init;
2244 /* If this is a variable sized type, we must remember the size. */
2245 maybe_with_size_expr (arg_p);
2247 /* FIXME diagnostics: This will mess up gcc.dg/Warray-bounds.c. */
2248 /* Make sure arguments have the same location as the function call
2249 itself. */
2250 protected_set_expr_location (*arg_p, call_location);
2252 /* There is a sequence point before a function call. Side effects in
2253 the argument list must occur before the actual call. So, when
2254 gimplifying arguments, force gimplify_expr to use an internal
2255 post queue which is then appended to the end of PRE_P. */
2256 return gimplify_expr (arg_p, pre_p, NULL, test, fb);
2259 /* Don't fold inside offloading regions: it can break code by adding decl
2260 references that weren't in the source. We'll do it during omplower pass
2261 instead. */
2263 static bool
2264 maybe_fold_stmt (gimple_stmt_iterator *gsi)
2266 struct gimplify_omp_ctx *ctx;
2267 for (ctx = gimplify_omp_ctxp; ctx; ctx = ctx->outer_context)
2268 if (ctx->region_type == ORT_TARGET)
2269 return false;
2270 return fold_stmt (gsi);
2273 /* Gimplify the CALL_EXPR node *EXPR_P into the GIMPLE sequence PRE_P.
2274 WANT_VALUE is true if the result of the call is desired. */
2276 static enum gimplify_status
2277 gimplify_call_expr (tree *expr_p, gimple_seq *pre_p, bool want_value)
2279 tree fndecl, parms, p, fnptrtype;
2280 enum gimplify_status ret;
2281 int i, nargs;
2282 gcall *call;
2283 bool builtin_va_start_p = false;
2284 location_t loc = EXPR_LOCATION (*expr_p);
2286 gcc_assert (TREE_CODE (*expr_p) == CALL_EXPR);
2288 /* For reliable diagnostics during inlining, it is necessary that
2289 every call_expr be annotated with file and line. */
2290 if (! EXPR_HAS_LOCATION (*expr_p))
2291 SET_EXPR_LOCATION (*expr_p, input_location);
2293 /* Gimplify internal functions created in the FEs. */
2294 if (CALL_EXPR_FN (*expr_p) == NULL_TREE)
2296 if (want_value)
2297 return GS_ALL_DONE;
2299 nargs = call_expr_nargs (*expr_p);
2300 enum internal_fn ifn = CALL_EXPR_IFN (*expr_p);
2301 auto_vec<tree> vargs (nargs);
2303 for (i = 0; i < nargs; i++)
2305 gimplify_arg (&CALL_EXPR_ARG (*expr_p, i), pre_p,
2306 EXPR_LOCATION (*expr_p));
2307 vargs.quick_push (CALL_EXPR_ARG (*expr_p, i));
2309 gimple call = gimple_build_call_internal_vec (ifn, vargs);
2310 gimplify_seq_add_stmt (pre_p, call);
2311 return GS_ALL_DONE;
2314 /* This may be a call to a builtin function.
2316 Builtin function calls may be transformed into different
2317 (and more efficient) builtin function calls under certain
2318 circumstances. Unfortunately, gimplification can muck things
2319 up enough that the builtin expanders are not aware that certain
2320 transformations are still valid.
2322 So we attempt transformation/gimplification of the call before
2323 we gimplify the CALL_EXPR. At this time we do not manage to
2324 transform all calls in the same manner as the expanders do, but
2325 we do transform most of them. */
2326 fndecl = get_callee_fndecl (*expr_p);
2327 if (fndecl
2328 && DECL_BUILT_IN_CLASS (fndecl) == BUILT_IN_NORMAL)
2329 switch (DECL_FUNCTION_CODE (fndecl))
2331 case BUILT_IN_VA_START:
2333 builtin_va_start_p = TRUE;
2334 if (call_expr_nargs (*expr_p) < 2)
2336 error ("too few arguments to function %<va_start%>");
2337 *expr_p = build_empty_stmt (EXPR_LOCATION (*expr_p));
2338 return GS_OK;
2341 if (fold_builtin_next_arg (*expr_p, true))
2343 *expr_p = build_empty_stmt (EXPR_LOCATION (*expr_p));
2344 return GS_OK;
2346 break;
2348 case BUILT_IN_LINE:
2350 *expr_p = build_int_cst (TREE_TYPE (*expr_p),
2351 LOCATION_LINE (EXPR_LOCATION (*expr_p)));
2352 return GS_OK;
2354 case BUILT_IN_FILE:
2356 const char *locfile = LOCATION_FILE (EXPR_LOCATION (*expr_p));
2357 *expr_p = build_string_literal (strlen (locfile) + 1, locfile);
2358 return GS_OK;
2360 case BUILT_IN_FUNCTION:
2362 const char *function;
2363 function = IDENTIFIER_POINTER (DECL_NAME (current_function_decl));
2364 *expr_p = build_string_literal (strlen (function) + 1, function);
2365 return GS_OK;
2367 default:
2370 if (fndecl && DECL_BUILT_IN (fndecl))
2372 tree new_tree = fold_call_expr (input_location, *expr_p, !want_value);
2373 if (new_tree && new_tree != *expr_p)
2375 /* There was a transformation of this call which computes the
2376 same value, but in a more efficient way. Return and try
2377 again. */
2378 *expr_p = new_tree;
2379 return GS_OK;
2383 /* Remember the original function pointer type. */
2384 fnptrtype = TREE_TYPE (CALL_EXPR_FN (*expr_p));
2386 /* There is a sequence point before the call, so any side effects in
2387 the calling expression must occur before the actual call. Force
2388 gimplify_expr to use an internal post queue. */
2389 ret = gimplify_expr (&CALL_EXPR_FN (*expr_p), pre_p, NULL,
2390 is_gimple_call_addr, fb_rvalue);
2392 nargs = call_expr_nargs (*expr_p);
2394 /* Get argument types for verification. */
2395 fndecl = get_callee_fndecl (*expr_p);
2396 parms = NULL_TREE;
2397 if (fndecl)
2398 parms = TYPE_ARG_TYPES (TREE_TYPE (fndecl));
2399 else
2400 parms = TYPE_ARG_TYPES (TREE_TYPE (fnptrtype));
2402 if (fndecl && DECL_ARGUMENTS (fndecl))
2403 p = DECL_ARGUMENTS (fndecl);
2404 else if (parms)
2405 p = parms;
2406 else
2407 p = NULL_TREE;
2408 for (i = 0; i < nargs && p; i++, p = TREE_CHAIN (p))
2411 /* If the last argument is __builtin_va_arg_pack () and it is not
2412 passed as a named argument, decrease the number of CALL_EXPR
2413 arguments and set instead the CALL_EXPR_VA_ARG_PACK flag. */
2414 if (!p
2415 && i < nargs
2416 && TREE_CODE (CALL_EXPR_ARG (*expr_p, nargs - 1)) == CALL_EXPR)
2418 tree last_arg = CALL_EXPR_ARG (*expr_p, nargs - 1);
2419 tree last_arg_fndecl = get_callee_fndecl (last_arg);
2421 if (last_arg_fndecl
2422 && TREE_CODE (last_arg_fndecl) == FUNCTION_DECL
2423 && DECL_BUILT_IN_CLASS (last_arg_fndecl) == BUILT_IN_NORMAL
2424 && DECL_FUNCTION_CODE (last_arg_fndecl) == BUILT_IN_VA_ARG_PACK)
2426 tree call = *expr_p;
2428 --nargs;
2429 *expr_p = build_call_array_loc (loc, TREE_TYPE (call),
2430 CALL_EXPR_FN (call),
2431 nargs, CALL_EXPR_ARGP (call));
2433 /* Copy all CALL_EXPR flags, location and block, except
2434 CALL_EXPR_VA_ARG_PACK flag. */
2435 CALL_EXPR_STATIC_CHAIN (*expr_p) = CALL_EXPR_STATIC_CHAIN (call);
2436 CALL_EXPR_TAILCALL (*expr_p) = CALL_EXPR_TAILCALL (call);
2437 CALL_EXPR_RETURN_SLOT_OPT (*expr_p)
2438 = CALL_EXPR_RETURN_SLOT_OPT (call);
2439 CALL_FROM_THUNK_P (*expr_p) = CALL_FROM_THUNK_P (call);
2440 SET_EXPR_LOCATION (*expr_p, EXPR_LOCATION (call));
2442 /* Set CALL_EXPR_VA_ARG_PACK. */
2443 CALL_EXPR_VA_ARG_PACK (*expr_p) = 1;
2447 /* Gimplify the function arguments. */
2448 if (nargs > 0)
2450 for (i = (PUSH_ARGS_REVERSED ? nargs - 1 : 0);
2451 PUSH_ARGS_REVERSED ? i >= 0 : i < nargs;
2452 PUSH_ARGS_REVERSED ? i-- : i++)
2454 enum gimplify_status t;
2456 /* Avoid gimplifying the second argument to va_start, which needs to
2457 be the plain PARM_DECL. */
2458 if ((i != 1) || !builtin_va_start_p)
2460 t = gimplify_arg (&CALL_EXPR_ARG (*expr_p, i), pre_p,
2461 EXPR_LOCATION (*expr_p));
2463 if (t == GS_ERROR)
2464 ret = GS_ERROR;
2469 /* Gimplify the static chain. */
2470 if (CALL_EXPR_STATIC_CHAIN (*expr_p))
2472 if (fndecl && !DECL_STATIC_CHAIN (fndecl))
2473 CALL_EXPR_STATIC_CHAIN (*expr_p) = NULL;
2474 else
2476 enum gimplify_status t;
2477 t = gimplify_arg (&CALL_EXPR_STATIC_CHAIN (*expr_p), pre_p,
2478 EXPR_LOCATION (*expr_p));
2479 if (t == GS_ERROR)
2480 ret = GS_ERROR;
2484 /* Verify the function result. */
2485 if (want_value && fndecl
2486 && VOID_TYPE_P (TREE_TYPE (TREE_TYPE (fnptrtype))))
2488 error_at (loc, "using result of function returning %<void%>");
2489 ret = GS_ERROR;
2492 /* Try this again in case gimplification exposed something. */
2493 if (ret != GS_ERROR)
2495 tree new_tree = fold_call_expr (input_location, *expr_p, !want_value);
2497 if (new_tree && new_tree != *expr_p)
2499 /* There was a transformation of this call which computes the
2500 same value, but in a more efficient way. Return and try
2501 again. */
2502 *expr_p = new_tree;
2503 return GS_OK;
2506 else
2508 *expr_p = error_mark_node;
2509 return GS_ERROR;
2512 /* If the function is "const" or "pure", then clear TREE_SIDE_EFFECTS on its
2513 decl. This allows us to eliminate redundant or useless
2514 calls to "const" functions. */
2515 if (TREE_CODE (*expr_p) == CALL_EXPR)
2517 int flags = call_expr_flags (*expr_p);
2518 if (flags & (ECF_CONST | ECF_PURE)
2519 /* An infinite loop is considered a side effect. */
2520 && !(flags & (ECF_LOOPING_CONST_OR_PURE)))
2521 TREE_SIDE_EFFECTS (*expr_p) = 0;
2524 /* If the value is not needed by the caller, emit a new GIMPLE_CALL
2525 and clear *EXPR_P. Otherwise, leave *EXPR_P in its gimplified
2526 form and delegate the creation of a GIMPLE_CALL to
2527 gimplify_modify_expr. This is always possible because when
2528 WANT_VALUE is true, the caller wants the result of this call into
2529 a temporary, which means that we will emit an INIT_EXPR in
2530 internal_get_tmp_var which will then be handled by
2531 gimplify_modify_expr. */
2532 if (!want_value)
2534 /* The CALL_EXPR in *EXPR_P is already in GIMPLE form, so all we
2535 have to do is replicate it as a GIMPLE_CALL tuple. */
2536 gimple_stmt_iterator gsi;
2537 call = gimple_build_call_from_tree (*expr_p);
2538 gimple_call_set_fntype (call, TREE_TYPE (fnptrtype));
2539 notice_special_calls (call);
2540 gimplify_seq_add_stmt (pre_p, call);
2541 gsi = gsi_last (*pre_p);
2542 maybe_fold_stmt (&gsi);
2543 *expr_p = NULL_TREE;
2545 else
2546 /* Remember the original function type. */
2547 CALL_EXPR_FN (*expr_p) = build1 (NOP_EXPR, fnptrtype,
2548 CALL_EXPR_FN (*expr_p));
2550 return ret;
2553 /* Handle shortcut semantics in the predicate operand of a COND_EXPR by
2554 rewriting it into multiple COND_EXPRs, and possibly GOTO_EXPRs.
2556 TRUE_LABEL_P and FALSE_LABEL_P point to the labels to jump to if the
2557 condition is true or false, respectively. If null, we should generate
2558 our own to skip over the evaluation of this specific expression.
2560 LOCUS is the source location of the COND_EXPR.
2562 This function is the tree equivalent of do_jump.
2564 shortcut_cond_r should only be called by shortcut_cond_expr. */
2566 static tree
2567 shortcut_cond_r (tree pred, tree *true_label_p, tree *false_label_p,
2568 location_t locus)
2570 tree local_label = NULL_TREE;
2571 tree t, expr = NULL;
2573 /* OK, it's not a simple case; we need to pull apart the COND_EXPR to
2574 retain the shortcut semantics. Just insert the gotos here;
2575 shortcut_cond_expr will append the real blocks later. */
2576 if (TREE_CODE (pred) == TRUTH_ANDIF_EXPR)
2578 location_t new_locus;
2580 /* Turn if (a && b) into
2582 if (a); else goto no;
2583 if (b) goto yes; else goto no;
2584 (no:) */
2586 if (false_label_p == NULL)
2587 false_label_p = &local_label;
2589 /* Keep the original source location on the first 'if'. */
2590 t = shortcut_cond_r (TREE_OPERAND (pred, 0), NULL, false_label_p, locus);
2591 append_to_statement_list (t, &expr);
2593 /* Set the source location of the && on the second 'if'. */
2594 new_locus = EXPR_HAS_LOCATION (pred) ? EXPR_LOCATION (pred) : locus;
2595 t = shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p, false_label_p,
2596 new_locus);
2597 append_to_statement_list (t, &expr);
2599 else if (TREE_CODE (pred) == TRUTH_ORIF_EXPR)
2601 location_t new_locus;
2603 /* Turn if (a || b) into
2605 if (a) goto yes;
2606 if (b) goto yes; else goto no;
2607 (yes:) */
2609 if (true_label_p == NULL)
2610 true_label_p = &local_label;
2612 /* Keep the original source location on the first 'if'. */
2613 t = shortcut_cond_r (TREE_OPERAND (pred, 0), true_label_p, NULL, locus);
2614 append_to_statement_list (t, &expr);
2616 /* Set the source location of the || on the second 'if'. */
2617 new_locus = EXPR_HAS_LOCATION (pred) ? EXPR_LOCATION (pred) : locus;
2618 t = shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p, false_label_p,
2619 new_locus);
2620 append_to_statement_list (t, &expr);
2622 else if (TREE_CODE (pred) == COND_EXPR
2623 && !VOID_TYPE_P (TREE_TYPE (TREE_OPERAND (pred, 1)))
2624 && !VOID_TYPE_P (TREE_TYPE (TREE_OPERAND (pred, 2))))
2626 location_t new_locus;
2628 /* As long as we're messing with gotos, turn if (a ? b : c) into
2629 if (a)
2630 if (b) goto yes; else goto no;
2631 else
2632 if (c) goto yes; else goto no;
2634 Don't do this if one of the arms has void type, which can happen
2635 in C++ when the arm is throw. */
2637 /* Keep the original source location on the first 'if'. Set the source
2638 location of the ? on the second 'if'. */
2639 new_locus = EXPR_HAS_LOCATION (pred) ? EXPR_LOCATION (pred) : locus;
2640 expr = build3 (COND_EXPR, void_type_node, TREE_OPERAND (pred, 0),
2641 shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p,
2642 false_label_p, locus),
2643 shortcut_cond_r (TREE_OPERAND (pred, 2), true_label_p,
2644 false_label_p, new_locus));
2646 else
2648 expr = build3 (COND_EXPR, void_type_node, pred,
2649 build_and_jump (true_label_p),
2650 build_and_jump (false_label_p));
2651 SET_EXPR_LOCATION (expr, locus);
2654 if (local_label)
2656 t = build1 (LABEL_EXPR, void_type_node, local_label);
2657 append_to_statement_list (t, &expr);
2660 return expr;
2663 /* Given a conditional expression EXPR with short-circuit boolean
2664 predicates using TRUTH_ANDIF_EXPR or TRUTH_ORIF_EXPR, break the
2665 predicate apart into the equivalent sequence of conditionals. */
2667 static tree
2668 shortcut_cond_expr (tree expr)
2670 tree pred = TREE_OPERAND (expr, 0);
2671 tree then_ = TREE_OPERAND (expr, 1);
2672 tree else_ = TREE_OPERAND (expr, 2);
2673 tree true_label, false_label, end_label, t;
2674 tree *true_label_p;
2675 tree *false_label_p;
2676 bool emit_end, emit_false, jump_over_else;
2677 bool then_se = then_ && TREE_SIDE_EFFECTS (then_);
2678 bool else_se = else_ && TREE_SIDE_EFFECTS (else_);
2680 /* First do simple transformations. */
2681 if (!else_se)
2683 /* If there is no 'else', turn
2684 if (a && b) then c
2685 into
2686 if (a) if (b) then c. */
2687 while (TREE_CODE (pred) == TRUTH_ANDIF_EXPR)
2689 /* Keep the original source location on the first 'if'. */
2690 location_t locus = EXPR_LOC_OR_LOC (expr, input_location);
2691 TREE_OPERAND (expr, 0) = TREE_OPERAND (pred, 1);
2692 /* Set the source location of the && on the second 'if'. */
2693 if (EXPR_HAS_LOCATION (pred))
2694 SET_EXPR_LOCATION (expr, EXPR_LOCATION (pred));
2695 then_ = shortcut_cond_expr (expr);
2696 then_se = then_ && TREE_SIDE_EFFECTS (then_);
2697 pred = TREE_OPERAND (pred, 0);
2698 expr = build3 (COND_EXPR, void_type_node, pred, then_, NULL_TREE);
2699 SET_EXPR_LOCATION (expr, locus);
2703 if (!then_se)
2705 /* If there is no 'then', turn
2706 if (a || b); else d
2707 into
2708 if (a); else if (b); else d. */
2709 while (TREE_CODE (pred) == TRUTH_ORIF_EXPR)
2711 /* Keep the original source location on the first 'if'. */
2712 location_t locus = EXPR_LOC_OR_LOC (expr, input_location);
2713 TREE_OPERAND (expr, 0) = TREE_OPERAND (pred, 1);
2714 /* Set the source location of the || on the second 'if'. */
2715 if (EXPR_HAS_LOCATION (pred))
2716 SET_EXPR_LOCATION (expr, EXPR_LOCATION (pred));
2717 else_ = shortcut_cond_expr (expr);
2718 else_se = else_ && TREE_SIDE_EFFECTS (else_);
2719 pred = TREE_OPERAND (pred, 0);
2720 expr = build3 (COND_EXPR, void_type_node, pred, NULL_TREE, else_);
2721 SET_EXPR_LOCATION (expr, locus);
2725 /* If we're done, great. */
2726 if (TREE_CODE (pred) != TRUTH_ANDIF_EXPR
2727 && TREE_CODE (pred) != TRUTH_ORIF_EXPR)
2728 return expr;
2730 /* Otherwise we need to mess with gotos. Change
2731 if (a) c; else d;
2733 if (a); else goto no;
2734 c; goto end;
2735 no: d; end:
2736 and recursively gimplify the condition. */
2738 true_label = false_label = end_label = NULL_TREE;
2740 /* If our arms just jump somewhere, hijack those labels so we don't
2741 generate jumps to jumps. */
2743 if (then_
2744 && TREE_CODE (then_) == GOTO_EXPR
2745 && TREE_CODE (GOTO_DESTINATION (then_)) == LABEL_DECL)
2747 true_label = GOTO_DESTINATION (then_);
2748 then_ = NULL;
2749 then_se = false;
2752 if (else_
2753 && TREE_CODE (else_) == GOTO_EXPR
2754 && TREE_CODE (GOTO_DESTINATION (else_)) == LABEL_DECL)
2756 false_label = GOTO_DESTINATION (else_);
2757 else_ = NULL;
2758 else_se = false;
2761 /* If we aren't hijacking a label for the 'then' branch, it falls through. */
2762 if (true_label)
2763 true_label_p = &true_label;
2764 else
2765 true_label_p = NULL;
2767 /* The 'else' branch also needs a label if it contains interesting code. */
2768 if (false_label || else_se)
2769 false_label_p = &false_label;
2770 else
2771 false_label_p = NULL;
2773 /* If there was nothing else in our arms, just forward the label(s). */
2774 if (!then_se && !else_se)
2775 return shortcut_cond_r (pred, true_label_p, false_label_p,
2776 EXPR_LOC_OR_LOC (expr, input_location));
2778 /* If our last subexpression already has a terminal label, reuse it. */
2779 if (else_se)
2780 t = expr_last (else_);
2781 else if (then_se)
2782 t = expr_last (then_);
2783 else
2784 t = NULL;
2785 if (t && TREE_CODE (t) == LABEL_EXPR)
2786 end_label = LABEL_EXPR_LABEL (t);
2788 /* If we don't care about jumping to the 'else' branch, jump to the end
2789 if the condition is false. */
2790 if (!false_label_p)
2791 false_label_p = &end_label;
2793 /* We only want to emit these labels if we aren't hijacking them. */
2794 emit_end = (end_label == NULL_TREE);
2795 emit_false = (false_label == NULL_TREE);
2797 /* We only emit the jump over the else clause if we have to--if the
2798 then clause may fall through. Otherwise we can wind up with a
2799 useless jump and a useless label at the end of gimplified code,
2800 which will cause us to think that this conditional as a whole
2801 falls through even if it doesn't. If we then inline a function
2802 which ends with such a condition, that can cause us to issue an
2803 inappropriate warning about control reaching the end of a
2804 non-void function. */
2805 jump_over_else = block_may_fallthru (then_);
2807 pred = shortcut_cond_r (pred, true_label_p, false_label_p,
2808 EXPR_LOC_OR_LOC (expr, input_location));
2810 expr = NULL;
2811 append_to_statement_list (pred, &expr);
2813 append_to_statement_list (then_, &expr);
2814 if (else_se)
2816 if (jump_over_else)
2818 tree last = expr_last (expr);
2819 t = build_and_jump (&end_label);
2820 if (EXPR_HAS_LOCATION (last))
2821 SET_EXPR_LOCATION (t, EXPR_LOCATION (last));
2822 append_to_statement_list (t, &expr);
2824 if (emit_false)
2826 t = build1 (LABEL_EXPR, void_type_node, false_label);
2827 append_to_statement_list (t, &expr);
2829 append_to_statement_list (else_, &expr);
2831 if (emit_end && end_label)
2833 t = build1 (LABEL_EXPR, void_type_node, end_label);
2834 append_to_statement_list (t, &expr);
2837 return expr;
2840 /* EXPR is used in a boolean context; make sure it has BOOLEAN_TYPE. */
2842 tree
2843 gimple_boolify (tree expr)
2845 tree type = TREE_TYPE (expr);
2846 location_t loc = EXPR_LOCATION (expr);
2848 if (TREE_CODE (expr) == NE_EXPR
2849 && TREE_CODE (TREE_OPERAND (expr, 0)) == CALL_EXPR
2850 && integer_zerop (TREE_OPERAND (expr, 1)))
2852 tree call = TREE_OPERAND (expr, 0);
2853 tree fn = get_callee_fndecl (call);
2855 /* For __builtin_expect ((long) (x), y) recurse into x as well
2856 if x is truth_value_p. */
2857 if (fn
2858 && DECL_BUILT_IN_CLASS (fn) == BUILT_IN_NORMAL
2859 && DECL_FUNCTION_CODE (fn) == BUILT_IN_EXPECT
2860 && call_expr_nargs (call) == 2)
2862 tree arg = CALL_EXPR_ARG (call, 0);
2863 if (arg)
2865 if (TREE_CODE (arg) == NOP_EXPR
2866 && TREE_TYPE (arg) == TREE_TYPE (call))
2867 arg = TREE_OPERAND (arg, 0);
2868 if (truth_value_p (TREE_CODE (arg)))
2870 arg = gimple_boolify (arg);
2871 CALL_EXPR_ARG (call, 0)
2872 = fold_convert_loc (loc, TREE_TYPE (call), arg);
2878 switch (TREE_CODE (expr))
2880 case TRUTH_AND_EXPR:
2881 case TRUTH_OR_EXPR:
2882 case TRUTH_XOR_EXPR:
2883 case TRUTH_ANDIF_EXPR:
2884 case TRUTH_ORIF_EXPR:
2885 /* Also boolify the arguments of truth exprs. */
2886 TREE_OPERAND (expr, 1) = gimple_boolify (TREE_OPERAND (expr, 1));
2887 /* FALLTHRU */
2889 case TRUTH_NOT_EXPR:
2890 TREE_OPERAND (expr, 0) = gimple_boolify (TREE_OPERAND (expr, 0));
2892 /* These expressions always produce boolean results. */
2893 if (TREE_CODE (type) != BOOLEAN_TYPE)
2894 TREE_TYPE (expr) = boolean_type_node;
2895 return expr;
2897 case ANNOTATE_EXPR:
2898 switch ((enum annot_expr_kind) TREE_INT_CST_LOW (TREE_OPERAND (expr, 1)))
2900 case annot_expr_ivdep_kind:
2901 case annot_expr_no_vector_kind:
2902 case annot_expr_vector_kind:
2903 TREE_OPERAND (expr, 0) = gimple_boolify (TREE_OPERAND (expr, 0));
2904 if (TREE_CODE (type) != BOOLEAN_TYPE)
2905 TREE_TYPE (expr) = boolean_type_node;
2906 return expr;
2907 default:
2908 gcc_unreachable ();
2911 default:
2912 if (COMPARISON_CLASS_P (expr))
2914 /* There expressions always prduce boolean results. */
2915 if (TREE_CODE (type) != BOOLEAN_TYPE)
2916 TREE_TYPE (expr) = boolean_type_node;
2917 return expr;
2919 /* Other expressions that get here must have boolean values, but
2920 might need to be converted to the appropriate mode. */
2921 if (TREE_CODE (type) == BOOLEAN_TYPE)
2922 return expr;
2923 return fold_convert_loc (loc, boolean_type_node, expr);
2927 /* Given a conditional expression *EXPR_P without side effects, gimplify
2928 its operands. New statements are inserted to PRE_P. */
2930 static enum gimplify_status
2931 gimplify_pure_cond_expr (tree *expr_p, gimple_seq *pre_p)
2933 tree expr = *expr_p, cond;
2934 enum gimplify_status ret, tret;
2935 enum tree_code code;
2937 cond = gimple_boolify (COND_EXPR_COND (expr));
2939 /* We need to handle && and || specially, as their gimplification
2940 creates pure cond_expr, thus leading to an infinite cycle otherwise. */
2941 code = TREE_CODE (cond);
2942 if (code == TRUTH_ANDIF_EXPR)
2943 TREE_SET_CODE (cond, TRUTH_AND_EXPR);
2944 else if (code == TRUTH_ORIF_EXPR)
2945 TREE_SET_CODE (cond, TRUTH_OR_EXPR);
2946 ret = gimplify_expr (&cond, pre_p, NULL, is_gimple_condexpr, fb_rvalue);
2947 COND_EXPR_COND (*expr_p) = cond;
2949 tret = gimplify_expr (&COND_EXPR_THEN (expr), pre_p, NULL,
2950 is_gimple_val, fb_rvalue);
2951 ret = MIN (ret, tret);
2952 tret = gimplify_expr (&COND_EXPR_ELSE (expr), pre_p, NULL,
2953 is_gimple_val, fb_rvalue);
2955 return MIN (ret, tret);
2958 /* Return true if evaluating EXPR could trap.
2959 EXPR is GENERIC, while tree_could_trap_p can be called
2960 only on GIMPLE. */
2962 static bool
2963 generic_expr_could_trap_p (tree expr)
2965 unsigned i, n;
2967 if (!expr || is_gimple_val (expr))
2968 return false;
2970 if (!EXPR_P (expr) || tree_could_trap_p (expr))
2971 return true;
2973 n = TREE_OPERAND_LENGTH (expr);
2974 for (i = 0; i < n; i++)
2975 if (generic_expr_could_trap_p (TREE_OPERAND (expr, i)))
2976 return true;
2978 return false;
2981 /* Convert the conditional expression pointed to by EXPR_P '(p) ? a : b;'
2982 into
2984 if (p) if (p)
2985 t1 = a; a;
2986 else or else
2987 t1 = b; b;
2990 The second form is used when *EXPR_P is of type void.
2992 PRE_P points to the list where side effects that must happen before
2993 *EXPR_P should be stored. */
2995 static enum gimplify_status
2996 gimplify_cond_expr (tree *expr_p, gimple_seq *pre_p, fallback_t fallback)
2998 tree expr = *expr_p;
2999 tree type = TREE_TYPE (expr);
3000 location_t loc = EXPR_LOCATION (expr);
3001 tree tmp, arm1, arm2;
3002 enum gimplify_status ret;
3003 tree label_true, label_false, label_cont;
3004 bool have_then_clause_p, have_else_clause_p;
3005 gcond *cond_stmt;
3006 enum tree_code pred_code;
3007 gimple_seq seq = NULL;
3009 /* If this COND_EXPR has a value, copy the values into a temporary within
3010 the arms. */
3011 if (!VOID_TYPE_P (type))
3013 tree then_ = TREE_OPERAND (expr, 1), else_ = TREE_OPERAND (expr, 2);
3014 tree result;
3016 /* If either an rvalue is ok or we do not require an lvalue, create the
3017 temporary. But we cannot do that if the type is addressable. */
3018 if (((fallback & fb_rvalue) || !(fallback & fb_lvalue))
3019 && !TREE_ADDRESSABLE (type))
3021 if (gimplify_ctxp->allow_rhs_cond_expr
3022 /* If either branch has side effects or could trap, it can't be
3023 evaluated unconditionally. */
3024 && !TREE_SIDE_EFFECTS (then_)
3025 && !generic_expr_could_trap_p (then_)
3026 && !TREE_SIDE_EFFECTS (else_)
3027 && !generic_expr_could_trap_p (else_))
3028 return gimplify_pure_cond_expr (expr_p, pre_p);
3030 tmp = create_tmp_var (type, "iftmp");
3031 result = tmp;
3034 /* Otherwise, only create and copy references to the values. */
3035 else
3037 type = build_pointer_type (type);
3039 if (!VOID_TYPE_P (TREE_TYPE (then_)))
3040 then_ = build_fold_addr_expr_loc (loc, then_);
3042 if (!VOID_TYPE_P (TREE_TYPE (else_)))
3043 else_ = build_fold_addr_expr_loc (loc, else_);
3045 expr
3046 = build3 (COND_EXPR, type, TREE_OPERAND (expr, 0), then_, else_);
3048 tmp = create_tmp_var (type, "iftmp");
3049 result = build_simple_mem_ref_loc (loc, tmp);
3052 /* Build the new then clause, `tmp = then_;'. But don't build the
3053 assignment if the value is void; in C++ it can be if it's a throw. */
3054 if (!VOID_TYPE_P (TREE_TYPE (then_)))
3055 TREE_OPERAND (expr, 1) = build2 (MODIFY_EXPR, type, tmp, then_);
3057 /* Similarly, build the new else clause, `tmp = else_;'. */
3058 if (!VOID_TYPE_P (TREE_TYPE (else_)))
3059 TREE_OPERAND (expr, 2) = build2 (MODIFY_EXPR, type, tmp, else_);
3061 TREE_TYPE (expr) = void_type_node;
3062 recalculate_side_effects (expr);
3064 /* Move the COND_EXPR to the prequeue. */
3065 gimplify_stmt (&expr, pre_p);
3067 *expr_p = result;
3068 return GS_ALL_DONE;
3071 /* Remove any COMPOUND_EXPR so the following cases will be caught. */
3072 STRIP_TYPE_NOPS (TREE_OPERAND (expr, 0));
3073 if (TREE_CODE (TREE_OPERAND (expr, 0)) == COMPOUND_EXPR)
3074 gimplify_compound_expr (&TREE_OPERAND (expr, 0), pre_p, true);
3076 /* Make sure the condition has BOOLEAN_TYPE. */
3077 TREE_OPERAND (expr, 0) = gimple_boolify (TREE_OPERAND (expr, 0));
3079 /* Break apart && and || conditions. */
3080 if (TREE_CODE (TREE_OPERAND (expr, 0)) == TRUTH_ANDIF_EXPR
3081 || TREE_CODE (TREE_OPERAND (expr, 0)) == TRUTH_ORIF_EXPR)
3083 expr = shortcut_cond_expr (expr);
3085 if (expr != *expr_p)
3087 *expr_p = expr;
3089 /* We can't rely on gimplify_expr to re-gimplify the expanded
3090 form properly, as cleanups might cause the target labels to be
3091 wrapped in a TRY_FINALLY_EXPR. To prevent that, we need to
3092 set up a conditional context. */
3093 gimple_push_condition ();
3094 gimplify_stmt (expr_p, &seq);
3095 gimple_pop_condition (pre_p);
3096 gimple_seq_add_seq (pre_p, seq);
3098 return GS_ALL_DONE;
3102 /* Now do the normal gimplification. */
3104 /* Gimplify condition. */
3105 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, NULL, is_gimple_condexpr,
3106 fb_rvalue);
3107 if (ret == GS_ERROR)
3108 return GS_ERROR;
3109 gcc_assert (TREE_OPERAND (expr, 0) != NULL_TREE);
3111 gimple_push_condition ();
3113 have_then_clause_p = have_else_clause_p = false;
3114 if (TREE_OPERAND (expr, 1) != NULL
3115 && TREE_CODE (TREE_OPERAND (expr, 1)) == GOTO_EXPR
3116 && TREE_CODE (GOTO_DESTINATION (TREE_OPERAND (expr, 1))) == LABEL_DECL
3117 && (DECL_CONTEXT (GOTO_DESTINATION (TREE_OPERAND (expr, 1)))
3118 == current_function_decl)
3119 /* For -O0 avoid this optimization if the COND_EXPR and GOTO_EXPR
3120 have different locations, otherwise we end up with incorrect
3121 location information on the branches. */
3122 && (optimize
3123 || !EXPR_HAS_LOCATION (expr)
3124 || !EXPR_HAS_LOCATION (TREE_OPERAND (expr, 1))
3125 || EXPR_LOCATION (expr) == EXPR_LOCATION (TREE_OPERAND (expr, 1))))
3127 label_true = GOTO_DESTINATION (TREE_OPERAND (expr, 1));
3128 have_then_clause_p = true;
3130 else
3131 label_true = create_artificial_label (UNKNOWN_LOCATION);
3132 if (TREE_OPERAND (expr, 2) != NULL
3133 && TREE_CODE (TREE_OPERAND (expr, 2)) == GOTO_EXPR
3134 && TREE_CODE (GOTO_DESTINATION (TREE_OPERAND (expr, 2))) == LABEL_DECL
3135 && (DECL_CONTEXT (GOTO_DESTINATION (TREE_OPERAND (expr, 2)))
3136 == current_function_decl)
3137 /* For -O0 avoid this optimization if the COND_EXPR and GOTO_EXPR
3138 have different locations, otherwise we end up with incorrect
3139 location information on the branches. */
3140 && (optimize
3141 || !EXPR_HAS_LOCATION (expr)
3142 || !EXPR_HAS_LOCATION (TREE_OPERAND (expr, 2))
3143 || EXPR_LOCATION (expr) == EXPR_LOCATION (TREE_OPERAND (expr, 2))))
3145 label_false = GOTO_DESTINATION (TREE_OPERAND (expr, 2));
3146 have_else_clause_p = true;
3148 else
3149 label_false = create_artificial_label (UNKNOWN_LOCATION);
3151 gimple_cond_get_ops_from_tree (COND_EXPR_COND (expr), &pred_code, &arm1,
3152 &arm2);
3154 cond_stmt = gimple_build_cond (pred_code, arm1, arm2, label_true,
3155 label_false);
3157 gimplify_seq_add_stmt (&seq, cond_stmt);
3158 label_cont = NULL_TREE;
3159 if (!have_then_clause_p)
3161 /* For if (...) {} else { code; } put label_true after
3162 the else block. */
3163 if (TREE_OPERAND (expr, 1) == NULL_TREE
3164 && !have_else_clause_p
3165 && TREE_OPERAND (expr, 2) != NULL_TREE)
3166 label_cont = label_true;
3167 else
3169 gimplify_seq_add_stmt (&seq, gimple_build_label (label_true));
3170 have_then_clause_p = gimplify_stmt (&TREE_OPERAND (expr, 1), &seq);
3171 /* For if (...) { code; } else {} or
3172 if (...) { code; } else goto label; or
3173 if (...) { code; return; } else { ... }
3174 label_cont isn't needed. */
3175 if (!have_else_clause_p
3176 && TREE_OPERAND (expr, 2) != NULL_TREE
3177 && gimple_seq_may_fallthru (seq))
3179 gimple g;
3180 label_cont = create_artificial_label (UNKNOWN_LOCATION);
3182 g = gimple_build_goto (label_cont);
3184 /* GIMPLE_COND's are very low level; they have embedded
3185 gotos. This particular embedded goto should not be marked
3186 with the location of the original COND_EXPR, as it would
3187 correspond to the COND_EXPR's condition, not the ELSE or the
3188 THEN arms. To avoid marking it with the wrong location, flag
3189 it as "no location". */
3190 gimple_set_do_not_emit_location (g);
3192 gimplify_seq_add_stmt (&seq, g);
3196 if (!have_else_clause_p)
3198 gimplify_seq_add_stmt (&seq, gimple_build_label (label_false));
3199 have_else_clause_p = gimplify_stmt (&TREE_OPERAND (expr, 2), &seq);
3201 if (label_cont)
3202 gimplify_seq_add_stmt (&seq, gimple_build_label (label_cont));
3204 gimple_pop_condition (pre_p);
3205 gimple_seq_add_seq (pre_p, seq);
3207 if (ret == GS_ERROR)
3208 ; /* Do nothing. */
3209 else if (have_then_clause_p || have_else_clause_p)
3210 ret = GS_ALL_DONE;
3211 else
3213 /* Both arms are empty; replace the COND_EXPR with its predicate. */
3214 expr = TREE_OPERAND (expr, 0);
3215 gimplify_stmt (&expr, pre_p);
3218 *expr_p = NULL;
3219 return ret;
3222 /* Prepare the node pointed to by EXPR_P, an is_gimple_addressable expression,
3223 to be marked addressable.
3225 We cannot rely on such an expression being directly markable if a temporary
3226 has been created by the gimplification. In this case, we create another
3227 temporary and initialize it with a copy, which will become a store after we
3228 mark it addressable. This can happen if the front-end passed us something
3229 that it could not mark addressable yet, like a Fortran pass-by-reference
3230 parameter (int) floatvar. */
3232 static void
3233 prepare_gimple_addressable (tree *expr_p, gimple_seq *seq_p)
3235 while (handled_component_p (*expr_p))
3236 expr_p = &TREE_OPERAND (*expr_p, 0);
3237 if (is_gimple_reg (*expr_p))
3239 tree var = get_initialized_tmp_var (*expr_p, seq_p, NULL);
3240 DECL_GIMPLE_REG_P (var) = 0;
3241 *expr_p = var;
3245 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
3246 a call to __builtin_memcpy. */
3248 static enum gimplify_status
3249 gimplify_modify_expr_to_memcpy (tree *expr_p, tree size, bool want_value,
3250 gimple_seq *seq_p)
3252 tree t, to, to_ptr, from, from_ptr;
3253 gcall *gs;
3254 location_t loc = EXPR_LOCATION (*expr_p);
3256 to = TREE_OPERAND (*expr_p, 0);
3257 from = TREE_OPERAND (*expr_p, 1);
3259 /* Mark the RHS addressable. Beware that it may not be possible to do so
3260 directly if a temporary has been created by the gimplification. */
3261 prepare_gimple_addressable (&from, seq_p);
3263 mark_addressable (from);
3264 from_ptr = build_fold_addr_expr_loc (loc, from);
3265 gimplify_arg (&from_ptr, seq_p, loc);
3267 mark_addressable (to);
3268 to_ptr = build_fold_addr_expr_loc (loc, to);
3269 gimplify_arg (&to_ptr, seq_p, loc);
3271 t = builtin_decl_implicit (BUILT_IN_MEMCPY);
3273 gs = gimple_build_call (t, 3, to_ptr, from_ptr, size);
3275 if (want_value)
3277 /* tmp = memcpy() */
3278 t = create_tmp_var (TREE_TYPE (to_ptr));
3279 gimple_call_set_lhs (gs, t);
3280 gimplify_seq_add_stmt (seq_p, gs);
3282 *expr_p = build_simple_mem_ref (t);
3283 return GS_ALL_DONE;
3286 gimplify_seq_add_stmt (seq_p, gs);
3287 *expr_p = NULL;
3288 return GS_ALL_DONE;
3291 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
3292 a call to __builtin_memset. In this case we know that the RHS is
3293 a CONSTRUCTOR with an empty element list. */
3295 static enum gimplify_status
3296 gimplify_modify_expr_to_memset (tree *expr_p, tree size, bool want_value,
3297 gimple_seq *seq_p)
3299 tree t, from, to, to_ptr;
3300 gcall *gs;
3301 location_t loc = EXPR_LOCATION (*expr_p);
3303 /* Assert our assumptions, to abort instead of producing wrong code
3304 silently if they are not met. Beware that the RHS CONSTRUCTOR might
3305 not be immediately exposed. */
3306 from = TREE_OPERAND (*expr_p, 1);
3307 if (TREE_CODE (from) == WITH_SIZE_EXPR)
3308 from = TREE_OPERAND (from, 0);
3310 gcc_assert (TREE_CODE (from) == CONSTRUCTOR
3311 && vec_safe_is_empty (CONSTRUCTOR_ELTS (from)));
3313 /* Now proceed. */
3314 to = TREE_OPERAND (*expr_p, 0);
3316 to_ptr = build_fold_addr_expr_loc (loc, to);
3317 gimplify_arg (&to_ptr, seq_p, loc);
3318 t = builtin_decl_implicit (BUILT_IN_MEMSET);
3320 gs = gimple_build_call (t, 3, to_ptr, integer_zero_node, size);
3322 if (want_value)
3324 /* tmp = memset() */
3325 t = create_tmp_var (TREE_TYPE (to_ptr));
3326 gimple_call_set_lhs (gs, t);
3327 gimplify_seq_add_stmt (seq_p, gs);
3329 *expr_p = build1 (INDIRECT_REF, TREE_TYPE (to), t);
3330 return GS_ALL_DONE;
3333 gimplify_seq_add_stmt (seq_p, gs);
3334 *expr_p = NULL;
3335 return GS_ALL_DONE;
3338 /* A subroutine of gimplify_init_ctor_preeval. Called via walk_tree,
3339 determine, cautiously, if a CONSTRUCTOR overlaps the lhs of an
3340 assignment. Return non-null if we detect a potential overlap. */
3342 struct gimplify_init_ctor_preeval_data
3344 /* The base decl of the lhs object. May be NULL, in which case we
3345 have to assume the lhs is indirect. */
3346 tree lhs_base_decl;
3348 /* The alias set of the lhs object. */
3349 alias_set_type lhs_alias_set;
3352 static tree
3353 gimplify_init_ctor_preeval_1 (tree *tp, int *walk_subtrees, void *xdata)
3355 struct gimplify_init_ctor_preeval_data *data
3356 = (struct gimplify_init_ctor_preeval_data *) xdata;
3357 tree t = *tp;
3359 /* If we find the base object, obviously we have overlap. */
3360 if (data->lhs_base_decl == t)
3361 return t;
3363 /* If the constructor component is indirect, determine if we have a
3364 potential overlap with the lhs. The only bits of information we
3365 have to go on at this point are addressability and alias sets. */
3366 if ((INDIRECT_REF_P (t)
3367 || TREE_CODE (t) == MEM_REF)
3368 && (!data->lhs_base_decl || TREE_ADDRESSABLE (data->lhs_base_decl))
3369 && alias_sets_conflict_p (data->lhs_alias_set, get_alias_set (t)))
3370 return t;
3372 /* If the constructor component is a call, determine if it can hide a
3373 potential overlap with the lhs through an INDIRECT_REF like above.
3374 ??? Ugh - this is completely broken. In fact this whole analysis
3375 doesn't look conservative. */
3376 if (TREE_CODE (t) == CALL_EXPR)
3378 tree type, fntype = TREE_TYPE (TREE_TYPE (CALL_EXPR_FN (t)));
3380 for (type = TYPE_ARG_TYPES (fntype); type; type = TREE_CHAIN (type))
3381 if (POINTER_TYPE_P (TREE_VALUE (type))
3382 && (!data->lhs_base_decl || TREE_ADDRESSABLE (data->lhs_base_decl))
3383 && alias_sets_conflict_p (data->lhs_alias_set,
3384 get_alias_set
3385 (TREE_TYPE (TREE_VALUE (type)))))
3386 return t;
3389 if (IS_TYPE_OR_DECL_P (t))
3390 *walk_subtrees = 0;
3391 return NULL;
3394 /* A subroutine of gimplify_init_constructor. Pre-evaluate EXPR,
3395 force values that overlap with the lhs (as described by *DATA)
3396 into temporaries. */
3398 static void
3399 gimplify_init_ctor_preeval (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
3400 struct gimplify_init_ctor_preeval_data *data)
3402 enum gimplify_status one;
3404 /* If the value is constant, then there's nothing to pre-evaluate. */
3405 if (TREE_CONSTANT (*expr_p))
3407 /* Ensure it does not have side effects, it might contain a reference to
3408 the object we're initializing. */
3409 gcc_assert (!TREE_SIDE_EFFECTS (*expr_p));
3410 return;
3413 /* If the type has non-trivial constructors, we can't pre-evaluate. */
3414 if (TREE_ADDRESSABLE (TREE_TYPE (*expr_p)))
3415 return;
3417 /* Recurse for nested constructors. */
3418 if (TREE_CODE (*expr_p) == CONSTRUCTOR)
3420 unsigned HOST_WIDE_INT ix;
3421 constructor_elt *ce;
3422 vec<constructor_elt, va_gc> *v = CONSTRUCTOR_ELTS (*expr_p);
3424 FOR_EACH_VEC_SAFE_ELT (v, ix, ce)
3425 gimplify_init_ctor_preeval (&ce->value, pre_p, post_p, data);
3427 return;
3430 /* If this is a variable sized type, we must remember the size. */
3431 maybe_with_size_expr (expr_p);
3433 /* Gimplify the constructor element to something appropriate for the rhs
3434 of a MODIFY_EXPR. Given that we know the LHS is an aggregate, we know
3435 the gimplifier will consider this a store to memory. Doing this
3436 gimplification now means that we won't have to deal with complicated
3437 language-specific trees, nor trees like SAVE_EXPR that can induce
3438 exponential search behavior. */
3439 one = gimplify_expr (expr_p, pre_p, post_p, is_gimple_mem_rhs, fb_rvalue);
3440 if (one == GS_ERROR)
3442 *expr_p = NULL;
3443 return;
3446 /* If we gimplified to a bare decl, we can be sure that it doesn't overlap
3447 with the lhs, since "a = { .x=a }" doesn't make sense. This will
3448 always be true for all scalars, since is_gimple_mem_rhs insists on a
3449 temporary variable for them. */
3450 if (DECL_P (*expr_p))
3451 return;
3453 /* If this is of variable size, we have no choice but to assume it doesn't
3454 overlap since we can't make a temporary for it. */
3455 if (TREE_CODE (TYPE_SIZE (TREE_TYPE (*expr_p))) != INTEGER_CST)
3456 return;
3458 /* Otherwise, we must search for overlap ... */
3459 if (!walk_tree (expr_p, gimplify_init_ctor_preeval_1, data, NULL))
3460 return;
3462 /* ... and if found, force the value into a temporary. */
3463 *expr_p = get_formal_tmp_var (*expr_p, pre_p);
3466 /* A subroutine of gimplify_init_ctor_eval. Create a loop for
3467 a RANGE_EXPR in a CONSTRUCTOR for an array.
3469 var = lower;
3470 loop_entry:
3471 object[var] = value;
3472 if (var == upper)
3473 goto loop_exit;
3474 var = var + 1;
3475 goto loop_entry;
3476 loop_exit:
3478 We increment var _after_ the loop exit check because we might otherwise
3479 fail if upper == TYPE_MAX_VALUE (type for upper).
3481 Note that we never have to deal with SAVE_EXPRs here, because this has
3482 already been taken care of for us, in gimplify_init_ctor_preeval(). */
3484 static void gimplify_init_ctor_eval (tree, vec<constructor_elt, va_gc> *,
3485 gimple_seq *, bool);
3487 static void
3488 gimplify_init_ctor_eval_range (tree object, tree lower, tree upper,
3489 tree value, tree array_elt_type,
3490 gimple_seq *pre_p, bool cleared)
3492 tree loop_entry_label, loop_exit_label, fall_thru_label;
3493 tree var, var_type, cref, tmp;
3495 loop_entry_label = create_artificial_label (UNKNOWN_LOCATION);
3496 loop_exit_label = create_artificial_label (UNKNOWN_LOCATION);
3497 fall_thru_label = create_artificial_label (UNKNOWN_LOCATION);
3499 /* Create and initialize the index variable. */
3500 var_type = TREE_TYPE (upper);
3501 var = create_tmp_var (var_type);
3502 gimplify_seq_add_stmt (pre_p, gimple_build_assign (var, lower));
3504 /* Add the loop entry label. */
3505 gimplify_seq_add_stmt (pre_p, gimple_build_label (loop_entry_label));
3507 /* Build the reference. */
3508 cref = build4 (ARRAY_REF, array_elt_type, unshare_expr (object),
3509 var, NULL_TREE, NULL_TREE);
3511 /* If we are a constructor, just call gimplify_init_ctor_eval to do
3512 the store. Otherwise just assign value to the reference. */
3514 if (TREE_CODE (value) == CONSTRUCTOR)
3515 /* NB we might have to call ourself recursively through
3516 gimplify_init_ctor_eval if the value is a constructor. */
3517 gimplify_init_ctor_eval (cref, CONSTRUCTOR_ELTS (value),
3518 pre_p, cleared);
3519 else
3520 gimplify_seq_add_stmt (pre_p, gimple_build_assign (cref, value));
3522 /* We exit the loop when the index var is equal to the upper bound. */
3523 gimplify_seq_add_stmt (pre_p,
3524 gimple_build_cond (EQ_EXPR, var, upper,
3525 loop_exit_label, fall_thru_label));
3527 gimplify_seq_add_stmt (pre_p, gimple_build_label (fall_thru_label));
3529 /* Otherwise, increment the index var... */
3530 tmp = build2 (PLUS_EXPR, var_type, var,
3531 fold_convert (var_type, integer_one_node));
3532 gimplify_seq_add_stmt (pre_p, gimple_build_assign (var, tmp));
3534 /* ...and jump back to the loop entry. */
3535 gimplify_seq_add_stmt (pre_p, gimple_build_goto (loop_entry_label));
3537 /* Add the loop exit label. */
3538 gimplify_seq_add_stmt (pre_p, gimple_build_label (loop_exit_label));
3541 /* Return true if FDECL is accessing a field that is zero sized. */
3543 static bool
3544 zero_sized_field_decl (const_tree fdecl)
3546 if (TREE_CODE (fdecl) == FIELD_DECL && DECL_SIZE (fdecl)
3547 && integer_zerop (DECL_SIZE (fdecl)))
3548 return true;
3549 return false;
3552 /* Return true if TYPE is zero sized. */
3554 static bool
3555 zero_sized_type (const_tree type)
3557 if (AGGREGATE_TYPE_P (type) && TYPE_SIZE (type)
3558 && integer_zerop (TYPE_SIZE (type)))
3559 return true;
3560 return false;
3563 /* A subroutine of gimplify_init_constructor. Generate individual
3564 MODIFY_EXPRs for a CONSTRUCTOR. OBJECT is the LHS against which the
3565 assignments should happen. ELTS is the CONSTRUCTOR_ELTS of the
3566 CONSTRUCTOR. CLEARED is true if the entire LHS object has been
3567 zeroed first. */
3569 static void
3570 gimplify_init_ctor_eval (tree object, vec<constructor_elt, va_gc> *elts,
3571 gimple_seq *pre_p, bool cleared)
3573 tree array_elt_type = NULL;
3574 unsigned HOST_WIDE_INT ix;
3575 tree purpose, value;
3577 if (TREE_CODE (TREE_TYPE (object)) == ARRAY_TYPE)
3578 array_elt_type = TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (object)));
3580 FOR_EACH_CONSTRUCTOR_ELT (elts, ix, purpose, value)
3582 tree cref;
3584 /* NULL values are created above for gimplification errors. */
3585 if (value == NULL)
3586 continue;
3588 if (cleared && initializer_zerop (value))
3589 continue;
3591 /* ??? Here's to hoping the front end fills in all of the indices,
3592 so we don't have to figure out what's missing ourselves. */
3593 gcc_assert (purpose);
3595 /* Skip zero-sized fields, unless value has side-effects. This can
3596 happen with calls to functions returning a zero-sized type, which
3597 we shouldn't discard. As a number of downstream passes don't
3598 expect sets of zero-sized fields, we rely on the gimplification of
3599 the MODIFY_EXPR we make below to drop the assignment statement. */
3600 if (! TREE_SIDE_EFFECTS (value) && zero_sized_field_decl (purpose))
3601 continue;
3603 /* If we have a RANGE_EXPR, we have to build a loop to assign the
3604 whole range. */
3605 if (TREE_CODE (purpose) == RANGE_EXPR)
3607 tree lower = TREE_OPERAND (purpose, 0);
3608 tree upper = TREE_OPERAND (purpose, 1);
3610 /* If the lower bound is equal to upper, just treat it as if
3611 upper was the index. */
3612 if (simple_cst_equal (lower, upper))
3613 purpose = upper;
3614 else
3616 gimplify_init_ctor_eval_range (object, lower, upper, value,
3617 array_elt_type, pre_p, cleared);
3618 continue;
3622 if (array_elt_type)
3624 /* Do not use bitsizetype for ARRAY_REF indices. */
3625 if (TYPE_DOMAIN (TREE_TYPE (object)))
3626 purpose
3627 = fold_convert (TREE_TYPE (TYPE_DOMAIN (TREE_TYPE (object))),
3628 purpose);
3629 cref = build4 (ARRAY_REF, array_elt_type, unshare_expr (object),
3630 purpose, NULL_TREE, NULL_TREE);
3632 else
3634 gcc_assert (TREE_CODE (purpose) == FIELD_DECL);
3635 cref = build3 (COMPONENT_REF, TREE_TYPE (purpose),
3636 unshare_expr (object), purpose, NULL_TREE);
3639 if (TREE_CODE (value) == CONSTRUCTOR
3640 && TREE_CODE (TREE_TYPE (value)) != VECTOR_TYPE)
3641 gimplify_init_ctor_eval (cref, CONSTRUCTOR_ELTS (value),
3642 pre_p, cleared);
3643 else
3645 tree init = build2 (INIT_EXPR, TREE_TYPE (cref), cref, value);
3646 gimplify_and_add (init, pre_p);
3647 ggc_free (init);
3652 /* Return the appropriate RHS predicate for this LHS. */
3654 gimple_predicate
3655 rhs_predicate_for (tree lhs)
3657 if (is_gimple_reg (lhs))
3658 return is_gimple_reg_rhs_or_call;
3659 else
3660 return is_gimple_mem_rhs_or_call;
3663 /* Gimplify a C99 compound literal expression. This just means adding
3664 the DECL_EXPR before the current statement and using its anonymous
3665 decl instead. */
3667 static enum gimplify_status
3668 gimplify_compound_literal_expr (tree *expr_p, gimple_seq *pre_p,
3669 bool (*gimple_test_f) (tree),
3670 fallback_t fallback)
3672 tree decl_s = COMPOUND_LITERAL_EXPR_DECL_EXPR (*expr_p);
3673 tree decl = DECL_EXPR_DECL (decl_s);
3674 tree init = DECL_INITIAL (decl);
3675 /* Mark the decl as addressable if the compound literal
3676 expression is addressable now, otherwise it is marked too late
3677 after we gimplify the initialization expression. */
3678 if (TREE_ADDRESSABLE (*expr_p))
3679 TREE_ADDRESSABLE (decl) = 1;
3680 /* Otherwise, if we don't need an lvalue and have a literal directly
3681 substitute it. Check if it matches the gimple predicate, as
3682 otherwise we'd generate a new temporary, and we can as well just
3683 use the decl we already have. */
3684 else if (!TREE_ADDRESSABLE (decl)
3685 && init
3686 && (fallback & fb_lvalue) == 0
3687 && gimple_test_f (init))
3689 *expr_p = init;
3690 return GS_OK;
3693 /* Preliminarily mark non-addressed complex variables as eligible
3694 for promotion to gimple registers. We'll transform their uses
3695 as we find them. */
3696 if ((TREE_CODE (TREE_TYPE (decl)) == COMPLEX_TYPE
3697 || TREE_CODE (TREE_TYPE (decl)) == VECTOR_TYPE)
3698 && !TREE_THIS_VOLATILE (decl)
3699 && !needs_to_live_in_memory (decl))
3700 DECL_GIMPLE_REG_P (decl) = 1;
3702 /* If the decl is not addressable, then it is being used in some
3703 expression or on the right hand side of a statement, and it can
3704 be put into a readonly data section. */
3705 if (!TREE_ADDRESSABLE (decl) && (fallback & fb_lvalue) == 0)
3706 TREE_READONLY (decl) = 1;
3708 /* This decl isn't mentioned in the enclosing block, so add it to the
3709 list of temps. FIXME it seems a bit of a kludge to say that
3710 anonymous artificial vars aren't pushed, but everything else is. */
3711 if (DECL_NAME (decl) == NULL_TREE && !DECL_SEEN_IN_BIND_EXPR_P (decl))
3712 gimple_add_tmp_var (decl);
3714 gimplify_and_add (decl_s, pre_p);
3715 *expr_p = decl;
3716 return GS_OK;
3719 /* Optimize embedded COMPOUND_LITERAL_EXPRs within a CONSTRUCTOR,
3720 return a new CONSTRUCTOR if something changed. */
3722 static tree
3723 optimize_compound_literals_in_ctor (tree orig_ctor)
3725 tree ctor = orig_ctor;
3726 vec<constructor_elt, va_gc> *elts = CONSTRUCTOR_ELTS (ctor);
3727 unsigned int idx, num = vec_safe_length (elts);
3729 for (idx = 0; idx < num; idx++)
3731 tree value = (*elts)[idx].value;
3732 tree newval = value;
3733 if (TREE_CODE (value) == CONSTRUCTOR)
3734 newval = optimize_compound_literals_in_ctor (value);
3735 else if (TREE_CODE (value) == COMPOUND_LITERAL_EXPR)
3737 tree decl_s = COMPOUND_LITERAL_EXPR_DECL_EXPR (value);
3738 tree decl = DECL_EXPR_DECL (decl_s);
3739 tree init = DECL_INITIAL (decl);
3741 if (!TREE_ADDRESSABLE (value)
3742 && !TREE_ADDRESSABLE (decl)
3743 && init
3744 && TREE_CODE (init) == CONSTRUCTOR)
3745 newval = optimize_compound_literals_in_ctor (init);
3747 if (newval == value)
3748 continue;
3750 if (ctor == orig_ctor)
3752 ctor = copy_node (orig_ctor);
3753 CONSTRUCTOR_ELTS (ctor) = vec_safe_copy (elts);
3754 elts = CONSTRUCTOR_ELTS (ctor);
3756 (*elts)[idx].value = newval;
3758 return ctor;
3761 /* A subroutine of gimplify_modify_expr. Break out elements of a
3762 CONSTRUCTOR used as an initializer into separate MODIFY_EXPRs.
3764 Note that we still need to clear any elements that don't have explicit
3765 initializers, so if not all elements are initialized we keep the
3766 original MODIFY_EXPR, we just remove all of the constructor elements.
3768 If NOTIFY_TEMP_CREATION is true, do not gimplify, just return
3769 GS_ERROR if we would have to create a temporary when gimplifying
3770 this constructor. Otherwise, return GS_OK.
3772 If NOTIFY_TEMP_CREATION is false, just do the gimplification. */
3774 static enum gimplify_status
3775 gimplify_init_constructor (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
3776 bool want_value, bool notify_temp_creation)
3778 tree object, ctor, type;
3779 enum gimplify_status ret;
3780 vec<constructor_elt, va_gc> *elts;
3782 gcc_assert (TREE_CODE (TREE_OPERAND (*expr_p, 1)) == CONSTRUCTOR);
3784 if (!notify_temp_creation)
3786 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
3787 is_gimple_lvalue, fb_lvalue);
3788 if (ret == GS_ERROR)
3789 return ret;
3792 object = TREE_OPERAND (*expr_p, 0);
3793 ctor = TREE_OPERAND (*expr_p, 1) =
3794 optimize_compound_literals_in_ctor (TREE_OPERAND (*expr_p, 1));
3795 type = TREE_TYPE (ctor);
3796 elts = CONSTRUCTOR_ELTS (ctor);
3797 ret = GS_ALL_DONE;
3799 switch (TREE_CODE (type))
3801 case RECORD_TYPE:
3802 case UNION_TYPE:
3803 case QUAL_UNION_TYPE:
3804 case ARRAY_TYPE:
3806 struct gimplify_init_ctor_preeval_data preeval_data;
3807 HOST_WIDE_INT num_ctor_elements, num_nonzero_elements;
3808 bool cleared, complete_p, valid_const_initializer;
3810 /* Aggregate types must lower constructors to initialization of
3811 individual elements. The exception is that a CONSTRUCTOR node
3812 with no elements indicates zero-initialization of the whole. */
3813 if (vec_safe_is_empty (elts))
3815 if (notify_temp_creation)
3816 return GS_OK;
3817 break;
3820 /* Fetch information about the constructor to direct later processing.
3821 We might want to make static versions of it in various cases, and
3822 can only do so if it known to be a valid constant initializer. */
3823 valid_const_initializer
3824 = categorize_ctor_elements (ctor, &num_nonzero_elements,
3825 &num_ctor_elements, &complete_p);
3827 /* If a const aggregate variable is being initialized, then it
3828 should never be a lose to promote the variable to be static. */
3829 if (valid_const_initializer
3830 && num_nonzero_elements > 1
3831 && TREE_READONLY (object)
3832 && TREE_CODE (object) == VAR_DECL
3833 && (flag_merge_constants >= 2 || !TREE_ADDRESSABLE (object)))
3835 if (notify_temp_creation)
3836 return GS_ERROR;
3837 DECL_INITIAL (object) = ctor;
3838 TREE_STATIC (object) = 1;
3839 if (!DECL_NAME (object))
3840 DECL_NAME (object) = create_tmp_var_name ("C");
3841 walk_tree (&DECL_INITIAL (object), force_labels_r, NULL, NULL);
3843 /* ??? C++ doesn't automatically append a .<number> to the
3844 assembler name, and even when it does, it looks at FE private
3845 data structures to figure out what that number should be,
3846 which are not set for this variable. I suppose this is
3847 important for local statics for inline functions, which aren't
3848 "local" in the object file sense. So in order to get a unique
3849 TU-local symbol, we must invoke the lhd version now. */
3850 lhd_set_decl_assembler_name (object);
3852 *expr_p = NULL_TREE;
3853 break;
3856 /* If there are "lots" of initialized elements, even discounting
3857 those that are not address constants (and thus *must* be
3858 computed at runtime), then partition the constructor into
3859 constant and non-constant parts. Block copy the constant
3860 parts in, then generate code for the non-constant parts. */
3861 /* TODO. There's code in cp/typeck.c to do this. */
3863 if (int_size_in_bytes (TREE_TYPE (ctor)) < 0)
3864 /* store_constructor will ignore the clearing of variable-sized
3865 objects. Initializers for such objects must explicitly set
3866 every field that needs to be set. */
3867 cleared = false;
3868 else if (!complete_p && !CONSTRUCTOR_NO_CLEARING (ctor))
3869 /* If the constructor isn't complete, clear the whole object
3870 beforehand, unless CONSTRUCTOR_NO_CLEARING is set on it.
3872 ??? This ought not to be needed. For any element not present
3873 in the initializer, we should simply set them to zero. Except
3874 we'd need to *find* the elements that are not present, and that
3875 requires trickery to avoid quadratic compile-time behavior in
3876 large cases or excessive memory use in small cases. */
3877 cleared = true;
3878 else if (num_ctor_elements - num_nonzero_elements
3879 > CLEAR_RATIO (optimize_function_for_speed_p (cfun))
3880 && num_nonzero_elements < num_ctor_elements / 4)
3881 /* If there are "lots" of zeros, it's more efficient to clear
3882 the memory and then set the nonzero elements. */
3883 cleared = true;
3884 else
3885 cleared = false;
3887 /* If there are "lots" of initialized elements, and all of them
3888 are valid address constants, then the entire initializer can
3889 be dropped to memory, and then memcpy'd out. Don't do this
3890 for sparse arrays, though, as it's more efficient to follow
3891 the standard CONSTRUCTOR behavior of memset followed by
3892 individual element initialization. Also don't do this for small
3893 all-zero initializers (which aren't big enough to merit
3894 clearing), and don't try to make bitwise copies of
3895 TREE_ADDRESSABLE types.
3897 We cannot apply such transformation when compiling chkp static
3898 initializer because creation of initializer image in the memory
3899 will require static initialization of bounds for it. It should
3900 result in another gimplification of similar initializer and we
3901 may fall into infinite loop. */
3902 if (valid_const_initializer
3903 && !(cleared || num_nonzero_elements == 0)
3904 && !TREE_ADDRESSABLE (type)
3905 && (!current_function_decl
3906 || !lookup_attribute ("chkp ctor",
3907 DECL_ATTRIBUTES (current_function_decl))))
3909 HOST_WIDE_INT size = int_size_in_bytes (type);
3910 unsigned int align;
3912 /* ??? We can still get unbounded array types, at least
3913 from the C++ front end. This seems wrong, but attempt
3914 to work around it for now. */
3915 if (size < 0)
3917 size = int_size_in_bytes (TREE_TYPE (object));
3918 if (size >= 0)
3919 TREE_TYPE (ctor) = type = TREE_TYPE (object);
3922 /* Find the maximum alignment we can assume for the object. */
3923 /* ??? Make use of DECL_OFFSET_ALIGN. */
3924 if (DECL_P (object))
3925 align = DECL_ALIGN (object);
3926 else
3927 align = TYPE_ALIGN (type);
3929 /* Do a block move either if the size is so small as to make
3930 each individual move a sub-unit move on average, or if it
3931 is so large as to make individual moves inefficient. */
3932 if (size > 0
3933 && num_nonzero_elements > 1
3934 && (size < num_nonzero_elements
3935 || !can_move_by_pieces (size, align)))
3937 if (notify_temp_creation)
3938 return GS_ERROR;
3940 walk_tree (&ctor, force_labels_r, NULL, NULL);
3941 ctor = tree_output_constant_def (ctor);
3942 if (!useless_type_conversion_p (type, TREE_TYPE (ctor)))
3943 ctor = build1 (VIEW_CONVERT_EXPR, type, ctor);
3944 TREE_OPERAND (*expr_p, 1) = ctor;
3946 /* This is no longer an assignment of a CONSTRUCTOR, but
3947 we still may have processing to do on the LHS. So
3948 pretend we didn't do anything here to let that happen. */
3949 return GS_UNHANDLED;
3953 /* If the target is volatile, we have non-zero elements and more than
3954 one field to assign, initialize the target from a temporary. */
3955 if (TREE_THIS_VOLATILE (object)
3956 && !TREE_ADDRESSABLE (type)
3957 && num_nonzero_elements > 0
3958 && vec_safe_length (elts) > 1)
3960 tree temp = create_tmp_var (TYPE_MAIN_VARIANT (type));
3961 TREE_OPERAND (*expr_p, 0) = temp;
3962 *expr_p = build2 (COMPOUND_EXPR, TREE_TYPE (*expr_p),
3963 *expr_p,
3964 build2 (MODIFY_EXPR, void_type_node,
3965 object, temp));
3966 return GS_OK;
3969 if (notify_temp_creation)
3970 return GS_OK;
3972 /* If there are nonzero elements and if needed, pre-evaluate to capture
3973 elements overlapping with the lhs into temporaries. We must do this
3974 before clearing to fetch the values before they are zeroed-out. */
3975 if (num_nonzero_elements > 0 && TREE_CODE (*expr_p) != INIT_EXPR)
3977 preeval_data.lhs_base_decl = get_base_address (object);
3978 if (!DECL_P (preeval_data.lhs_base_decl))
3979 preeval_data.lhs_base_decl = NULL;
3980 preeval_data.lhs_alias_set = get_alias_set (object);
3982 gimplify_init_ctor_preeval (&TREE_OPERAND (*expr_p, 1),
3983 pre_p, post_p, &preeval_data);
3986 if (cleared)
3988 /* Zap the CONSTRUCTOR element list, which simplifies this case.
3989 Note that we still have to gimplify, in order to handle the
3990 case of variable sized types. Avoid shared tree structures. */
3991 CONSTRUCTOR_ELTS (ctor) = NULL;
3992 TREE_SIDE_EFFECTS (ctor) = 0;
3993 object = unshare_expr (object);
3994 gimplify_stmt (expr_p, pre_p);
3997 /* If we have not block cleared the object, or if there are nonzero
3998 elements in the constructor, add assignments to the individual
3999 scalar fields of the object. */
4000 if (!cleared || num_nonzero_elements > 0)
4001 gimplify_init_ctor_eval (object, elts, pre_p, cleared);
4003 *expr_p = NULL_TREE;
4005 break;
4007 case COMPLEX_TYPE:
4009 tree r, i;
4011 if (notify_temp_creation)
4012 return GS_OK;
4014 /* Extract the real and imaginary parts out of the ctor. */
4015 gcc_assert (elts->length () == 2);
4016 r = (*elts)[0].value;
4017 i = (*elts)[1].value;
4018 if (r == NULL || i == NULL)
4020 tree zero = build_zero_cst (TREE_TYPE (type));
4021 if (r == NULL)
4022 r = zero;
4023 if (i == NULL)
4024 i = zero;
4027 /* Complex types have either COMPLEX_CST or COMPLEX_EXPR to
4028 represent creation of a complex value. */
4029 if (TREE_CONSTANT (r) && TREE_CONSTANT (i))
4031 ctor = build_complex (type, r, i);
4032 TREE_OPERAND (*expr_p, 1) = ctor;
4034 else
4036 ctor = build2 (COMPLEX_EXPR, type, r, i);
4037 TREE_OPERAND (*expr_p, 1) = ctor;
4038 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 1),
4039 pre_p,
4040 post_p,
4041 rhs_predicate_for (TREE_OPERAND (*expr_p, 0)),
4042 fb_rvalue);
4045 break;
4047 case VECTOR_TYPE:
4049 unsigned HOST_WIDE_INT ix;
4050 constructor_elt *ce;
4052 if (notify_temp_creation)
4053 return GS_OK;
4055 /* Go ahead and simplify constant constructors to VECTOR_CST. */
4056 if (TREE_CONSTANT (ctor))
4058 bool constant_p = true;
4059 tree value;
4061 /* Even when ctor is constant, it might contain non-*_CST
4062 elements, such as addresses or trapping values like
4063 1.0/0.0 - 1.0/0.0. Such expressions don't belong
4064 in VECTOR_CST nodes. */
4065 FOR_EACH_CONSTRUCTOR_VALUE (elts, ix, value)
4066 if (!CONSTANT_CLASS_P (value))
4068 constant_p = false;
4069 break;
4072 if (constant_p)
4074 TREE_OPERAND (*expr_p, 1) = build_vector_from_ctor (type, elts);
4075 break;
4078 TREE_CONSTANT (ctor) = 0;
4081 /* Vector types use CONSTRUCTOR all the way through gimple
4082 compilation as a general initializer. */
4083 FOR_EACH_VEC_SAFE_ELT (elts, ix, ce)
4085 enum gimplify_status tret;
4086 tret = gimplify_expr (&ce->value, pre_p, post_p, is_gimple_val,
4087 fb_rvalue);
4088 if (tret == GS_ERROR)
4089 ret = GS_ERROR;
4091 if (!is_gimple_reg (TREE_OPERAND (*expr_p, 0)))
4092 TREE_OPERAND (*expr_p, 1) = get_formal_tmp_var (ctor, pre_p);
4094 break;
4096 default:
4097 /* So how did we get a CONSTRUCTOR for a scalar type? */
4098 gcc_unreachable ();
4101 if (ret == GS_ERROR)
4102 return GS_ERROR;
4103 else if (want_value)
4105 *expr_p = object;
4106 return GS_OK;
4108 else
4110 /* If we have gimplified both sides of the initializer but have
4111 not emitted an assignment, do so now. */
4112 if (*expr_p)
4114 tree lhs = TREE_OPERAND (*expr_p, 0);
4115 tree rhs = TREE_OPERAND (*expr_p, 1);
4116 gassign *init = gimple_build_assign (lhs, rhs);
4117 gimplify_seq_add_stmt (pre_p, init);
4118 *expr_p = NULL;
4121 return GS_ALL_DONE;
4125 /* Given a pointer value OP0, return a simplified version of an
4126 indirection through OP0, or NULL_TREE if no simplification is
4127 possible. This may only be applied to a rhs of an expression.
4128 Note that the resulting type may be different from the type pointed
4129 to in the sense that it is still compatible from the langhooks
4130 point of view. */
4132 static tree
4133 gimple_fold_indirect_ref_rhs (tree t)
4135 return gimple_fold_indirect_ref (t);
4138 /* Subroutine of gimplify_modify_expr to do simplifications of
4139 MODIFY_EXPRs based on the code of the RHS. We loop for as long as
4140 something changes. */
4142 static enum gimplify_status
4143 gimplify_modify_expr_rhs (tree *expr_p, tree *from_p, tree *to_p,
4144 gimple_seq *pre_p, gimple_seq *post_p,
4145 bool want_value)
4147 enum gimplify_status ret = GS_UNHANDLED;
4148 bool changed;
4152 changed = false;
4153 switch (TREE_CODE (*from_p))
4155 case VAR_DECL:
4156 /* If we're assigning from a read-only variable initialized with
4157 a constructor, do the direct assignment from the constructor,
4158 but only if neither source nor target are volatile since this
4159 latter assignment might end up being done on a per-field basis. */
4160 if (DECL_INITIAL (*from_p)
4161 && TREE_READONLY (*from_p)
4162 && !TREE_THIS_VOLATILE (*from_p)
4163 && !TREE_THIS_VOLATILE (*to_p)
4164 && TREE_CODE (DECL_INITIAL (*from_p)) == CONSTRUCTOR)
4166 tree old_from = *from_p;
4167 enum gimplify_status subret;
4169 /* Move the constructor into the RHS. */
4170 *from_p = unshare_expr (DECL_INITIAL (*from_p));
4172 /* Let's see if gimplify_init_constructor will need to put
4173 it in memory. */
4174 subret = gimplify_init_constructor (expr_p, NULL, NULL,
4175 false, true);
4176 if (subret == GS_ERROR)
4178 /* If so, revert the change. */
4179 *from_p = old_from;
4181 else
4183 ret = GS_OK;
4184 changed = true;
4187 break;
4188 case INDIRECT_REF:
4190 /* If we have code like
4192 *(const A*)(A*)&x
4194 where the type of "x" is a (possibly cv-qualified variant
4195 of "A"), treat the entire expression as identical to "x".
4196 This kind of code arises in C++ when an object is bound
4197 to a const reference, and if "x" is a TARGET_EXPR we want
4198 to take advantage of the optimization below. */
4199 bool volatile_p = TREE_THIS_VOLATILE (*from_p);
4200 tree t = gimple_fold_indirect_ref_rhs (TREE_OPERAND (*from_p, 0));
4201 if (t)
4203 if (TREE_THIS_VOLATILE (t) != volatile_p)
4205 if (TREE_CODE_CLASS (TREE_CODE (t)) == tcc_declaration)
4206 t = build_simple_mem_ref_loc (EXPR_LOCATION (*from_p),
4207 build_fold_addr_expr (t));
4208 if (REFERENCE_CLASS_P (t))
4209 TREE_THIS_VOLATILE (t) = volatile_p;
4211 *from_p = t;
4212 ret = GS_OK;
4213 changed = true;
4215 break;
4218 case TARGET_EXPR:
4220 /* If we are initializing something from a TARGET_EXPR, strip the
4221 TARGET_EXPR and initialize it directly, if possible. This can't
4222 be done if the initializer is void, since that implies that the
4223 temporary is set in some non-trivial way.
4225 ??? What about code that pulls out the temp and uses it
4226 elsewhere? I think that such code never uses the TARGET_EXPR as
4227 an initializer. If I'm wrong, we'll die because the temp won't
4228 have any RTL. In that case, I guess we'll need to replace
4229 references somehow. */
4230 tree init = TARGET_EXPR_INITIAL (*from_p);
4232 if (init
4233 && !VOID_TYPE_P (TREE_TYPE (init)))
4235 *from_p = init;
4236 ret = GS_OK;
4237 changed = true;
4240 break;
4242 case COMPOUND_EXPR:
4243 /* Remove any COMPOUND_EXPR in the RHS so the following cases will be
4244 caught. */
4245 gimplify_compound_expr (from_p, pre_p, true);
4246 ret = GS_OK;
4247 changed = true;
4248 break;
4250 case CONSTRUCTOR:
4251 /* If we already made some changes, let the front end have a
4252 crack at this before we break it down. */
4253 if (ret != GS_UNHANDLED)
4254 break;
4255 /* If we're initializing from a CONSTRUCTOR, break this into
4256 individual MODIFY_EXPRs. */
4257 return gimplify_init_constructor (expr_p, pre_p, post_p, want_value,
4258 false);
4260 case COND_EXPR:
4261 /* If we're assigning to a non-register type, push the assignment
4262 down into the branches. This is mandatory for ADDRESSABLE types,
4263 since we cannot generate temporaries for such, but it saves a
4264 copy in other cases as well. */
4265 if (!is_gimple_reg_type (TREE_TYPE (*from_p)))
4267 /* This code should mirror the code in gimplify_cond_expr. */
4268 enum tree_code code = TREE_CODE (*expr_p);
4269 tree cond = *from_p;
4270 tree result = *to_p;
4272 ret = gimplify_expr (&result, pre_p, post_p,
4273 is_gimple_lvalue, fb_lvalue);
4274 if (ret != GS_ERROR)
4275 ret = GS_OK;
4277 if (TREE_TYPE (TREE_OPERAND (cond, 1)) != void_type_node)
4278 TREE_OPERAND (cond, 1)
4279 = build2 (code, void_type_node, result,
4280 TREE_OPERAND (cond, 1));
4281 if (TREE_TYPE (TREE_OPERAND (cond, 2)) != void_type_node)
4282 TREE_OPERAND (cond, 2)
4283 = build2 (code, void_type_node, unshare_expr (result),
4284 TREE_OPERAND (cond, 2));
4286 TREE_TYPE (cond) = void_type_node;
4287 recalculate_side_effects (cond);
4289 if (want_value)
4291 gimplify_and_add (cond, pre_p);
4292 *expr_p = unshare_expr (result);
4294 else
4295 *expr_p = cond;
4296 return ret;
4298 break;
4300 case CALL_EXPR:
4301 /* For calls that return in memory, give *to_p as the CALL_EXPR's
4302 return slot so that we don't generate a temporary. */
4303 if (!CALL_EXPR_RETURN_SLOT_OPT (*from_p)
4304 && aggregate_value_p (*from_p, *from_p))
4306 bool use_target;
4308 if (!(rhs_predicate_for (*to_p))(*from_p))
4309 /* If we need a temporary, *to_p isn't accurate. */
4310 use_target = false;
4311 /* It's OK to use the return slot directly unless it's an NRV. */
4312 else if (TREE_CODE (*to_p) == RESULT_DECL
4313 && DECL_NAME (*to_p) == NULL_TREE
4314 && needs_to_live_in_memory (*to_p))
4315 use_target = true;
4316 else if (is_gimple_reg_type (TREE_TYPE (*to_p))
4317 || (DECL_P (*to_p) && DECL_REGISTER (*to_p)))
4318 /* Don't force regs into memory. */
4319 use_target = false;
4320 else if (TREE_CODE (*expr_p) == INIT_EXPR)
4321 /* It's OK to use the target directly if it's being
4322 initialized. */
4323 use_target = true;
4324 else if (variably_modified_type_p (TREE_TYPE (*to_p), NULL_TREE))
4325 /* Always use the target and thus RSO for variable-sized types.
4326 GIMPLE cannot deal with a variable-sized assignment
4327 embedded in a call statement. */
4328 use_target = true;
4329 else if (TREE_CODE (*to_p) != SSA_NAME
4330 && (!is_gimple_variable (*to_p)
4331 || needs_to_live_in_memory (*to_p)))
4332 /* Don't use the original target if it's already addressable;
4333 if its address escapes, and the called function uses the
4334 NRV optimization, a conforming program could see *to_p
4335 change before the called function returns; see c++/19317.
4336 When optimizing, the return_slot pass marks more functions
4337 as safe after we have escape info. */
4338 use_target = false;
4339 else
4340 use_target = true;
4342 if (use_target)
4344 CALL_EXPR_RETURN_SLOT_OPT (*from_p) = 1;
4345 mark_addressable (*to_p);
4348 break;
4350 case WITH_SIZE_EXPR:
4351 /* Likewise for calls that return an aggregate of non-constant size,
4352 since we would not be able to generate a temporary at all. */
4353 if (TREE_CODE (TREE_OPERAND (*from_p, 0)) == CALL_EXPR)
4355 *from_p = TREE_OPERAND (*from_p, 0);
4356 /* We don't change ret in this case because the
4357 WITH_SIZE_EXPR might have been added in
4358 gimplify_modify_expr, so returning GS_OK would lead to an
4359 infinite loop. */
4360 changed = true;
4362 break;
4364 /* If we're initializing from a container, push the initialization
4365 inside it. */
4366 case CLEANUP_POINT_EXPR:
4367 case BIND_EXPR:
4368 case STATEMENT_LIST:
4370 tree wrap = *from_p;
4371 tree t;
4373 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_min_lval,
4374 fb_lvalue);
4375 if (ret != GS_ERROR)
4376 ret = GS_OK;
4378 t = voidify_wrapper_expr (wrap, *expr_p);
4379 gcc_assert (t == *expr_p);
4381 if (want_value)
4383 gimplify_and_add (wrap, pre_p);
4384 *expr_p = unshare_expr (*to_p);
4386 else
4387 *expr_p = wrap;
4388 return GS_OK;
4391 case COMPOUND_LITERAL_EXPR:
4393 tree complit = TREE_OPERAND (*expr_p, 1);
4394 tree decl_s = COMPOUND_LITERAL_EXPR_DECL_EXPR (complit);
4395 tree decl = DECL_EXPR_DECL (decl_s);
4396 tree init = DECL_INITIAL (decl);
4398 /* struct T x = (struct T) { 0, 1, 2 } can be optimized
4399 into struct T x = { 0, 1, 2 } if the address of the
4400 compound literal has never been taken. */
4401 if (!TREE_ADDRESSABLE (complit)
4402 && !TREE_ADDRESSABLE (decl)
4403 && init)
4405 *expr_p = copy_node (*expr_p);
4406 TREE_OPERAND (*expr_p, 1) = init;
4407 return GS_OK;
4411 default:
4412 break;
4415 while (changed);
4417 return ret;
4421 /* Return true if T looks like a valid GIMPLE statement. */
4423 static bool
4424 is_gimple_stmt (tree t)
4426 const enum tree_code code = TREE_CODE (t);
4428 switch (code)
4430 case NOP_EXPR:
4431 /* The only valid NOP_EXPR is the empty statement. */
4432 return IS_EMPTY_STMT (t);
4434 case BIND_EXPR:
4435 case COND_EXPR:
4436 /* These are only valid if they're void. */
4437 return TREE_TYPE (t) == NULL || VOID_TYPE_P (TREE_TYPE (t));
4439 case SWITCH_EXPR:
4440 case GOTO_EXPR:
4441 case RETURN_EXPR:
4442 case LABEL_EXPR:
4443 case CASE_LABEL_EXPR:
4444 case TRY_CATCH_EXPR:
4445 case TRY_FINALLY_EXPR:
4446 case EH_FILTER_EXPR:
4447 case CATCH_EXPR:
4448 case ASM_EXPR:
4449 case STATEMENT_LIST:
4450 case OACC_PARALLEL:
4451 case OACC_KERNELS:
4452 case OACC_DATA:
4453 case OACC_HOST_DATA:
4454 case OACC_DECLARE:
4455 case OACC_UPDATE:
4456 case OACC_ENTER_DATA:
4457 case OACC_EXIT_DATA:
4458 case OACC_CACHE:
4459 case OMP_PARALLEL:
4460 case OMP_FOR:
4461 case OMP_SIMD:
4462 case CILK_SIMD:
4463 case OMP_DISTRIBUTE:
4464 case OACC_LOOP:
4465 case OMP_SECTIONS:
4466 case OMP_SECTION:
4467 case OMP_SINGLE:
4468 case OMP_MASTER:
4469 case OMP_TASKGROUP:
4470 case OMP_ORDERED:
4471 case OMP_CRITICAL:
4472 case OMP_TASK:
4473 /* These are always void. */
4474 return true;
4476 case CALL_EXPR:
4477 case MODIFY_EXPR:
4478 case PREDICT_EXPR:
4479 /* These are valid regardless of their type. */
4480 return true;
4482 default:
4483 return false;
4488 /* Promote partial stores to COMPLEX variables to total stores. *EXPR_P is
4489 a MODIFY_EXPR with a lhs of a REAL/IMAGPART_EXPR of a variable with
4490 DECL_GIMPLE_REG_P set.
4492 IMPORTANT NOTE: This promotion is performed by introducing a load of the
4493 other, unmodified part of the complex object just before the total store.
4494 As a consequence, if the object is still uninitialized, an undefined value
4495 will be loaded into a register, which may result in a spurious exception
4496 if the register is floating-point and the value happens to be a signaling
4497 NaN for example. Then the fully-fledged complex operations lowering pass
4498 followed by a DCE pass are necessary in order to fix things up. */
4500 static enum gimplify_status
4501 gimplify_modify_expr_complex_part (tree *expr_p, gimple_seq *pre_p,
4502 bool want_value)
4504 enum tree_code code, ocode;
4505 tree lhs, rhs, new_rhs, other, realpart, imagpart;
4507 lhs = TREE_OPERAND (*expr_p, 0);
4508 rhs = TREE_OPERAND (*expr_p, 1);
4509 code = TREE_CODE (lhs);
4510 lhs = TREE_OPERAND (lhs, 0);
4512 ocode = code == REALPART_EXPR ? IMAGPART_EXPR : REALPART_EXPR;
4513 other = build1 (ocode, TREE_TYPE (rhs), lhs);
4514 TREE_NO_WARNING (other) = 1;
4515 other = get_formal_tmp_var (other, pre_p);
4517 realpart = code == REALPART_EXPR ? rhs : other;
4518 imagpart = code == REALPART_EXPR ? other : rhs;
4520 if (TREE_CONSTANT (realpart) && TREE_CONSTANT (imagpart))
4521 new_rhs = build_complex (TREE_TYPE (lhs), realpart, imagpart);
4522 else
4523 new_rhs = build2 (COMPLEX_EXPR, TREE_TYPE (lhs), realpart, imagpart);
4525 gimplify_seq_add_stmt (pre_p, gimple_build_assign (lhs, new_rhs));
4526 *expr_p = (want_value) ? rhs : NULL_TREE;
4528 return GS_ALL_DONE;
4531 /* Gimplify the MODIFY_EXPR node pointed to by EXPR_P.
4533 modify_expr
4534 : varname '=' rhs
4535 | '*' ID '=' rhs
4537 PRE_P points to the list where side effects that must happen before
4538 *EXPR_P should be stored.
4540 POST_P points to the list where side effects that must happen after
4541 *EXPR_P should be stored.
4543 WANT_VALUE is nonzero iff we want to use the value of this expression
4544 in another expression. */
4546 static enum gimplify_status
4547 gimplify_modify_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
4548 bool want_value)
4550 tree *from_p = &TREE_OPERAND (*expr_p, 1);
4551 tree *to_p = &TREE_OPERAND (*expr_p, 0);
4552 enum gimplify_status ret = GS_UNHANDLED;
4553 gimple assign;
4554 location_t loc = EXPR_LOCATION (*expr_p);
4555 gimple_stmt_iterator gsi;
4557 gcc_assert (TREE_CODE (*expr_p) == MODIFY_EXPR
4558 || TREE_CODE (*expr_p) == INIT_EXPR);
4560 /* Trying to simplify a clobber using normal logic doesn't work,
4561 so handle it here. */
4562 if (TREE_CLOBBER_P (*from_p))
4564 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
4565 if (ret == GS_ERROR)
4566 return ret;
4567 gcc_assert (!want_value
4568 && (TREE_CODE (*to_p) == VAR_DECL
4569 || TREE_CODE (*to_p) == MEM_REF));
4570 gimplify_seq_add_stmt (pre_p, gimple_build_assign (*to_p, *from_p));
4571 *expr_p = NULL;
4572 return GS_ALL_DONE;
4575 /* Insert pointer conversions required by the middle-end that are not
4576 required by the frontend. This fixes middle-end type checking for
4577 for example gcc.dg/redecl-6.c. */
4578 if (POINTER_TYPE_P (TREE_TYPE (*to_p)))
4580 STRIP_USELESS_TYPE_CONVERSION (*from_p);
4581 if (!useless_type_conversion_p (TREE_TYPE (*to_p), TREE_TYPE (*from_p)))
4582 *from_p = fold_convert_loc (loc, TREE_TYPE (*to_p), *from_p);
4585 /* See if any simplifications can be done based on what the RHS is. */
4586 ret = gimplify_modify_expr_rhs (expr_p, from_p, to_p, pre_p, post_p,
4587 want_value);
4588 if (ret != GS_UNHANDLED)
4589 return ret;
4591 /* For zero sized types only gimplify the left hand side and right hand
4592 side as statements and throw away the assignment. Do this after
4593 gimplify_modify_expr_rhs so we handle TARGET_EXPRs of addressable
4594 types properly. */
4595 if (zero_sized_type (TREE_TYPE (*from_p)) && !want_value)
4597 gimplify_stmt (from_p, pre_p);
4598 gimplify_stmt (to_p, pre_p);
4599 *expr_p = NULL_TREE;
4600 return GS_ALL_DONE;
4603 /* If the value being copied is of variable width, compute the length
4604 of the copy into a WITH_SIZE_EXPR. Note that we need to do this
4605 before gimplifying any of the operands so that we can resolve any
4606 PLACEHOLDER_EXPRs in the size. Also note that the RTL expander uses
4607 the size of the expression to be copied, not of the destination, so
4608 that is what we must do here. */
4609 maybe_with_size_expr (from_p);
4611 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
4612 if (ret == GS_ERROR)
4613 return ret;
4615 /* As a special case, we have to temporarily allow for assignments
4616 with a CALL_EXPR on the RHS. Since in GIMPLE a function call is
4617 a toplevel statement, when gimplifying the GENERIC expression
4618 MODIFY_EXPR <a, CALL_EXPR <foo>>, we cannot create the tuple
4619 GIMPLE_ASSIGN <a, GIMPLE_CALL <foo>>.
4621 Instead, we need to create the tuple GIMPLE_CALL <a, foo>. To
4622 prevent gimplify_expr from trying to create a new temporary for
4623 foo's LHS, we tell it that it should only gimplify until it
4624 reaches the CALL_EXPR. On return from gimplify_expr, the newly
4625 created GIMPLE_CALL <foo> will be the last statement in *PRE_P
4626 and all we need to do here is set 'a' to be its LHS. */
4627 ret = gimplify_expr (from_p, pre_p, post_p, rhs_predicate_for (*to_p),
4628 fb_rvalue);
4629 if (ret == GS_ERROR)
4630 return ret;
4632 /* Now see if the above changed *from_p to something we handle specially. */
4633 ret = gimplify_modify_expr_rhs (expr_p, from_p, to_p, pre_p, post_p,
4634 want_value);
4635 if (ret != GS_UNHANDLED)
4636 return ret;
4638 /* If we've got a variable sized assignment between two lvalues (i.e. does
4639 not involve a call), then we can make things a bit more straightforward
4640 by converting the assignment to memcpy or memset. */
4641 if (TREE_CODE (*from_p) == WITH_SIZE_EXPR)
4643 tree from = TREE_OPERAND (*from_p, 0);
4644 tree size = TREE_OPERAND (*from_p, 1);
4646 if (TREE_CODE (from) == CONSTRUCTOR)
4647 return gimplify_modify_expr_to_memset (expr_p, size, want_value, pre_p);
4649 if (is_gimple_addressable (from))
4651 *from_p = from;
4652 return gimplify_modify_expr_to_memcpy (expr_p, size, want_value,
4653 pre_p);
4657 /* Transform partial stores to non-addressable complex variables into
4658 total stores. This allows us to use real instead of virtual operands
4659 for these variables, which improves optimization. */
4660 if ((TREE_CODE (*to_p) == REALPART_EXPR
4661 || TREE_CODE (*to_p) == IMAGPART_EXPR)
4662 && is_gimple_reg (TREE_OPERAND (*to_p, 0)))
4663 return gimplify_modify_expr_complex_part (expr_p, pre_p, want_value);
4665 /* Try to alleviate the effects of the gimplification creating artificial
4666 temporaries (see for example is_gimple_reg_rhs) on the debug info. */
4667 if (!gimplify_ctxp->into_ssa
4668 && TREE_CODE (*from_p) == VAR_DECL
4669 && DECL_IGNORED_P (*from_p)
4670 && DECL_P (*to_p)
4671 && !DECL_IGNORED_P (*to_p))
4673 if (!DECL_NAME (*from_p) && DECL_NAME (*to_p))
4674 DECL_NAME (*from_p)
4675 = create_tmp_var_name (IDENTIFIER_POINTER (DECL_NAME (*to_p)));
4676 DECL_HAS_DEBUG_EXPR_P (*from_p) = 1;
4677 SET_DECL_DEBUG_EXPR (*from_p, *to_p);
4680 if (want_value && TREE_THIS_VOLATILE (*to_p))
4681 *from_p = get_initialized_tmp_var (*from_p, pre_p, post_p);
4683 if (TREE_CODE (*from_p) == CALL_EXPR)
4685 /* Since the RHS is a CALL_EXPR, we need to create a GIMPLE_CALL
4686 instead of a GIMPLE_ASSIGN. */
4687 gcall *call_stmt;
4688 if (CALL_EXPR_FN (*from_p) == NULL_TREE)
4690 /* Gimplify internal functions created in the FEs. */
4691 int nargs = call_expr_nargs (*from_p), i;
4692 enum internal_fn ifn = CALL_EXPR_IFN (*from_p);
4693 auto_vec<tree> vargs (nargs);
4695 for (i = 0; i < nargs; i++)
4697 gimplify_arg (&CALL_EXPR_ARG (*from_p, i), pre_p,
4698 EXPR_LOCATION (*from_p));
4699 vargs.quick_push (CALL_EXPR_ARG (*from_p, i));
4701 call_stmt = gimple_build_call_internal_vec (ifn, vargs);
4702 gimple_set_location (call_stmt, EXPR_LOCATION (*expr_p));
4704 else
4706 tree fnptrtype = TREE_TYPE (CALL_EXPR_FN (*from_p));
4707 CALL_EXPR_FN (*from_p) = TREE_OPERAND (CALL_EXPR_FN (*from_p), 0);
4708 STRIP_USELESS_TYPE_CONVERSION (CALL_EXPR_FN (*from_p));
4709 tree fndecl = get_callee_fndecl (*from_p);
4710 if (fndecl
4711 && DECL_BUILT_IN_CLASS (fndecl) == BUILT_IN_NORMAL
4712 && DECL_FUNCTION_CODE (fndecl) == BUILT_IN_EXPECT
4713 && call_expr_nargs (*from_p) == 3)
4714 call_stmt = gimple_build_call_internal (IFN_BUILTIN_EXPECT, 3,
4715 CALL_EXPR_ARG (*from_p, 0),
4716 CALL_EXPR_ARG (*from_p, 1),
4717 CALL_EXPR_ARG (*from_p, 2));
4718 else
4720 call_stmt = gimple_build_call_from_tree (*from_p);
4721 gimple_call_set_fntype (call_stmt, TREE_TYPE (fnptrtype));
4724 notice_special_calls (call_stmt);
4725 if (!gimple_call_noreturn_p (call_stmt))
4726 gimple_call_set_lhs (call_stmt, *to_p);
4727 assign = call_stmt;
4729 else
4731 assign = gimple_build_assign (*to_p, *from_p);
4732 gimple_set_location (assign, EXPR_LOCATION (*expr_p));
4735 if (gimplify_ctxp->into_ssa && is_gimple_reg (*to_p))
4737 /* We should have got an SSA name from the start. */
4738 gcc_assert (TREE_CODE (*to_p) == SSA_NAME);
4741 gimplify_seq_add_stmt (pre_p, assign);
4742 gsi = gsi_last (*pre_p);
4743 maybe_fold_stmt (&gsi);
4745 if (want_value)
4747 *expr_p = TREE_THIS_VOLATILE (*to_p) ? *from_p : unshare_expr (*to_p);
4748 return GS_OK;
4750 else
4751 *expr_p = NULL;
4753 return GS_ALL_DONE;
4756 /* Gimplify a comparison between two variable-sized objects. Do this
4757 with a call to BUILT_IN_MEMCMP. */
4759 static enum gimplify_status
4760 gimplify_variable_sized_compare (tree *expr_p)
4762 location_t loc = EXPR_LOCATION (*expr_p);
4763 tree op0 = TREE_OPERAND (*expr_p, 0);
4764 tree op1 = TREE_OPERAND (*expr_p, 1);
4765 tree t, arg, dest, src, expr;
4767 arg = TYPE_SIZE_UNIT (TREE_TYPE (op0));
4768 arg = unshare_expr (arg);
4769 arg = SUBSTITUTE_PLACEHOLDER_IN_EXPR (arg, op0);
4770 src = build_fold_addr_expr_loc (loc, op1);
4771 dest = build_fold_addr_expr_loc (loc, op0);
4772 t = builtin_decl_implicit (BUILT_IN_MEMCMP);
4773 t = build_call_expr_loc (loc, t, 3, dest, src, arg);
4775 expr
4776 = build2 (TREE_CODE (*expr_p), TREE_TYPE (*expr_p), t, integer_zero_node);
4777 SET_EXPR_LOCATION (expr, loc);
4778 *expr_p = expr;
4780 return GS_OK;
4783 /* Gimplify a comparison between two aggregate objects of integral scalar
4784 mode as a comparison between the bitwise equivalent scalar values. */
4786 static enum gimplify_status
4787 gimplify_scalar_mode_aggregate_compare (tree *expr_p)
4789 location_t loc = EXPR_LOCATION (*expr_p);
4790 tree op0 = TREE_OPERAND (*expr_p, 0);
4791 tree op1 = TREE_OPERAND (*expr_p, 1);
4793 tree type = TREE_TYPE (op0);
4794 tree scalar_type = lang_hooks.types.type_for_mode (TYPE_MODE (type), 1);
4796 op0 = fold_build1_loc (loc, VIEW_CONVERT_EXPR, scalar_type, op0);
4797 op1 = fold_build1_loc (loc, VIEW_CONVERT_EXPR, scalar_type, op1);
4799 *expr_p
4800 = fold_build2_loc (loc, TREE_CODE (*expr_p), TREE_TYPE (*expr_p), op0, op1);
4802 return GS_OK;
4805 /* Gimplify an expression sequence. This function gimplifies each
4806 expression and rewrites the original expression with the last
4807 expression of the sequence in GIMPLE form.
4809 PRE_P points to the list where the side effects for all the
4810 expressions in the sequence will be emitted.
4812 WANT_VALUE is true when the result of the last COMPOUND_EXPR is used. */
4814 static enum gimplify_status
4815 gimplify_compound_expr (tree *expr_p, gimple_seq *pre_p, bool want_value)
4817 tree t = *expr_p;
4821 tree *sub_p = &TREE_OPERAND (t, 0);
4823 if (TREE_CODE (*sub_p) == COMPOUND_EXPR)
4824 gimplify_compound_expr (sub_p, pre_p, false);
4825 else
4826 gimplify_stmt (sub_p, pre_p);
4828 t = TREE_OPERAND (t, 1);
4830 while (TREE_CODE (t) == COMPOUND_EXPR);
4832 *expr_p = t;
4833 if (want_value)
4834 return GS_OK;
4835 else
4837 gimplify_stmt (expr_p, pre_p);
4838 return GS_ALL_DONE;
4842 /* Gimplify a SAVE_EXPR node. EXPR_P points to the expression to
4843 gimplify. After gimplification, EXPR_P will point to a new temporary
4844 that holds the original value of the SAVE_EXPR node.
4846 PRE_P points to the list where side effects that must happen before
4847 *EXPR_P should be stored. */
4849 static enum gimplify_status
4850 gimplify_save_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
4852 enum gimplify_status ret = GS_ALL_DONE;
4853 tree val;
4855 gcc_assert (TREE_CODE (*expr_p) == SAVE_EXPR);
4856 val = TREE_OPERAND (*expr_p, 0);
4858 /* If the SAVE_EXPR has not been resolved, then evaluate it once. */
4859 if (!SAVE_EXPR_RESOLVED_P (*expr_p))
4861 /* The operand may be a void-valued expression such as SAVE_EXPRs
4862 generated by the Java frontend for class initialization. It is
4863 being executed only for its side-effects. */
4864 if (TREE_TYPE (val) == void_type_node)
4866 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
4867 is_gimple_stmt, fb_none);
4868 val = NULL;
4870 else
4871 val = get_initialized_tmp_var (val, pre_p, post_p);
4873 TREE_OPERAND (*expr_p, 0) = val;
4874 SAVE_EXPR_RESOLVED_P (*expr_p) = 1;
4877 *expr_p = val;
4879 return ret;
4882 /* Rewrite the ADDR_EXPR node pointed to by EXPR_P
4884 unary_expr
4885 : ...
4886 | '&' varname
4889 PRE_P points to the list where side effects that must happen before
4890 *EXPR_P should be stored.
4892 POST_P points to the list where side effects that must happen after
4893 *EXPR_P should be stored. */
4895 static enum gimplify_status
4896 gimplify_addr_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
4898 tree expr = *expr_p;
4899 tree op0 = TREE_OPERAND (expr, 0);
4900 enum gimplify_status ret;
4901 location_t loc = EXPR_LOCATION (*expr_p);
4903 switch (TREE_CODE (op0))
4905 case INDIRECT_REF:
4906 do_indirect_ref:
4907 /* Check if we are dealing with an expression of the form '&*ptr'.
4908 While the front end folds away '&*ptr' into 'ptr', these
4909 expressions may be generated internally by the compiler (e.g.,
4910 builtins like __builtin_va_end). */
4911 /* Caution: the silent array decomposition semantics we allow for
4912 ADDR_EXPR means we can't always discard the pair. */
4913 /* Gimplification of the ADDR_EXPR operand may drop
4914 cv-qualification conversions, so make sure we add them if
4915 needed. */
4917 tree op00 = TREE_OPERAND (op0, 0);
4918 tree t_expr = TREE_TYPE (expr);
4919 tree t_op00 = TREE_TYPE (op00);
4921 if (!useless_type_conversion_p (t_expr, t_op00))
4922 op00 = fold_convert_loc (loc, TREE_TYPE (expr), op00);
4923 *expr_p = op00;
4924 ret = GS_OK;
4926 break;
4928 case VIEW_CONVERT_EXPR:
4929 /* Take the address of our operand and then convert it to the type of
4930 this ADDR_EXPR.
4932 ??? The interactions of VIEW_CONVERT_EXPR and aliasing is not at
4933 all clear. The impact of this transformation is even less clear. */
4935 /* If the operand is a useless conversion, look through it. Doing so
4936 guarantees that the ADDR_EXPR and its operand will remain of the
4937 same type. */
4938 if (tree_ssa_useless_type_conversion (TREE_OPERAND (op0, 0)))
4939 op0 = TREE_OPERAND (op0, 0);
4941 *expr_p = fold_convert_loc (loc, TREE_TYPE (expr),
4942 build_fold_addr_expr_loc (loc,
4943 TREE_OPERAND (op0, 0)));
4944 ret = GS_OK;
4945 break;
4947 default:
4948 /* We use fb_either here because the C frontend sometimes takes
4949 the address of a call that returns a struct; see
4950 gcc.dg/c99-array-lval-1.c. The gimplifier will correctly make
4951 the implied temporary explicit. */
4953 /* Make the operand addressable. */
4954 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, post_p,
4955 is_gimple_addressable, fb_either);
4956 if (ret == GS_ERROR)
4957 break;
4959 /* Then mark it. Beware that it may not be possible to do so directly
4960 if a temporary has been created by the gimplification. */
4961 prepare_gimple_addressable (&TREE_OPERAND (expr, 0), pre_p);
4963 op0 = TREE_OPERAND (expr, 0);
4965 /* For various reasons, the gimplification of the expression
4966 may have made a new INDIRECT_REF. */
4967 if (TREE_CODE (op0) == INDIRECT_REF)
4968 goto do_indirect_ref;
4970 mark_addressable (TREE_OPERAND (expr, 0));
4972 /* The FEs may end up building ADDR_EXPRs early on a decl with
4973 an incomplete type. Re-build ADDR_EXPRs in canonical form
4974 here. */
4975 if (!types_compatible_p (TREE_TYPE (op0), TREE_TYPE (TREE_TYPE (expr))))
4976 *expr_p = build_fold_addr_expr (op0);
4978 /* Make sure TREE_CONSTANT and TREE_SIDE_EFFECTS are set properly. */
4979 recompute_tree_invariant_for_addr_expr (*expr_p);
4981 /* If we re-built the ADDR_EXPR add a conversion to the original type
4982 if required. */
4983 if (!useless_type_conversion_p (TREE_TYPE (expr), TREE_TYPE (*expr_p)))
4984 *expr_p = fold_convert (TREE_TYPE (expr), *expr_p);
4986 break;
4989 return ret;
4992 /* Gimplify the operands of an ASM_EXPR. Input operands should be a gimple
4993 value; output operands should be a gimple lvalue. */
4995 static enum gimplify_status
4996 gimplify_asm_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
4998 tree expr;
4999 int noutputs;
5000 const char **oconstraints;
5001 int i;
5002 tree link;
5003 const char *constraint;
5004 bool allows_mem, allows_reg, is_inout;
5005 enum gimplify_status ret, tret;
5006 gasm *stmt;
5007 vec<tree, va_gc> *inputs;
5008 vec<tree, va_gc> *outputs;
5009 vec<tree, va_gc> *clobbers;
5010 vec<tree, va_gc> *labels;
5011 tree link_next;
5013 expr = *expr_p;
5014 noutputs = list_length (ASM_OUTPUTS (expr));
5015 oconstraints = (const char **) alloca ((noutputs) * sizeof (const char *));
5017 inputs = NULL;
5018 outputs = NULL;
5019 clobbers = NULL;
5020 labels = NULL;
5022 ret = GS_ALL_DONE;
5023 link_next = NULL_TREE;
5024 for (i = 0, link = ASM_OUTPUTS (expr); link; ++i, link = link_next)
5026 bool ok;
5027 size_t constraint_len;
5029 link_next = TREE_CHAIN (link);
5031 oconstraints[i]
5032 = constraint
5033 = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link)));
5034 constraint_len = strlen (constraint);
5035 if (constraint_len == 0)
5036 continue;
5038 ok = parse_output_constraint (&constraint, i, 0, 0,
5039 &allows_mem, &allows_reg, &is_inout);
5040 if (!ok)
5042 ret = GS_ERROR;
5043 is_inout = false;
5046 if (!allows_reg && allows_mem)
5047 mark_addressable (TREE_VALUE (link));
5049 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
5050 is_inout ? is_gimple_min_lval : is_gimple_lvalue,
5051 fb_lvalue | fb_mayfail);
5052 if (tret == GS_ERROR)
5054 error ("invalid lvalue in asm output %d", i);
5055 ret = tret;
5058 vec_safe_push (outputs, link);
5059 TREE_CHAIN (link) = NULL_TREE;
5061 if (is_inout)
5063 /* An input/output operand. To give the optimizers more
5064 flexibility, split it into separate input and output
5065 operands. */
5066 tree input;
5067 char buf[10];
5069 /* Turn the in/out constraint into an output constraint. */
5070 char *p = xstrdup (constraint);
5071 p[0] = '=';
5072 TREE_VALUE (TREE_PURPOSE (link)) = build_string (constraint_len, p);
5074 /* And add a matching input constraint. */
5075 if (allows_reg)
5077 sprintf (buf, "%d", i);
5079 /* If there are multiple alternatives in the constraint,
5080 handle each of them individually. Those that allow register
5081 will be replaced with operand number, the others will stay
5082 unchanged. */
5083 if (strchr (p, ',') != NULL)
5085 size_t len = 0, buflen = strlen (buf);
5086 char *beg, *end, *str, *dst;
5088 for (beg = p + 1;;)
5090 end = strchr (beg, ',');
5091 if (end == NULL)
5092 end = strchr (beg, '\0');
5093 if ((size_t) (end - beg) < buflen)
5094 len += buflen + 1;
5095 else
5096 len += end - beg + 1;
5097 if (*end)
5098 beg = end + 1;
5099 else
5100 break;
5103 str = (char *) alloca (len);
5104 for (beg = p + 1, dst = str;;)
5106 const char *tem;
5107 bool mem_p, reg_p, inout_p;
5109 end = strchr (beg, ',');
5110 if (end)
5111 *end = '\0';
5112 beg[-1] = '=';
5113 tem = beg - 1;
5114 parse_output_constraint (&tem, i, 0, 0,
5115 &mem_p, &reg_p, &inout_p);
5116 if (dst != str)
5117 *dst++ = ',';
5118 if (reg_p)
5120 memcpy (dst, buf, buflen);
5121 dst += buflen;
5123 else
5125 if (end)
5126 len = end - beg;
5127 else
5128 len = strlen (beg);
5129 memcpy (dst, beg, len);
5130 dst += len;
5132 if (end)
5133 beg = end + 1;
5134 else
5135 break;
5137 *dst = '\0';
5138 input = build_string (dst - str, str);
5140 else
5141 input = build_string (strlen (buf), buf);
5143 else
5144 input = build_string (constraint_len - 1, constraint + 1);
5146 free (p);
5148 input = build_tree_list (build_tree_list (NULL_TREE, input),
5149 unshare_expr (TREE_VALUE (link)));
5150 ASM_INPUTS (expr) = chainon (ASM_INPUTS (expr), input);
5154 link_next = NULL_TREE;
5155 for (link = ASM_INPUTS (expr); link; ++i, link = link_next)
5157 link_next = TREE_CHAIN (link);
5158 constraint = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link)));
5159 parse_input_constraint (&constraint, 0, 0, noutputs, 0,
5160 oconstraints, &allows_mem, &allows_reg);
5162 /* If we can't make copies, we can only accept memory. */
5163 if (TREE_ADDRESSABLE (TREE_TYPE (TREE_VALUE (link))))
5165 if (allows_mem)
5166 allows_reg = 0;
5167 else
5169 error ("impossible constraint in %<asm%>");
5170 error ("non-memory input %d must stay in memory", i);
5171 return GS_ERROR;
5175 /* If the operand is a memory input, it should be an lvalue. */
5176 if (!allows_reg && allows_mem)
5178 tree inputv = TREE_VALUE (link);
5179 STRIP_NOPS (inputv);
5180 if (TREE_CODE (inputv) == PREDECREMENT_EXPR
5181 || TREE_CODE (inputv) == PREINCREMENT_EXPR
5182 || TREE_CODE (inputv) == POSTDECREMENT_EXPR
5183 || TREE_CODE (inputv) == POSTINCREMENT_EXPR)
5184 TREE_VALUE (link) = error_mark_node;
5185 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
5186 is_gimple_lvalue, fb_lvalue | fb_mayfail);
5187 mark_addressable (TREE_VALUE (link));
5188 if (tret == GS_ERROR)
5190 if (EXPR_HAS_LOCATION (TREE_VALUE (link)))
5191 input_location = EXPR_LOCATION (TREE_VALUE (link));
5192 error ("memory input %d is not directly addressable", i);
5193 ret = tret;
5196 else
5198 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
5199 is_gimple_asm_val, fb_rvalue);
5200 if (tret == GS_ERROR)
5201 ret = tret;
5204 TREE_CHAIN (link) = NULL_TREE;
5205 vec_safe_push (inputs, link);
5208 link_next = NULL_TREE;
5209 for (link = ASM_CLOBBERS (expr); link; ++i, link = link_next)
5211 link_next = TREE_CHAIN (link);
5212 TREE_CHAIN (link) = NULL_TREE;
5213 vec_safe_push (clobbers, link);
5216 link_next = NULL_TREE;
5217 for (link = ASM_LABELS (expr); link; ++i, link = link_next)
5219 link_next = TREE_CHAIN (link);
5220 TREE_CHAIN (link) = NULL_TREE;
5221 vec_safe_push (labels, link);
5224 /* Do not add ASMs with errors to the gimple IL stream. */
5225 if (ret != GS_ERROR)
5227 stmt = gimple_build_asm_vec (TREE_STRING_POINTER (ASM_STRING (expr)),
5228 inputs, outputs, clobbers, labels);
5230 gimple_asm_set_volatile (stmt, ASM_VOLATILE_P (expr));
5231 gimple_asm_set_input (stmt, ASM_INPUT_P (expr));
5233 gimplify_seq_add_stmt (pre_p, stmt);
5236 return ret;
5239 /* Gimplify a CLEANUP_POINT_EXPR. Currently this works by adding
5240 GIMPLE_WITH_CLEANUP_EXPRs to the prequeue as we encounter cleanups while
5241 gimplifying the body, and converting them to TRY_FINALLY_EXPRs when we
5242 return to this function.
5244 FIXME should we complexify the prequeue handling instead? Or use flags
5245 for all the cleanups and let the optimizer tighten them up? The current
5246 code seems pretty fragile; it will break on a cleanup within any
5247 non-conditional nesting. But any such nesting would be broken, anyway;
5248 we can't write a TRY_FINALLY_EXPR that starts inside a nesting construct
5249 and continues out of it. We can do that at the RTL level, though, so
5250 having an optimizer to tighten up try/finally regions would be a Good
5251 Thing. */
5253 static enum gimplify_status
5254 gimplify_cleanup_point_expr (tree *expr_p, gimple_seq *pre_p)
5256 gimple_stmt_iterator iter;
5257 gimple_seq body_sequence = NULL;
5259 tree temp = voidify_wrapper_expr (*expr_p, NULL);
5261 /* We only care about the number of conditions between the innermost
5262 CLEANUP_POINT_EXPR and the cleanup. So save and reset the count and
5263 any cleanups collected outside the CLEANUP_POINT_EXPR. */
5264 int old_conds = gimplify_ctxp->conditions;
5265 gimple_seq old_cleanups = gimplify_ctxp->conditional_cleanups;
5266 bool old_in_cleanup_point_expr = gimplify_ctxp->in_cleanup_point_expr;
5267 gimplify_ctxp->conditions = 0;
5268 gimplify_ctxp->conditional_cleanups = NULL;
5269 gimplify_ctxp->in_cleanup_point_expr = true;
5271 gimplify_stmt (&TREE_OPERAND (*expr_p, 0), &body_sequence);
5273 gimplify_ctxp->conditions = old_conds;
5274 gimplify_ctxp->conditional_cleanups = old_cleanups;
5275 gimplify_ctxp->in_cleanup_point_expr = old_in_cleanup_point_expr;
5277 for (iter = gsi_start (body_sequence); !gsi_end_p (iter); )
5279 gimple wce = gsi_stmt (iter);
5281 if (gimple_code (wce) == GIMPLE_WITH_CLEANUP_EXPR)
5283 if (gsi_one_before_end_p (iter))
5285 /* Note that gsi_insert_seq_before and gsi_remove do not
5286 scan operands, unlike some other sequence mutators. */
5287 if (!gimple_wce_cleanup_eh_only (wce))
5288 gsi_insert_seq_before_without_update (&iter,
5289 gimple_wce_cleanup (wce),
5290 GSI_SAME_STMT);
5291 gsi_remove (&iter, true);
5292 break;
5294 else
5296 gtry *gtry;
5297 gimple_seq seq;
5298 enum gimple_try_flags kind;
5300 if (gimple_wce_cleanup_eh_only (wce))
5301 kind = GIMPLE_TRY_CATCH;
5302 else
5303 kind = GIMPLE_TRY_FINALLY;
5304 seq = gsi_split_seq_after (iter);
5306 gtry = gimple_build_try (seq, gimple_wce_cleanup (wce), kind);
5307 /* Do not use gsi_replace here, as it may scan operands.
5308 We want to do a simple structural modification only. */
5309 gsi_set_stmt (&iter, gtry);
5310 iter = gsi_start (gtry->eval);
5313 else
5314 gsi_next (&iter);
5317 gimplify_seq_add_seq (pre_p, body_sequence);
5318 if (temp)
5320 *expr_p = temp;
5321 return GS_OK;
5323 else
5325 *expr_p = NULL;
5326 return GS_ALL_DONE;
5330 /* Insert a cleanup marker for gimplify_cleanup_point_expr. CLEANUP
5331 is the cleanup action required. EH_ONLY is true if the cleanup should
5332 only be executed if an exception is thrown, not on normal exit. */
5334 static void
5335 gimple_push_cleanup (tree var, tree cleanup, bool eh_only, gimple_seq *pre_p)
5337 gimple wce;
5338 gimple_seq cleanup_stmts = NULL;
5340 /* Errors can result in improperly nested cleanups. Which results in
5341 confusion when trying to resolve the GIMPLE_WITH_CLEANUP_EXPR. */
5342 if (seen_error ())
5343 return;
5345 if (gimple_conditional_context ())
5347 /* If we're in a conditional context, this is more complex. We only
5348 want to run the cleanup if we actually ran the initialization that
5349 necessitates it, but we want to run it after the end of the
5350 conditional context. So we wrap the try/finally around the
5351 condition and use a flag to determine whether or not to actually
5352 run the destructor. Thus
5354 test ? f(A()) : 0
5356 becomes (approximately)
5358 flag = 0;
5359 try {
5360 if (test) { A::A(temp); flag = 1; val = f(temp); }
5361 else { val = 0; }
5362 } finally {
5363 if (flag) A::~A(temp);
5367 tree flag = create_tmp_var (boolean_type_node, "cleanup");
5368 gassign *ffalse = gimple_build_assign (flag, boolean_false_node);
5369 gassign *ftrue = gimple_build_assign (flag, boolean_true_node);
5371 cleanup = build3 (COND_EXPR, void_type_node, flag, cleanup, NULL);
5372 gimplify_stmt (&cleanup, &cleanup_stmts);
5373 wce = gimple_build_wce (cleanup_stmts);
5375 gimplify_seq_add_stmt (&gimplify_ctxp->conditional_cleanups, ffalse);
5376 gimplify_seq_add_stmt (&gimplify_ctxp->conditional_cleanups, wce);
5377 gimplify_seq_add_stmt (pre_p, ftrue);
5379 /* Because of this manipulation, and the EH edges that jump
5380 threading cannot redirect, the temporary (VAR) will appear
5381 to be used uninitialized. Don't warn. */
5382 TREE_NO_WARNING (var) = 1;
5384 else
5386 gimplify_stmt (&cleanup, &cleanup_stmts);
5387 wce = gimple_build_wce (cleanup_stmts);
5388 gimple_wce_set_cleanup_eh_only (wce, eh_only);
5389 gimplify_seq_add_stmt (pre_p, wce);
5393 /* Gimplify a TARGET_EXPR which doesn't appear on the rhs of an INIT_EXPR. */
5395 static enum gimplify_status
5396 gimplify_target_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
5398 tree targ = *expr_p;
5399 tree temp = TARGET_EXPR_SLOT (targ);
5400 tree init = TARGET_EXPR_INITIAL (targ);
5401 enum gimplify_status ret;
5403 if (init)
5405 tree cleanup = NULL_TREE;
5407 /* TARGET_EXPR temps aren't part of the enclosing block, so add it
5408 to the temps list. Handle also variable length TARGET_EXPRs. */
5409 if (TREE_CODE (DECL_SIZE (temp)) != INTEGER_CST)
5411 if (!TYPE_SIZES_GIMPLIFIED (TREE_TYPE (temp)))
5412 gimplify_type_sizes (TREE_TYPE (temp), pre_p);
5413 gimplify_vla_decl (temp, pre_p);
5415 else
5416 gimple_add_tmp_var (temp);
5418 /* If TARGET_EXPR_INITIAL is void, then the mere evaluation of the
5419 expression is supposed to initialize the slot. */
5420 if (VOID_TYPE_P (TREE_TYPE (init)))
5421 ret = gimplify_expr (&init, pre_p, post_p, is_gimple_stmt, fb_none);
5422 else
5424 tree init_expr = build2 (INIT_EXPR, void_type_node, temp, init);
5425 init = init_expr;
5426 ret = gimplify_expr (&init, pre_p, post_p, is_gimple_stmt, fb_none);
5427 init = NULL;
5428 ggc_free (init_expr);
5430 if (ret == GS_ERROR)
5432 /* PR c++/28266 Make sure this is expanded only once. */
5433 TARGET_EXPR_INITIAL (targ) = NULL_TREE;
5434 return GS_ERROR;
5436 if (init)
5437 gimplify_and_add (init, pre_p);
5439 /* If needed, push the cleanup for the temp. */
5440 if (TARGET_EXPR_CLEANUP (targ))
5442 if (CLEANUP_EH_ONLY (targ))
5443 gimple_push_cleanup (temp, TARGET_EXPR_CLEANUP (targ),
5444 CLEANUP_EH_ONLY (targ), pre_p);
5445 else
5446 cleanup = TARGET_EXPR_CLEANUP (targ);
5449 /* Add a clobber for the temporary going out of scope, like
5450 gimplify_bind_expr. */
5451 if (gimplify_ctxp->in_cleanup_point_expr
5452 && needs_to_live_in_memory (temp)
5453 && flag_stack_reuse == SR_ALL)
5455 tree clobber = build_constructor (TREE_TYPE (temp),
5456 NULL);
5457 TREE_THIS_VOLATILE (clobber) = true;
5458 clobber = build2 (MODIFY_EXPR, TREE_TYPE (temp), temp, clobber);
5459 if (cleanup)
5460 cleanup = build2 (COMPOUND_EXPR, void_type_node, cleanup,
5461 clobber);
5462 else
5463 cleanup = clobber;
5466 if (cleanup)
5467 gimple_push_cleanup (temp, cleanup, false, pre_p);
5469 /* Only expand this once. */
5470 TREE_OPERAND (targ, 3) = init;
5471 TARGET_EXPR_INITIAL (targ) = NULL_TREE;
5473 else
5474 /* We should have expanded this before. */
5475 gcc_assert (DECL_SEEN_IN_BIND_EXPR_P (temp));
5477 *expr_p = temp;
5478 return GS_OK;
5481 /* Gimplification of expression trees. */
5483 /* Gimplify an expression which appears at statement context. The
5484 corresponding GIMPLE statements are added to *SEQ_P. If *SEQ_P is
5485 NULL, a new sequence is allocated.
5487 Return true if we actually added a statement to the queue. */
5489 bool
5490 gimplify_stmt (tree *stmt_p, gimple_seq *seq_p)
5492 gimple_seq_node last;
5494 last = gimple_seq_last (*seq_p);
5495 gimplify_expr (stmt_p, seq_p, NULL, is_gimple_stmt, fb_none);
5496 return last != gimple_seq_last (*seq_p);
5499 /* Add FIRSTPRIVATE entries for DECL in the OpenMP the surrounding parallels
5500 to CTX. If entries already exist, force them to be some flavor of private.
5501 If there is no enclosing parallel, do nothing. */
5503 void
5504 omp_firstprivatize_variable (struct gimplify_omp_ctx *ctx, tree decl)
5506 splay_tree_node n;
5508 if (decl == NULL || !DECL_P (decl))
5509 return;
5513 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5514 if (n != NULL)
5516 if (n->value & GOVD_SHARED)
5517 n->value = GOVD_FIRSTPRIVATE | (n->value & GOVD_SEEN);
5518 else if (n->value & GOVD_MAP)
5519 n->value |= GOVD_MAP_TO_ONLY;
5520 else
5521 return;
5523 else if (ctx->region_type == ORT_TARGET)
5524 omp_add_variable (ctx, decl, GOVD_MAP | GOVD_MAP_TO_ONLY);
5525 else if (ctx->region_type != ORT_WORKSHARE
5526 && ctx->region_type != ORT_SIMD
5527 && ctx->region_type != ORT_TARGET_DATA)
5528 omp_add_variable (ctx, decl, GOVD_FIRSTPRIVATE);
5530 ctx = ctx->outer_context;
5532 while (ctx);
5535 /* Similarly for each of the type sizes of TYPE. */
5537 static void
5538 omp_firstprivatize_type_sizes (struct gimplify_omp_ctx *ctx, tree type)
5540 if (type == NULL || type == error_mark_node)
5541 return;
5542 type = TYPE_MAIN_VARIANT (type);
5544 if (ctx->privatized_types->add (type))
5545 return;
5547 switch (TREE_CODE (type))
5549 case INTEGER_TYPE:
5550 case ENUMERAL_TYPE:
5551 case BOOLEAN_TYPE:
5552 case REAL_TYPE:
5553 case FIXED_POINT_TYPE:
5554 omp_firstprivatize_variable (ctx, TYPE_MIN_VALUE (type));
5555 omp_firstprivatize_variable (ctx, TYPE_MAX_VALUE (type));
5556 break;
5558 case ARRAY_TYPE:
5559 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (type));
5560 omp_firstprivatize_type_sizes (ctx, TYPE_DOMAIN (type));
5561 break;
5563 case RECORD_TYPE:
5564 case UNION_TYPE:
5565 case QUAL_UNION_TYPE:
5567 tree field;
5568 for (field = TYPE_FIELDS (type); field; field = DECL_CHAIN (field))
5569 if (TREE_CODE (field) == FIELD_DECL)
5571 omp_firstprivatize_variable (ctx, DECL_FIELD_OFFSET (field));
5572 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (field));
5575 break;
5577 case POINTER_TYPE:
5578 case REFERENCE_TYPE:
5579 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (type));
5580 break;
5582 default:
5583 break;
5586 omp_firstprivatize_variable (ctx, TYPE_SIZE (type));
5587 omp_firstprivatize_variable (ctx, TYPE_SIZE_UNIT (type));
5588 lang_hooks.types.omp_firstprivatize_type_sizes (ctx, type);
5591 /* Add an entry for DECL in the OMP context CTX with FLAGS. */
5593 static void
5594 omp_add_variable (struct gimplify_omp_ctx *ctx, tree decl, unsigned int flags)
5596 splay_tree_node n;
5597 unsigned int nflags;
5598 tree t;
5600 if (error_operand_p (decl))
5601 return;
5603 /* Never elide decls whose type has TREE_ADDRESSABLE set. This means
5604 there are constructors involved somewhere. */
5605 if (TREE_ADDRESSABLE (TREE_TYPE (decl))
5606 || TYPE_NEEDS_CONSTRUCTING (TREE_TYPE (decl)))
5607 flags |= GOVD_SEEN;
5609 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5610 if (n != NULL && n->value != GOVD_ALIGNED)
5612 /* We shouldn't be re-adding the decl with the same data
5613 sharing class. */
5614 gcc_assert ((n->value & GOVD_DATA_SHARE_CLASS & flags) == 0);
5615 /* The only combination of data sharing classes we should see is
5616 FIRSTPRIVATE and LASTPRIVATE. */
5617 nflags = n->value | flags;
5618 gcc_assert ((nflags & GOVD_DATA_SHARE_CLASS)
5619 == (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE)
5620 || (flags & GOVD_DATA_SHARE_CLASS) == 0);
5621 n->value = nflags;
5622 return;
5625 /* When adding a variable-sized variable, we have to handle all sorts
5626 of additional bits of data: the pointer replacement variable, and
5627 the parameters of the type. */
5628 if (DECL_SIZE (decl) && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
5630 /* Add the pointer replacement variable as PRIVATE if the variable
5631 replacement is private, else FIRSTPRIVATE since we'll need the
5632 address of the original variable either for SHARED, or for the
5633 copy into or out of the context. */
5634 if (!(flags & GOVD_LOCAL))
5636 if (flags & GOVD_MAP)
5637 nflags = GOVD_MAP | GOVD_MAP_TO_ONLY | GOVD_EXPLICIT;
5638 else if (flags & GOVD_PRIVATE)
5639 nflags = GOVD_PRIVATE;
5640 else
5641 nflags = GOVD_FIRSTPRIVATE;
5642 nflags |= flags & GOVD_SEEN;
5643 t = DECL_VALUE_EXPR (decl);
5644 gcc_assert (TREE_CODE (t) == INDIRECT_REF);
5645 t = TREE_OPERAND (t, 0);
5646 gcc_assert (DECL_P (t));
5647 omp_add_variable (ctx, t, nflags);
5650 /* Add all of the variable and type parameters (which should have
5651 been gimplified to a formal temporary) as FIRSTPRIVATE. */
5652 omp_firstprivatize_variable (ctx, DECL_SIZE_UNIT (decl));
5653 omp_firstprivatize_variable (ctx, DECL_SIZE (decl));
5654 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (decl));
5656 /* The variable-sized variable itself is never SHARED, only some form
5657 of PRIVATE. The sharing would take place via the pointer variable
5658 which we remapped above. */
5659 if (flags & GOVD_SHARED)
5660 flags = GOVD_PRIVATE | GOVD_DEBUG_PRIVATE
5661 | (flags & (GOVD_SEEN | GOVD_EXPLICIT));
5663 /* We're going to make use of the TYPE_SIZE_UNIT at least in the
5664 alloca statement we generate for the variable, so make sure it
5665 is available. This isn't automatically needed for the SHARED
5666 case, since we won't be allocating local storage then.
5667 For local variables TYPE_SIZE_UNIT might not be gimplified yet,
5668 in this case omp_notice_variable will be called later
5669 on when it is gimplified. */
5670 else if (! (flags & (GOVD_LOCAL | GOVD_MAP))
5671 && DECL_P (TYPE_SIZE_UNIT (TREE_TYPE (decl))))
5672 omp_notice_variable (ctx, TYPE_SIZE_UNIT (TREE_TYPE (decl)), true);
5674 else if ((flags & (GOVD_MAP | GOVD_LOCAL)) == 0
5675 && lang_hooks.decls.omp_privatize_by_reference (decl))
5677 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (decl));
5679 /* Similar to the direct variable sized case above, we'll need the
5680 size of references being privatized. */
5681 if ((flags & GOVD_SHARED) == 0)
5683 t = TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl)));
5684 if (TREE_CODE (t) != INTEGER_CST)
5685 omp_notice_variable (ctx, t, true);
5689 if (n != NULL)
5690 n->value |= flags;
5691 else
5692 splay_tree_insert (ctx->variables, (splay_tree_key)decl, flags);
5695 /* Notice a threadprivate variable DECL used in OMP context CTX.
5696 This just prints out diagnostics about threadprivate variable uses
5697 in untied tasks. If DECL2 is non-NULL, prevent this warning
5698 on that variable. */
5700 static bool
5701 omp_notice_threadprivate_variable (struct gimplify_omp_ctx *ctx, tree decl,
5702 tree decl2)
5704 splay_tree_node n;
5705 struct gimplify_omp_ctx *octx;
5707 for (octx = ctx; octx; octx = octx->outer_context)
5708 if (octx->region_type == ORT_TARGET)
5710 n = splay_tree_lookup (octx->variables, (splay_tree_key)decl);
5711 if (n == NULL)
5713 error ("threadprivate variable %qE used in target region",
5714 DECL_NAME (decl));
5715 error_at (octx->location, "enclosing target region");
5716 splay_tree_insert (octx->variables, (splay_tree_key)decl, 0);
5718 if (decl2)
5719 splay_tree_insert (octx->variables, (splay_tree_key)decl2, 0);
5722 if (ctx->region_type != ORT_UNTIED_TASK)
5723 return false;
5724 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5725 if (n == NULL)
5727 error ("threadprivate variable %qE used in untied task",
5728 DECL_NAME (decl));
5729 error_at (ctx->location, "enclosing task");
5730 splay_tree_insert (ctx->variables, (splay_tree_key)decl, 0);
5732 if (decl2)
5733 splay_tree_insert (ctx->variables, (splay_tree_key)decl2, 0);
5734 return false;
5737 /* Record the fact that DECL was used within the OMP context CTX.
5738 IN_CODE is true when real code uses DECL, and false when we should
5739 merely emit default(none) errors. Return true if DECL is going to
5740 be remapped and thus DECL shouldn't be gimplified into its
5741 DECL_VALUE_EXPR (if any). */
5743 static bool
5744 omp_notice_variable (struct gimplify_omp_ctx *ctx, tree decl, bool in_code)
5746 splay_tree_node n;
5747 unsigned flags = in_code ? GOVD_SEEN : 0;
5748 bool ret = false, shared;
5750 if (error_operand_p (decl))
5751 return false;
5753 /* Threadprivate variables are predetermined. */
5754 if (is_global_var (decl))
5756 if (DECL_THREAD_LOCAL_P (decl))
5757 return omp_notice_threadprivate_variable (ctx, decl, NULL_TREE);
5759 if (DECL_HAS_VALUE_EXPR_P (decl))
5761 tree value = get_base_address (DECL_VALUE_EXPR (decl));
5763 if (value && DECL_P (value) && DECL_THREAD_LOCAL_P (value))
5764 return omp_notice_threadprivate_variable (ctx, decl, value);
5768 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5769 if (ctx->region_type == ORT_TARGET)
5771 ret = lang_hooks.decls.omp_disregard_value_expr (decl, true);
5772 if (n == NULL)
5774 if (!lang_hooks.types.omp_mappable_type (TREE_TYPE (decl)))
5776 error ("%qD referenced in target region does not have "
5777 "a mappable type", decl);
5778 omp_add_variable (ctx, decl, GOVD_MAP | GOVD_EXPLICIT | flags);
5780 else
5781 omp_add_variable (ctx, decl, GOVD_MAP | flags);
5783 else
5785 /* If nothing changed, there's nothing left to do. */
5786 if ((n->value & flags) == flags)
5787 return ret;
5788 n->value |= flags;
5790 goto do_outer;
5793 if (n == NULL)
5795 enum omp_clause_default_kind default_kind, kind;
5796 struct gimplify_omp_ctx *octx;
5798 if (ctx->region_type == ORT_WORKSHARE
5799 || ctx->region_type == ORT_SIMD
5800 || ctx->region_type == ORT_TARGET_DATA)
5801 goto do_outer;
5803 /* ??? Some compiler-generated variables (like SAVE_EXPRs) could be
5804 remapped firstprivate instead of shared. To some extent this is
5805 addressed in omp_firstprivatize_type_sizes, but not effectively. */
5806 default_kind = ctx->default_kind;
5807 kind = lang_hooks.decls.omp_predetermined_sharing (decl);
5808 if (kind != OMP_CLAUSE_DEFAULT_UNSPECIFIED)
5809 default_kind = kind;
5811 switch (default_kind)
5813 case OMP_CLAUSE_DEFAULT_NONE:
5814 if ((ctx->region_type & ORT_PARALLEL) != 0)
5816 error ("%qE not specified in enclosing parallel",
5817 DECL_NAME (lang_hooks.decls.omp_report_decl (decl)));
5818 error_at (ctx->location, "enclosing parallel");
5820 else if ((ctx->region_type & ORT_TASK) != 0)
5822 error ("%qE not specified in enclosing task",
5823 DECL_NAME (lang_hooks.decls.omp_report_decl (decl)));
5824 error_at (ctx->location, "enclosing task");
5826 else if (ctx->region_type == ORT_TEAMS)
5828 error ("%qE not specified in enclosing teams construct",
5829 DECL_NAME (lang_hooks.decls.omp_report_decl (decl)));
5830 error_at (ctx->location, "enclosing teams construct");
5832 else
5833 gcc_unreachable ();
5834 /* FALLTHRU */
5835 case OMP_CLAUSE_DEFAULT_SHARED:
5836 flags |= GOVD_SHARED;
5837 break;
5838 case OMP_CLAUSE_DEFAULT_PRIVATE:
5839 flags |= GOVD_PRIVATE;
5840 break;
5841 case OMP_CLAUSE_DEFAULT_FIRSTPRIVATE:
5842 flags |= GOVD_FIRSTPRIVATE;
5843 break;
5844 case OMP_CLAUSE_DEFAULT_UNSPECIFIED:
5845 /* decl will be either GOVD_FIRSTPRIVATE or GOVD_SHARED. */
5846 gcc_assert ((ctx->region_type & ORT_TASK) != 0);
5847 if (ctx->outer_context)
5848 omp_notice_variable (ctx->outer_context, decl, in_code);
5849 for (octx = ctx->outer_context; octx; octx = octx->outer_context)
5851 splay_tree_node n2;
5853 if ((octx->region_type & (ORT_TARGET_DATA | ORT_TARGET)) != 0)
5854 continue;
5855 n2 = splay_tree_lookup (octx->variables, (splay_tree_key) decl);
5856 if (n2 && (n2->value & GOVD_DATA_SHARE_CLASS) != GOVD_SHARED)
5858 flags |= GOVD_FIRSTPRIVATE;
5859 break;
5861 if ((octx->region_type & (ORT_PARALLEL | ORT_TEAMS)) != 0)
5862 break;
5864 if (flags & GOVD_FIRSTPRIVATE)
5865 break;
5866 if (octx == NULL
5867 && (TREE_CODE (decl) == PARM_DECL
5868 || (!is_global_var (decl)
5869 && DECL_CONTEXT (decl) == current_function_decl)))
5871 flags |= GOVD_FIRSTPRIVATE;
5872 break;
5874 flags |= GOVD_SHARED;
5875 break;
5876 default:
5877 gcc_unreachable ();
5880 if ((flags & GOVD_PRIVATE)
5881 && lang_hooks.decls.omp_private_outer_ref (decl))
5882 flags |= GOVD_PRIVATE_OUTER_REF;
5884 omp_add_variable (ctx, decl, flags);
5886 shared = (flags & GOVD_SHARED) != 0;
5887 ret = lang_hooks.decls.omp_disregard_value_expr (decl, shared);
5888 goto do_outer;
5891 if ((n->value & (GOVD_SEEN | GOVD_LOCAL)) == 0
5892 && (flags & (GOVD_SEEN | GOVD_LOCAL)) == GOVD_SEEN
5893 && DECL_SIZE (decl)
5894 && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
5896 splay_tree_node n2;
5897 tree t = DECL_VALUE_EXPR (decl);
5898 gcc_assert (TREE_CODE (t) == INDIRECT_REF);
5899 t = TREE_OPERAND (t, 0);
5900 gcc_assert (DECL_P (t));
5901 n2 = splay_tree_lookup (ctx->variables, (splay_tree_key) t);
5902 n2->value |= GOVD_SEEN;
5905 shared = ((flags | n->value) & GOVD_SHARED) != 0;
5906 ret = lang_hooks.decls.omp_disregard_value_expr (decl, shared);
5908 /* If nothing changed, there's nothing left to do. */
5909 if ((n->value & flags) == flags)
5910 return ret;
5911 flags |= n->value;
5912 n->value = flags;
5914 do_outer:
5915 /* If the variable is private in the current context, then we don't
5916 need to propagate anything to an outer context. */
5917 if ((flags & GOVD_PRIVATE) && !(flags & GOVD_PRIVATE_OUTER_REF))
5918 return ret;
5919 if (ctx->outer_context
5920 && omp_notice_variable (ctx->outer_context, decl, in_code))
5921 return true;
5922 return ret;
5925 /* Verify that DECL is private within CTX. If there's specific information
5926 to the contrary in the innermost scope, generate an error. */
5928 static bool
5929 omp_is_private (struct gimplify_omp_ctx *ctx, tree decl, int simd)
5931 splay_tree_node n;
5933 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5934 if (n != NULL)
5936 if (n->value & GOVD_SHARED)
5938 if (ctx == gimplify_omp_ctxp)
5940 if (simd)
5941 error ("iteration variable %qE is predetermined linear",
5942 DECL_NAME (decl));
5943 else
5944 error ("iteration variable %qE should be private",
5945 DECL_NAME (decl));
5946 n->value = GOVD_PRIVATE;
5947 return true;
5949 else
5950 return false;
5952 else if ((n->value & GOVD_EXPLICIT) != 0
5953 && (ctx == gimplify_omp_ctxp
5954 || (ctx->region_type == ORT_COMBINED_PARALLEL
5955 && gimplify_omp_ctxp->outer_context == ctx)))
5957 if ((n->value & GOVD_FIRSTPRIVATE) != 0)
5958 error ("iteration variable %qE should not be firstprivate",
5959 DECL_NAME (decl));
5960 else if ((n->value & GOVD_REDUCTION) != 0)
5961 error ("iteration variable %qE should not be reduction",
5962 DECL_NAME (decl));
5963 else if (simd == 1 && (n->value & GOVD_LASTPRIVATE) != 0)
5964 error ("iteration variable %qE should not be lastprivate",
5965 DECL_NAME (decl));
5966 else if (simd && (n->value & GOVD_PRIVATE) != 0)
5967 error ("iteration variable %qE should not be private",
5968 DECL_NAME (decl));
5969 else if (simd == 2 && (n->value & GOVD_LINEAR) != 0)
5970 error ("iteration variable %qE is predetermined linear",
5971 DECL_NAME (decl));
5973 return (ctx == gimplify_omp_ctxp
5974 || (ctx->region_type == ORT_COMBINED_PARALLEL
5975 && gimplify_omp_ctxp->outer_context == ctx));
5978 if (ctx->region_type != ORT_WORKSHARE
5979 && ctx->region_type != ORT_SIMD)
5980 return false;
5981 else if (ctx->outer_context)
5982 return omp_is_private (ctx->outer_context, decl, simd);
5983 return false;
5986 /* Return true if DECL is private within a parallel region
5987 that binds to the current construct's context or in parallel
5988 region's REDUCTION clause. */
5990 static bool
5991 omp_check_private (struct gimplify_omp_ctx *ctx, tree decl, bool copyprivate)
5993 splay_tree_node n;
5997 ctx = ctx->outer_context;
5998 if (ctx == NULL)
5999 return !(is_global_var (decl)
6000 /* References might be private, but might be shared too,
6001 when checking for copyprivate, assume they might be
6002 private, otherwise assume they might be shared. */
6003 || (!copyprivate
6004 && lang_hooks.decls.omp_privatize_by_reference (decl)));
6006 if ((ctx->region_type & (ORT_TARGET | ORT_TARGET_DATA)) != 0)
6007 continue;
6009 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
6010 if (n != NULL)
6011 return (n->value & GOVD_SHARED) == 0;
6013 while (ctx->region_type == ORT_WORKSHARE
6014 || ctx->region_type == ORT_SIMD);
6015 return false;
6018 /* Scan the OMP clauses in *LIST_P, installing mappings into a new
6019 and previous omp contexts. */
6021 static void
6022 gimplify_scan_omp_clauses (tree *list_p, gimple_seq *pre_p,
6023 enum omp_region_type region_type)
6025 struct gimplify_omp_ctx *ctx, *outer_ctx;
6026 tree c;
6028 ctx = new_omp_context (region_type);
6029 outer_ctx = ctx->outer_context;
6031 while ((c = *list_p) != NULL)
6033 bool remove = false;
6034 bool notice_outer = true;
6035 const char *check_non_private = NULL;
6036 unsigned int flags;
6037 tree decl;
6039 switch (OMP_CLAUSE_CODE (c))
6041 case OMP_CLAUSE_PRIVATE:
6042 flags = GOVD_PRIVATE | GOVD_EXPLICIT;
6043 if (lang_hooks.decls.omp_private_outer_ref (OMP_CLAUSE_DECL (c)))
6045 flags |= GOVD_PRIVATE_OUTER_REF;
6046 OMP_CLAUSE_PRIVATE_OUTER_REF (c) = 1;
6048 else
6049 notice_outer = false;
6050 goto do_add;
6051 case OMP_CLAUSE_SHARED:
6052 flags = GOVD_SHARED | GOVD_EXPLICIT;
6053 goto do_add;
6054 case OMP_CLAUSE_FIRSTPRIVATE:
6055 flags = GOVD_FIRSTPRIVATE | GOVD_EXPLICIT;
6056 check_non_private = "firstprivate";
6057 goto do_add;
6058 case OMP_CLAUSE_LASTPRIVATE:
6059 flags = GOVD_LASTPRIVATE | GOVD_SEEN | GOVD_EXPLICIT;
6060 check_non_private = "lastprivate";
6061 goto do_add;
6062 case OMP_CLAUSE_REDUCTION:
6063 flags = GOVD_REDUCTION | GOVD_SEEN | GOVD_EXPLICIT;
6064 check_non_private = "reduction";
6065 goto do_add;
6066 case OMP_CLAUSE_LINEAR:
6067 if (gimplify_expr (&OMP_CLAUSE_LINEAR_STEP (c), pre_p, NULL,
6068 is_gimple_val, fb_rvalue) == GS_ERROR)
6070 remove = true;
6071 break;
6073 flags = GOVD_LINEAR | GOVD_EXPLICIT;
6074 goto do_add;
6076 case OMP_CLAUSE_MAP:
6077 decl = OMP_CLAUSE_DECL (c);
6078 if (error_operand_p (decl))
6080 remove = true;
6081 break;
6083 if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
6084 OMP_CLAUSE_SIZE (c) = DECL_P (decl) ? DECL_SIZE_UNIT (decl)
6085 : TYPE_SIZE_UNIT (TREE_TYPE (decl));
6086 if (gimplify_expr (&OMP_CLAUSE_SIZE (c), pre_p,
6087 NULL, is_gimple_val, fb_rvalue) == GS_ERROR)
6089 remove = true;
6090 break;
6092 if (!DECL_P (decl))
6094 if (gimplify_expr (&OMP_CLAUSE_DECL (c), pre_p,
6095 NULL, is_gimple_lvalue, fb_lvalue)
6096 == GS_ERROR)
6098 remove = true;
6099 break;
6101 break;
6103 flags = GOVD_MAP | GOVD_EXPLICIT;
6104 goto do_add;
6106 case OMP_CLAUSE_DEPEND:
6107 if (TREE_CODE (OMP_CLAUSE_DECL (c)) == COMPOUND_EXPR)
6109 gimplify_expr (&TREE_OPERAND (OMP_CLAUSE_DECL (c), 0), pre_p,
6110 NULL, is_gimple_val, fb_rvalue);
6111 OMP_CLAUSE_DECL (c) = TREE_OPERAND (OMP_CLAUSE_DECL (c), 1);
6113 if (error_operand_p (OMP_CLAUSE_DECL (c)))
6115 remove = true;
6116 break;
6118 OMP_CLAUSE_DECL (c) = build_fold_addr_expr (OMP_CLAUSE_DECL (c));
6119 if (gimplify_expr (&OMP_CLAUSE_DECL (c), pre_p, NULL,
6120 is_gimple_val, fb_rvalue) == GS_ERROR)
6122 remove = true;
6123 break;
6125 break;
6127 case OMP_CLAUSE_TO:
6128 case OMP_CLAUSE_FROM:
6129 case OMP_CLAUSE__CACHE_:
6130 decl = OMP_CLAUSE_DECL (c);
6131 if (error_operand_p (decl))
6133 remove = true;
6134 break;
6136 if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
6137 OMP_CLAUSE_SIZE (c) = DECL_P (decl) ? DECL_SIZE_UNIT (decl)
6138 : TYPE_SIZE_UNIT (TREE_TYPE (decl));
6139 if (gimplify_expr (&OMP_CLAUSE_SIZE (c), pre_p,
6140 NULL, is_gimple_val, fb_rvalue) == GS_ERROR)
6142 remove = true;
6143 break;
6145 if (!DECL_P (decl))
6147 if (gimplify_expr (&OMP_CLAUSE_DECL (c), pre_p,
6148 NULL, is_gimple_lvalue, fb_lvalue)
6149 == GS_ERROR)
6151 remove = true;
6152 break;
6154 break;
6156 goto do_notice;
6158 do_add:
6159 decl = OMP_CLAUSE_DECL (c);
6160 if (error_operand_p (decl))
6162 remove = true;
6163 break;
6165 omp_add_variable (ctx, decl, flags);
6166 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_REDUCTION
6167 && OMP_CLAUSE_REDUCTION_PLACEHOLDER (c))
6169 omp_add_variable (ctx, OMP_CLAUSE_REDUCTION_PLACEHOLDER (c),
6170 GOVD_LOCAL | GOVD_SEEN);
6171 gimplify_omp_ctxp = ctx;
6172 push_gimplify_context ();
6174 OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c) = NULL;
6175 OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c) = NULL;
6177 gimplify_and_add (OMP_CLAUSE_REDUCTION_INIT (c),
6178 &OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c));
6179 pop_gimplify_context
6180 (gimple_seq_first_stmt (OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c)));
6181 push_gimplify_context ();
6182 gimplify_and_add (OMP_CLAUSE_REDUCTION_MERGE (c),
6183 &OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c));
6184 pop_gimplify_context
6185 (gimple_seq_first_stmt (OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c)));
6186 OMP_CLAUSE_REDUCTION_INIT (c) = NULL_TREE;
6187 OMP_CLAUSE_REDUCTION_MERGE (c) = NULL_TREE;
6189 gimplify_omp_ctxp = outer_ctx;
6191 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE
6192 && OMP_CLAUSE_LASTPRIVATE_STMT (c))
6194 gimplify_omp_ctxp = ctx;
6195 push_gimplify_context ();
6196 if (TREE_CODE (OMP_CLAUSE_LASTPRIVATE_STMT (c)) != BIND_EXPR)
6198 tree bind = build3 (BIND_EXPR, void_type_node, NULL,
6199 NULL, NULL);
6200 TREE_SIDE_EFFECTS (bind) = 1;
6201 BIND_EXPR_BODY (bind) = OMP_CLAUSE_LASTPRIVATE_STMT (c);
6202 OMP_CLAUSE_LASTPRIVATE_STMT (c) = bind;
6204 gimplify_and_add (OMP_CLAUSE_LASTPRIVATE_STMT (c),
6205 &OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c));
6206 pop_gimplify_context
6207 (gimple_seq_first_stmt (OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c)));
6208 OMP_CLAUSE_LASTPRIVATE_STMT (c) = NULL_TREE;
6210 gimplify_omp_ctxp = outer_ctx;
6212 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
6213 && OMP_CLAUSE_LINEAR_STMT (c))
6215 gimplify_omp_ctxp = ctx;
6216 push_gimplify_context ();
6217 if (TREE_CODE (OMP_CLAUSE_LINEAR_STMT (c)) != BIND_EXPR)
6219 tree bind = build3 (BIND_EXPR, void_type_node, NULL,
6220 NULL, NULL);
6221 TREE_SIDE_EFFECTS (bind) = 1;
6222 BIND_EXPR_BODY (bind) = OMP_CLAUSE_LINEAR_STMT (c);
6223 OMP_CLAUSE_LINEAR_STMT (c) = bind;
6225 gimplify_and_add (OMP_CLAUSE_LINEAR_STMT (c),
6226 &OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c));
6227 pop_gimplify_context
6228 (gimple_seq_first_stmt (OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c)));
6229 OMP_CLAUSE_LINEAR_STMT (c) = NULL_TREE;
6231 gimplify_omp_ctxp = outer_ctx;
6233 if (notice_outer)
6234 goto do_notice;
6235 break;
6237 case OMP_CLAUSE_COPYIN:
6238 case OMP_CLAUSE_COPYPRIVATE:
6239 decl = OMP_CLAUSE_DECL (c);
6240 if (error_operand_p (decl))
6242 remove = true;
6243 break;
6245 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_COPYPRIVATE
6246 && !remove
6247 && !omp_check_private (ctx, decl, true))
6249 remove = true;
6250 if (is_global_var (decl))
6252 if (DECL_THREAD_LOCAL_P (decl))
6253 remove = false;
6254 else if (DECL_HAS_VALUE_EXPR_P (decl))
6256 tree value = get_base_address (DECL_VALUE_EXPR (decl));
6258 if (value
6259 && DECL_P (value)
6260 && DECL_THREAD_LOCAL_P (value))
6261 remove = false;
6264 if (remove)
6265 error_at (OMP_CLAUSE_LOCATION (c),
6266 "copyprivate variable %qE is not threadprivate"
6267 " or private in outer context", DECL_NAME (decl));
6269 do_notice:
6270 if (outer_ctx)
6271 omp_notice_variable (outer_ctx, decl, true);
6272 if (check_non_private
6273 && region_type == ORT_WORKSHARE
6274 && omp_check_private (ctx, decl, false))
6276 error ("%s variable %qE is private in outer context",
6277 check_non_private, DECL_NAME (decl));
6278 remove = true;
6280 break;
6282 case OMP_CLAUSE_FINAL:
6283 case OMP_CLAUSE_IF:
6284 OMP_CLAUSE_OPERAND (c, 0)
6285 = gimple_boolify (OMP_CLAUSE_OPERAND (c, 0));
6286 /* Fall through. */
6288 case OMP_CLAUSE_SCHEDULE:
6289 case OMP_CLAUSE_NUM_THREADS:
6290 case OMP_CLAUSE_NUM_TEAMS:
6291 case OMP_CLAUSE_THREAD_LIMIT:
6292 case OMP_CLAUSE_DIST_SCHEDULE:
6293 case OMP_CLAUSE_DEVICE:
6294 case OMP_CLAUSE__CILK_FOR_COUNT_:
6295 case OMP_CLAUSE_ASYNC:
6296 case OMP_CLAUSE_WAIT:
6297 case OMP_CLAUSE_NUM_GANGS:
6298 case OMP_CLAUSE_NUM_WORKERS:
6299 case OMP_CLAUSE_VECTOR_LENGTH:
6300 case OMP_CLAUSE_GANG:
6301 case OMP_CLAUSE_WORKER:
6302 case OMP_CLAUSE_VECTOR:
6303 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c, 0), pre_p, NULL,
6304 is_gimple_val, fb_rvalue) == GS_ERROR)
6305 remove = true;
6306 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_GANG
6307 && gimplify_expr (&OMP_CLAUSE_OPERAND (c, 1), pre_p, NULL,
6308 is_gimple_val, fb_rvalue) == GS_ERROR)
6309 remove = true;
6310 break;
6312 case OMP_CLAUSE_DEVICE_RESIDENT:
6313 case OMP_CLAUSE_USE_DEVICE:
6314 case OMP_CLAUSE_INDEPENDENT:
6315 remove = true;
6316 break;
6318 case OMP_CLAUSE_NOWAIT:
6319 case OMP_CLAUSE_ORDERED:
6320 case OMP_CLAUSE_UNTIED:
6321 case OMP_CLAUSE_COLLAPSE:
6322 case OMP_CLAUSE_AUTO:
6323 case OMP_CLAUSE_SEQ:
6324 case OMP_CLAUSE_MERGEABLE:
6325 case OMP_CLAUSE_PROC_BIND:
6326 case OMP_CLAUSE_SAFELEN:
6327 break;
6329 case OMP_CLAUSE_ALIGNED:
6330 decl = OMP_CLAUSE_DECL (c);
6331 if (error_operand_p (decl))
6333 remove = true;
6334 break;
6336 if (gimplify_expr (&OMP_CLAUSE_ALIGNED_ALIGNMENT (c), pre_p, NULL,
6337 is_gimple_val, fb_rvalue) == GS_ERROR)
6339 remove = true;
6340 break;
6342 if (!is_global_var (decl)
6343 && TREE_CODE (TREE_TYPE (decl)) == POINTER_TYPE)
6344 omp_add_variable (ctx, decl, GOVD_ALIGNED);
6345 break;
6347 case OMP_CLAUSE_DEFAULT:
6348 ctx->default_kind = OMP_CLAUSE_DEFAULT_KIND (c);
6349 break;
6351 default:
6352 gcc_unreachable ();
6355 if (remove)
6356 *list_p = OMP_CLAUSE_CHAIN (c);
6357 else
6358 list_p = &OMP_CLAUSE_CHAIN (c);
6361 gimplify_omp_ctxp = ctx;
6364 struct gimplify_adjust_omp_clauses_data
6366 tree *list_p;
6367 gimple_seq *pre_p;
6370 /* For all variables that were not actually used within the context,
6371 remove PRIVATE, SHARED, and FIRSTPRIVATE clauses. */
6373 static int
6374 gimplify_adjust_omp_clauses_1 (splay_tree_node n, void *data)
6376 tree *list_p = ((struct gimplify_adjust_omp_clauses_data *) data)->list_p;
6377 gimple_seq *pre_p
6378 = ((struct gimplify_adjust_omp_clauses_data *) data)->pre_p;
6379 tree decl = (tree) n->key;
6380 unsigned flags = n->value;
6381 enum omp_clause_code code;
6382 tree clause;
6383 bool private_debug;
6385 if (flags & (GOVD_EXPLICIT | GOVD_LOCAL))
6386 return 0;
6387 if ((flags & GOVD_SEEN) == 0)
6388 return 0;
6389 if (flags & GOVD_DEBUG_PRIVATE)
6391 gcc_assert ((flags & GOVD_DATA_SHARE_CLASS) == GOVD_PRIVATE);
6392 private_debug = true;
6394 else if (flags & GOVD_MAP)
6395 private_debug = false;
6396 else
6397 private_debug
6398 = lang_hooks.decls.omp_private_debug_clause (decl,
6399 !!(flags & GOVD_SHARED));
6400 if (private_debug)
6401 code = OMP_CLAUSE_PRIVATE;
6402 else if (flags & GOVD_MAP)
6403 code = OMP_CLAUSE_MAP;
6404 else if (flags & GOVD_SHARED)
6406 if (is_global_var (decl))
6408 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp->outer_context;
6409 while (ctx != NULL)
6411 splay_tree_node on
6412 = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
6413 if (on && (on->value & (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE
6414 | GOVD_PRIVATE | GOVD_REDUCTION
6415 | GOVD_LINEAR | GOVD_MAP)) != 0)
6416 break;
6417 ctx = ctx->outer_context;
6419 if (ctx == NULL)
6420 return 0;
6422 code = OMP_CLAUSE_SHARED;
6424 else if (flags & GOVD_PRIVATE)
6425 code = OMP_CLAUSE_PRIVATE;
6426 else if (flags & GOVD_FIRSTPRIVATE)
6427 code = OMP_CLAUSE_FIRSTPRIVATE;
6428 else if (flags & GOVD_LASTPRIVATE)
6429 code = OMP_CLAUSE_LASTPRIVATE;
6430 else if (flags & GOVD_ALIGNED)
6431 return 0;
6432 else
6433 gcc_unreachable ();
6435 clause = build_omp_clause (input_location, code);
6436 OMP_CLAUSE_DECL (clause) = decl;
6437 OMP_CLAUSE_CHAIN (clause) = *list_p;
6438 if (private_debug)
6439 OMP_CLAUSE_PRIVATE_DEBUG (clause) = 1;
6440 else if (code == OMP_CLAUSE_PRIVATE && (flags & GOVD_PRIVATE_OUTER_REF))
6441 OMP_CLAUSE_PRIVATE_OUTER_REF (clause) = 1;
6442 else if (code == OMP_CLAUSE_MAP)
6444 OMP_CLAUSE_MAP_KIND (clause) = flags & GOVD_MAP_TO_ONLY
6445 ? OMP_CLAUSE_MAP_TO
6446 : OMP_CLAUSE_MAP_TOFROM;
6447 if (DECL_SIZE (decl)
6448 && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
6450 tree decl2 = DECL_VALUE_EXPR (decl);
6451 gcc_assert (TREE_CODE (decl2) == INDIRECT_REF);
6452 decl2 = TREE_OPERAND (decl2, 0);
6453 gcc_assert (DECL_P (decl2));
6454 tree mem = build_simple_mem_ref (decl2);
6455 OMP_CLAUSE_DECL (clause) = mem;
6456 OMP_CLAUSE_SIZE (clause) = TYPE_SIZE_UNIT (TREE_TYPE (decl));
6457 if (gimplify_omp_ctxp->outer_context)
6459 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp->outer_context;
6460 omp_notice_variable (ctx, decl2, true);
6461 omp_notice_variable (ctx, OMP_CLAUSE_SIZE (clause), true);
6463 tree nc = build_omp_clause (OMP_CLAUSE_LOCATION (clause),
6464 OMP_CLAUSE_MAP);
6465 OMP_CLAUSE_DECL (nc) = decl;
6466 OMP_CLAUSE_SIZE (nc) = size_zero_node;
6467 OMP_CLAUSE_MAP_KIND (nc) = OMP_CLAUSE_MAP_POINTER;
6468 OMP_CLAUSE_CHAIN (nc) = OMP_CLAUSE_CHAIN (clause);
6469 OMP_CLAUSE_CHAIN (clause) = nc;
6471 else
6472 OMP_CLAUSE_SIZE (clause) = DECL_SIZE_UNIT (decl);
6474 if (code == OMP_CLAUSE_FIRSTPRIVATE && (flags & GOVD_LASTPRIVATE) != 0)
6476 tree nc = build_omp_clause (input_location, OMP_CLAUSE_LASTPRIVATE);
6477 OMP_CLAUSE_DECL (nc) = decl;
6478 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (nc) = 1;
6479 OMP_CLAUSE_CHAIN (nc) = *list_p;
6480 OMP_CLAUSE_CHAIN (clause) = nc;
6481 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
6482 gimplify_omp_ctxp = ctx->outer_context;
6483 lang_hooks.decls.omp_finish_clause (nc, pre_p);
6484 gimplify_omp_ctxp = ctx;
6486 *list_p = clause;
6487 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
6488 gimplify_omp_ctxp = ctx->outer_context;
6489 lang_hooks.decls.omp_finish_clause (clause, pre_p);
6490 gimplify_omp_ctxp = ctx;
6491 return 0;
6494 static void
6495 gimplify_adjust_omp_clauses (gimple_seq *pre_p, tree *list_p)
6497 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
6498 tree c, decl;
6500 while ((c = *list_p) != NULL)
6502 splay_tree_node n;
6503 bool remove = false;
6505 switch (OMP_CLAUSE_CODE (c))
6507 case OMP_CLAUSE_PRIVATE:
6508 case OMP_CLAUSE_SHARED:
6509 case OMP_CLAUSE_FIRSTPRIVATE:
6510 case OMP_CLAUSE_LINEAR:
6511 decl = OMP_CLAUSE_DECL (c);
6512 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
6513 remove = !(n->value & GOVD_SEEN);
6514 if (! remove)
6516 bool shared = OMP_CLAUSE_CODE (c) == OMP_CLAUSE_SHARED;
6517 if ((n->value & GOVD_DEBUG_PRIVATE)
6518 || lang_hooks.decls.omp_private_debug_clause (decl, shared))
6520 gcc_assert ((n->value & GOVD_DEBUG_PRIVATE) == 0
6521 || ((n->value & GOVD_DATA_SHARE_CLASS)
6522 == GOVD_PRIVATE));
6523 OMP_CLAUSE_SET_CODE (c, OMP_CLAUSE_PRIVATE);
6524 OMP_CLAUSE_PRIVATE_DEBUG (c) = 1;
6526 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
6527 && ctx->outer_context
6528 && !(OMP_CLAUSE_LINEAR_NO_COPYIN (c)
6529 && OMP_CLAUSE_LINEAR_NO_COPYOUT (c)))
6531 if (ctx->outer_context->combined_loop
6532 && !OMP_CLAUSE_LINEAR_NO_COPYIN (c))
6534 n = splay_tree_lookup (ctx->outer_context->variables,
6535 (splay_tree_key) decl);
6536 if (n == NULL
6537 || (n->value & GOVD_DATA_SHARE_CLASS) == 0)
6539 int flags = GOVD_FIRSTPRIVATE;
6540 /* #pragma omp distribute does not allow
6541 lastprivate clause. */
6542 if (!ctx->outer_context->distribute)
6543 flags |= GOVD_LASTPRIVATE;
6544 if (n == NULL)
6545 omp_add_variable (ctx->outer_context, decl,
6546 flags | GOVD_SEEN);
6547 else
6548 n->value |= flags | GOVD_SEEN;
6551 else if (!is_global_var (decl))
6552 omp_notice_variable (ctx->outer_context, decl, true);
6555 break;
6557 case OMP_CLAUSE_LASTPRIVATE:
6558 /* Make sure OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE is set to
6559 accurately reflect the presence of a FIRSTPRIVATE clause. */
6560 decl = OMP_CLAUSE_DECL (c);
6561 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
6562 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c)
6563 = (n->value & GOVD_FIRSTPRIVATE) != 0;
6564 break;
6566 case OMP_CLAUSE_ALIGNED:
6567 decl = OMP_CLAUSE_DECL (c);
6568 if (!is_global_var (decl))
6570 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
6571 remove = n == NULL || !(n->value & GOVD_SEEN);
6572 if (!remove && TREE_CODE (TREE_TYPE (decl)) == POINTER_TYPE)
6574 struct gimplify_omp_ctx *octx;
6575 if (n != NULL
6576 && (n->value & (GOVD_DATA_SHARE_CLASS
6577 & ~GOVD_FIRSTPRIVATE)))
6578 remove = true;
6579 else
6580 for (octx = ctx->outer_context; octx;
6581 octx = octx->outer_context)
6583 n = splay_tree_lookup (octx->variables,
6584 (splay_tree_key) decl);
6585 if (n == NULL)
6586 continue;
6587 if (n->value & GOVD_LOCAL)
6588 break;
6589 /* We have to avoid assigning a shared variable
6590 to itself when trying to add
6591 __builtin_assume_aligned. */
6592 if (n->value & GOVD_SHARED)
6594 remove = true;
6595 break;
6600 else if (TREE_CODE (TREE_TYPE (decl)) == ARRAY_TYPE)
6602 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
6603 if (n != NULL && (n->value & GOVD_DATA_SHARE_CLASS) != 0)
6604 remove = true;
6606 break;
6608 case OMP_CLAUSE_MAP:
6609 decl = OMP_CLAUSE_DECL (c);
6610 if (!DECL_P (decl))
6611 break;
6612 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
6613 if (ctx->region_type == ORT_TARGET && !(n->value & GOVD_SEEN))
6614 remove = true;
6615 else if (DECL_SIZE (decl)
6616 && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST
6617 && OMP_CLAUSE_MAP_KIND (c) != OMP_CLAUSE_MAP_POINTER)
6619 /* For OMP_CLAUSE_MAP_FORCE_DEVICEPTR, we'll never enter here,
6620 because for these, TREE_CODE (DECL_SIZE (decl)) will always be
6621 INTEGER_CST. */
6622 gcc_assert (OMP_CLAUSE_MAP_KIND (c)
6623 != OMP_CLAUSE_MAP_FORCE_DEVICEPTR);
6625 tree decl2 = DECL_VALUE_EXPR (decl);
6626 gcc_assert (TREE_CODE (decl2) == INDIRECT_REF);
6627 decl2 = TREE_OPERAND (decl2, 0);
6628 gcc_assert (DECL_P (decl2));
6629 tree mem = build_simple_mem_ref (decl2);
6630 OMP_CLAUSE_DECL (c) = mem;
6631 OMP_CLAUSE_SIZE (c) = TYPE_SIZE_UNIT (TREE_TYPE (decl));
6632 if (ctx->outer_context)
6634 omp_notice_variable (ctx->outer_context, decl2, true);
6635 omp_notice_variable (ctx->outer_context,
6636 OMP_CLAUSE_SIZE (c), true);
6638 tree nc = build_omp_clause (OMP_CLAUSE_LOCATION (c),
6639 OMP_CLAUSE_MAP);
6640 OMP_CLAUSE_DECL (nc) = decl;
6641 OMP_CLAUSE_SIZE (nc) = size_zero_node;
6642 OMP_CLAUSE_MAP_KIND (nc) = OMP_CLAUSE_MAP_POINTER;
6643 OMP_CLAUSE_CHAIN (nc) = OMP_CLAUSE_CHAIN (c);
6644 OMP_CLAUSE_CHAIN (c) = nc;
6645 c = nc;
6647 else if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
6648 OMP_CLAUSE_SIZE (c) = DECL_SIZE_UNIT (decl);
6649 break;
6651 case OMP_CLAUSE_TO:
6652 case OMP_CLAUSE_FROM:
6653 case OMP_CLAUSE__CACHE_:
6654 decl = OMP_CLAUSE_DECL (c);
6655 if (!DECL_P (decl))
6656 break;
6657 if (DECL_SIZE (decl)
6658 && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
6660 tree decl2 = DECL_VALUE_EXPR (decl);
6661 gcc_assert (TREE_CODE (decl2) == INDIRECT_REF);
6662 decl2 = TREE_OPERAND (decl2, 0);
6663 gcc_assert (DECL_P (decl2));
6664 tree mem = build_simple_mem_ref (decl2);
6665 OMP_CLAUSE_DECL (c) = mem;
6666 OMP_CLAUSE_SIZE (c) = TYPE_SIZE_UNIT (TREE_TYPE (decl));
6667 if (ctx->outer_context)
6669 omp_notice_variable (ctx->outer_context, decl2, true);
6670 omp_notice_variable (ctx->outer_context,
6671 OMP_CLAUSE_SIZE (c), true);
6674 else if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
6675 OMP_CLAUSE_SIZE (c) = DECL_SIZE_UNIT (decl);
6676 break;
6678 case OMP_CLAUSE_REDUCTION:
6679 case OMP_CLAUSE_COPYIN:
6680 case OMP_CLAUSE_COPYPRIVATE:
6681 case OMP_CLAUSE_IF:
6682 case OMP_CLAUSE_NUM_THREADS:
6683 case OMP_CLAUSE_NUM_TEAMS:
6684 case OMP_CLAUSE_THREAD_LIMIT:
6685 case OMP_CLAUSE_DIST_SCHEDULE:
6686 case OMP_CLAUSE_DEVICE:
6687 case OMP_CLAUSE_SCHEDULE:
6688 case OMP_CLAUSE_NOWAIT:
6689 case OMP_CLAUSE_ORDERED:
6690 case OMP_CLAUSE_DEFAULT:
6691 case OMP_CLAUSE_UNTIED:
6692 case OMP_CLAUSE_COLLAPSE:
6693 case OMP_CLAUSE_FINAL:
6694 case OMP_CLAUSE_MERGEABLE:
6695 case OMP_CLAUSE_PROC_BIND:
6696 case OMP_CLAUSE_SAFELEN:
6697 case OMP_CLAUSE_DEPEND:
6698 case OMP_CLAUSE__CILK_FOR_COUNT_:
6699 case OMP_CLAUSE_ASYNC:
6700 case OMP_CLAUSE_WAIT:
6701 case OMP_CLAUSE_DEVICE_RESIDENT:
6702 case OMP_CLAUSE_USE_DEVICE:
6703 case OMP_CLAUSE_INDEPENDENT:
6704 case OMP_CLAUSE_NUM_GANGS:
6705 case OMP_CLAUSE_NUM_WORKERS:
6706 case OMP_CLAUSE_VECTOR_LENGTH:
6707 case OMP_CLAUSE_GANG:
6708 case OMP_CLAUSE_WORKER:
6709 case OMP_CLAUSE_VECTOR:
6710 case OMP_CLAUSE_AUTO:
6711 case OMP_CLAUSE_SEQ:
6712 break;
6714 default:
6715 gcc_unreachable ();
6718 if (remove)
6719 *list_p = OMP_CLAUSE_CHAIN (c);
6720 else
6721 list_p = &OMP_CLAUSE_CHAIN (c);
6724 /* Add in any implicit data sharing. */
6725 struct gimplify_adjust_omp_clauses_data data;
6726 data.list_p = list_p;
6727 data.pre_p = pre_p;
6728 splay_tree_foreach (ctx->variables, gimplify_adjust_omp_clauses_1, &data);
6730 gimplify_omp_ctxp = ctx->outer_context;
6731 delete_omp_context (ctx);
6734 /* Gimplify OACC_CACHE. */
6736 static void
6737 gimplify_oacc_cache (tree *expr_p, gimple_seq *pre_p)
6739 tree expr = *expr_p;
6741 gimplify_scan_omp_clauses (&OACC_CACHE_CLAUSES (expr), pre_p, ORT_WORKSHARE);
6742 gimplify_adjust_omp_clauses (pre_p, &OACC_CACHE_CLAUSES (expr));
6744 /* TODO: Do something sensible with this information. */
6746 *expr_p = NULL_TREE;
6749 /* Gimplify the contents of an OMP_PARALLEL statement. This involves
6750 gimplification of the body, as well as scanning the body for used
6751 variables. We need to do this scan now, because variable-sized
6752 decls will be decomposed during gimplification. */
6754 static void
6755 gimplify_omp_parallel (tree *expr_p, gimple_seq *pre_p)
6757 tree expr = *expr_p;
6758 gimple g;
6759 gimple_seq body = NULL;
6761 gimplify_scan_omp_clauses (&OMP_PARALLEL_CLAUSES (expr), pre_p,
6762 OMP_PARALLEL_COMBINED (expr)
6763 ? ORT_COMBINED_PARALLEL
6764 : ORT_PARALLEL);
6766 push_gimplify_context ();
6768 g = gimplify_and_return_first (OMP_PARALLEL_BODY (expr), &body);
6769 if (gimple_code (g) == GIMPLE_BIND)
6770 pop_gimplify_context (g);
6771 else
6772 pop_gimplify_context (NULL);
6774 gimplify_adjust_omp_clauses (pre_p, &OMP_PARALLEL_CLAUSES (expr));
6776 g = gimple_build_omp_parallel (body,
6777 OMP_PARALLEL_CLAUSES (expr),
6778 NULL_TREE, NULL_TREE);
6779 if (OMP_PARALLEL_COMBINED (expr))
6780 gimple_omp_set_subcode (g, GF_OMP_PARALLEL_COMBINED);
6781 gimplify_seq_add_stmt (pre_p, g);
6782 *expr_p = NULL_TREE;
6785 /* Gimplify the contents of an OMP_TASK statement. This involves
6786 gimplification of the body, as well as scanning the body for used
6787 variables. We need to do this scan now, because variable-sized
6788 decls will be decomposed during gimplification. */
6790 static void
6791 gimplify_omp_task (tree *expr_p, gimple_seq *pre_p)
6793 tree expr = *expr_p;
6794 gimple g;
6795 gimple_seq body = NULL;
6797 gimplify_scan_omp_clauses (&OMP_TASK_CLAUSES (expr), pre_p,
6798 find_omp_clause (OMP_TASK_CLAUSES (expr),
6799 OMP_CLAUSE_UNTIED)
6800 ? ORT_UNTIED_TASK : ORT_TASK);
6802 push_gimplify_context ();
6804 g = gimplify_and_return_first (OMP_TASK_BODY (expr), &body);
6805 if (gimple_code (g) == GIMPLE_BIND)
6806 pop_gimplify_context (g);
6807 else
6808 pop_gimplify_context (NULL);
6810 gimplify_adjust_omp_clauses (pre_p, &OMP_TASK_CLAUSES (expr));
6812 g = gimple_build_omp_task (body,
6813 OMP_TASK_CLAUSES (expr),
6814 NULL_TREE, NULL_TREE,
6815 NULL_TREE, NULL_TREE, NULL_TREE);
6816 gimplify_seq_add_stmt (pre_p, g);
6817 *expr_p = NULL_TREE;
6820 /* Helper function of gimplify_omp_for, find OMP_FOR resp. OMP_SIMD
6821 with non-NULL OMP_FOR_INIT. */
6823 static tree
6824 find_combined_omp_for (tree *tp, int *walk_subtrees, void *)
6826 *walk_subtrees = 0;
6827 switch (TREE_CODE (*tp))
6829 case OMP_FOR:
6830 *walk_subtrees = 1;
6831 /* FALLTHRU */
6832 case OMP_SIMD:
6833 if (OMP_FOR_INIT (*tp) != NULL_TREE)
6834 return *tp;
6835 break;
6836 case BIND_EXPR:
6837 case STATEMENT_LIST:
6838 case OMP_PARALLEL:
6839 *walk_subtrees = 1;
6840 break;
6841 default:
6842 break;
6844 return NULL_TREE;
6847 /* Gimplify the gross structure of an OMP_FOR statement. */
6849 static enum gimplify_status
6850 gimplify_omp_for (tree *expr_p, gimple_seq *pre_p)
6852 tree for_stmt, orig_for_stmt, decl, var, t;
6853 enum gimplify_status ret = GS_ALL_DONE;
6854 enum gimplify_status tret;
6855 gomp_for *gfor;
6856 gimple_seq for_body, for_pre_body;
6857 int i;
6858 bool simd;
6859 bitmap has_decl_expr = NULL;
6861 orig_for_stmt = for_stmt = *expr_p;
6863 switch (TREE_CODE (for_stmt))
6865 case OMP_FOR:
6866 case CILK_FOR:
6867 case OMP_DISTRIBUTE:
6868 case OACC_LOOP:
6869 simd = false;
6870 break;
6871 case OMP_SIMD:
6872 case CILK_SIMD:
6873 simd = true;
6874 break;
6875 default:
6876 gcc_unreachable ();
6879 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (for_stmt), pre_p,
6880 simd ? ORT_SIMD : ORT_WORKSHARE);
6881 if (TREE_CODE (for_stmt) == OMP_DISTRIBUTE)
6882 gimplify_omp_ctxp->distribute = true;
6884 /* Handle OMP_FOR_INIT. */
6885 for_pre_body = NULL;
6886 if (simd && OMP_FOR_PRE_BODY (for_stmt))
6888 has_decl_expr = BITMAP_ALLOC (NULL);
6889 if (TREE_CODE (OMP_FOR_PRE_BODY (for_stmt)) == DECL_EXPR
6890 && TREE_CODE (DECL_EXPR_DECL (OMP_FOR_PRE_BODY (for_stmt)))
6891 == VAR_DECL)
6893 t = OMP_FOR_PRE_BODY (for_stmt);
6894 bitmap_set_bit (has_decl_expr, DECL_UID (DECL_EXPR_DECL (t)));
6896 else if (TREE_CODE (OMP_FOR_PRE_BODY (for_stmt)) == STATEMENT_LIST)
6898 tree_stmt_iterator si;
6899 for (si = tsi_start (OMP_FOR_PRE_BODY (for_stmt)); !tsi_end_p (si);
6900 tsi_next (&si))
6902 t = tsi_stmt (si);
6903 if (TREE_CODE (t) == DECL_EXPR
6904 && TREE_CODE (DECL_EXPR_DECL (t)) == VAR_DECL)
6905 bitmap_set_bit (has_decl_expr, DECL_UID (DECL_EXPR_DECL (t)));
6909 gimplify_and_add (OMP_FOR_PRE_BODY (for_stmt), &for_pre_body);
6910 OMP_FOR_PRE_BODY (for_stmt) = NULL_TREE;
6912 if (OMP_FOR_INIT (for_stmt) == NULL_TREE)
6914 gcc_assert (TREE_CODE (for_stmt) != OACC_LOOP);
6915 for_stmt = walk_tree (&OMP_FOR_BODY (for_stmt), find_combined_omp_for,
6916 NULL, NULL);
6917 gcc_assert (for_stmt != NULL_TREE);
6918 gimplify_omp_ctxp->combined_loop = true;
6921 for_body = NULL;
6922 gcc_assert (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt))
6923 == TREE_VEC_LENGTH (OMP_FOR_COND (for_stmt)));
6924 gcc_assert (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt))
6925 == TREE_VEC_LENGTH (OMP_FOR_INCR (for_stmt)));
6926 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
6928 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
6929 gcc_assert (TREE_CODE (t) == MODIFY_EXPR);
6930 decl = TREE_OPERAND (t, 0);
6931 gcc_assert (DECL_P (decl));
6932 gcc_assert (INTEGRAL_TYPE_P (TREE_TYPE (decl))
6933 || POINTER_TYPE_P (TREE_TYPE (decl)));
6935 /* Make sure the iteration variable is private. */
6936 tree c = NULL_TREE;
6937 tree c2 = NULL_TREE;
6938 if (orig_for_stmt != for_stmt)
6939 /* Do this only on innermost construct for combined ones. */;
6940 else if (simd)
6942 splay_tree_node n = splay_tree_lookup (gimplify_omp_ctxp->variables,
6943 (splay_tree_key)decl);
6944 omp_is_private (gimplify_omp_ctxp, decl,
6945 1 + (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt))
6946 != 1));
6947 if (n != NULL && (n->value & GOVD_DATA_SHARE_CLASS) != 0)
6948 omp_notice_variable (gimplify_omp_ctxp, decl, true);
6949 else if (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) == 1)
6951 c = build_omp_clause (input_location, OMP_CLAUSE_LINEAR);
6952 OMP_CLAUSE_LINEAR_NO_COPYIN (c) = 1;
6953 if (has_decl_expr
6954 && bitmap_bit_p (has_decl_expr, DECL_UID (decl)))
6955 OMP_CLAUSE_LINEAR_NO_COPYOUT (c) = 1;
6956 OMP_CLAUSE_DECL (c) = decl;
6957 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (for_stmt);
6958 OMP_FOR_CLAUSES (for_stmt) = c;
6959 omp_add_variable (gimplify_omp_ctxp, decl,
6960 GOVD_LINEAR | GOVD_EXPLICIT | GOVD_SEEN);
6962 else
6964 bool lastprivate
6965 = (!has_decl_expr
6966 || !bitmap_bit_p (has_decl_expr, DECL_UID (decl)));
6967 if (lastprivate
6968 && gimplify_omp_ctxp->outer_context
6969 && gimplify_omp_ctxp->outer_context->region_type
6970 == ORT_WORKSHARE
6971 && gimplify_omp_ctxp->outer_context->combined_loop
6972 && !gimplify_omp_ctxp->outer_context->distribute)
6974 struct gimplify_omp_ctx *outer
6975 = gimplify_omp_ctxp->outer_context;
6976 n = splay_tree_lookup (outer->variables,
6977 (splay_tree_key) decl);
6978 if (n != NULL
6979 && (n->value & GOVD_DATA_SHARE_CLASS) == GOVD_LOCAL)
6980 lastprivate = false;
6981 else if (omp_check_private (outer, decl, false))
6982 error ("lastprivate variable %qE is private in outer "
6983 "context", DECL_NAME (decl));
6984 else
6986 omp_add_variable (outer, decl,
6987 GOVD_LASTPRIVATE | GOVD_SEEN);
6988 if (outer->outer_context)
6989 omp_notice_variable (outer->outer_context, decl, true);
6992 c = build_omp_clause (input_location,
6993 lastprivate ? OMP_CLAUSE_LASTPRIVATE
6994 : OMP_CLAUSE_PRIVATE);
6995 OMP_CLAUSE_DECL (c) = decl;
6996 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (for_stmt);
6997 OMP_FOR_CLAUSES (for_stmt) = c;
6998 omp_add_variable (gimplify_omp_ctxp, decl,
6999 (lastprivate ? GOVD_LASTPRIVATE : GOVD_PRIVATE)
7000 | GOVD_EXPLICIT | GOVD_SEEN);
7001 c = NULL_TREE;
7004 else if (omp_is_private (gimplify_omp_ctxp, decl, 0))
7005 omp_notice_variable (gimplify_omp_ctxp, decl, true);
7006 else
7007 omp_add_variable (gimplify_omp_ctxp, decl, GOVD_PRIVATE | GOVD_SEEN);
7009 /* If DECL is not a gimple register, create a temporary variable to act
7010 as an iteration counter. This is valid, since DECL cannot be
7011 modified in the body of the loop. Similarly for any iteration vars
7012 in simd with collapse > 1 where the iterator vars must be
7013 lastprivate. */
7014 if (orig_for_stmt != for_stmt)
7015 var = decl;
7016 else if (!is_gimple_reg (decl)
7017 || (simd && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) > 1))
7019 var = create_tmp_var (TREE_TYPE (decl), get_name (decl));
7020 TREE_OPERAND (t, 0) = var;
7022 gimplify_seq_add_stmt (&for_body, gimple_build_assign (decl, var));
7024 if (simd && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) == 1)
7026 c2 = build_omp_clause (input_location, OMP_CLAUSE_LINEAR);
7027 OMP_CLAUSE_LINEAR_NO_COPYIN (c2) = 1;
7028 OMP_CLAUSE_LINEAR_NO_COPYOUT (c2) = 1;
7029 OMP_CLAUSE_DECL (c2) = var;
7030 OMP_CLAUSE_CHAIN (c2) = OMP_FOR_CLAUSES (for_stmt);
7031 OMP_FOR_CLAUSES (for_stmt) = c2;
7032 omp_add_variable (gimplify_omp_ctxp, var,
7033 GOVD_LINEAR | GOVD_EXPLICIT | GOVD_SEEN);
7034 if (c == NULL_TREE)
7036 c = c2;
7037 c2 = NULL_TREE;
7040 else
7041 omp_add_variable (gimplify_omp_ctxp, var,
7042 GOVD_PRIVATE | GOVD_SEEN);
7044 else
7045 var = decl;
7047 tret = gimplify_expr (&TREE_OPERAND (t, 1), &for_pre_body, NULL,
7048 is_gimple_val, fb_rvalue);
7049 ret = MIN (ret, tret);
7050 if (ret == GS_ERROR)
7051 return ret;
7053 /* Handle OMP_FOR_COND. */
7054 t = TREE_VEC_ELT (OMP_FOR_COND (for_stmt), i);
7055 gcc_assert (COMPARISON_CLASS_P (t));
7056 gcc_assert (TREE_OPERAND (t, 0) == decl);
7058 tret = gimplify_expr (&TREE_OPERAND (t, 1), &for_pre_body, NULL,
7059 is_gimple_val, fb_rvalue);
7060 ret = MIN (ret, tret);
7062 /* Handle OMP_FOR_INCR. */
7063 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
7064 switch (TREE_CODE (t))
7066 case PREINCREMENT_EXPR:
7067 case POSTINCREMENT_EXPR:
7069 tree decl = TREE_OPERAND (t, 0);
7070 /* c_omp_for_incr_canonicalize_ptr() should have been
7071 called to massage things appropriately. */
7072 gcc_assert (!POINTER_TYPE_P (TREE_TYPE (decl)));
7074 if (orig_for_stmt != for_stmt)
7075 break;
7076 t = build_int_cst (TREE_TYPE (decl), 1);
7077 if (c)
7078 OMP_CLAUSE_LINEAR_STEP (c) = t;
7079 t = build2 (PLUS_EXPR, TREE_TYPE (decl), var, t);
7080 t = build2 (MODIFY_EXPR, TREE_TYPE (var), var, t);
7081 TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i) = t;
7082 break;
7085 case PREDECREMENT_EXPR:
7086 case POSTDECREMENT_EXPR:
7087 /* c_omp_for_incr_canonicalize_ptr() should have been
7088 called to massage things appropriately. */
7089 gcc_assert (!POINTER_TYPE_P (TREE_TYPE (decl)));
7090 if (orig_for_stmt != for_stmt)
7091 break;
7092 t = build_int_cst (TREE_TYPE (decl), -1);
7093 if (c)
7094 OMP_CLAUSE_LINEAR_STEP (c) = t;
7095 t = build2 (PLUS_EXPR, TREE_TYPE (decl), var, t);
7096 t = build2 (MODIFY_EXPR, TREE_TYPE (var), var, t);
7097 TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i) = t;
7098 break;
7100 case MODIFY_EXPR:
7101 gcc_assert (TREE_OPERAND (t, 0) == decl);
7102 TREE_OPERAND (t, 0) = var;
7104 t = TREE_OPERAND (t, 1);
7105 switch (TREE_CODE (t))
7107 case PLUS_EXPR:
7108 if (TREE_OPERAND (t, 1) == decl)
7110 TREE_OPERAND (t, 1) = TREE_OPERAND (t, 0);
7111 TREE_OPERAND (t, 0) = var;
7112 break;
7115 /* Fallthru. */
7116 case MINUS_EXPR:
7117 case POINTER_PLUS_EXPR:
7118 gcc_assert (TREE_OPERAND (t, 0) == decl);
7119 TREE_OPERAND (t, 0) = var;
7120 break;
7121 default:
7122 gcc_unreachable ();
7125 tret = gimplify_expr (&TREE_OPERAND (t, 1), &for_pre_body, NULL,
7126 is_gimple_val, fb_rvalue);
7127 ret = MIN (ret, tret);
7128 if (c)
7130 tree step = TREE_OPERAND (t, 1);
7131 tree stept = TREE_TYPE (decl);
7132 if (POINTER_TYPE_P (stept))
7133 stept = sizetype;
7134 step = fold_convert (stept, step);
7135 if (TREE_CODE (t) == MINUS_EXPR)
7136 step = fold_build1 (NEGATE_EXPR, stept, step);
7137 OMP_CLAUSE_LINEAR_STEP (c) = step;
7138 if (step != TREE_OPERAND (t, 1))
7140 tret = gimplify_expr (&OMP_CLAUSE_LINEAR_STEP (c),
7141 &for_pre_body, NULL,
7142 is_gimple_val, fb_rvalue);
7143 ret = MIN (ret, tret);
7146 break;
7148 default:
7149 gcc_unreachable ();
7152 if (c2)
7154 gcc_assert (c);
7155 OMP_CLAUSE_LINEAR_STEP (c2) = OMP_CLAUSE_LINEAR_STEP (c);
7158 if ((var != decl || TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) > 1)
7159 && orig_for_stmt == for_stmt)
7161 for (c = OMP_FOR_CLAUSES (for_stmt); c ; c = OMP_CLAUSE_CHAIN (c))
7162 if (((OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE
7163 && OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c) == NULL)
7164 || (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
7165 && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c)
7166 && OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c) == NULL))
7167 && OMP_CLAUSE_DECL (c) == decl)
7169 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
7170 gcc_assert (TREE_CODE (t) == MODIFY_EXPR);
7171 gcc_assert (TREE_OPERAND (t, 0) == var);
7172 t = TREE_OPERAND (t, 1);
7173 gcc_assert (TREE_CODE (t) == PLUS_EXPR
7174 || TREE_CODE (t) == MINUS_EXPR
7175 || TREE_CODE (t) == POINTER_PLUS_EXPR);
7176 gcc_assert (TREE_OPERAND (t, 0) == var);
7177 t = build2 (TREE_CODE (t), TREE_TYPE (decl), decl,
7178 TREE_OPERAND (t, 1));
7179 gimple_seq *seq;
7180 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE)
7181 seq = &OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c);
7182 else
7183 seq = &OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c);
7184 gimplify_assign (decl, t, seq);
7189 BITMAP_FREE (has_decl_expr);
7191 gimplify_and_add (OMP_FOR_BODY (orig_for_stmt), &for_body);
7193 if (orig_for_stmt != for_stmt)
7194 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
7196 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
7197 decl = TREE_OPERAND (t, 0);
7198 var = create_tmp_var (TREE_TYPE (decl), get_name (decl));
7199 omp_add_variable (gimplify_omp_ctxp, var, GOVD_PRIVATE | GOVD_SEEN);
7200 TREE_OPERAND (t, 0) = var;
7201 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
7202 TREE_OPERAND (t, 1) = copy_node (TREE_OPERAND (t, 1));
7203 TREE_OPERAND (TREE_OPERAND (t, 1), 0) = var;
7206 gimplify_adjust_omp_clauses (pre_p, &OMP_FOR_CLAUSES (orig_for_stmt));
7208 int kind;
7209 switch (TREE_CODE (orig_for_stmt))
7211 case OMP_FOR: kind = GF_OMP_FOR_KIND_FOR; break;
7212 case OMP_SIMD: kind = GF_OMP_FOR_KIND_SIMD; break;
7213 case CILK_SIMD: kind = GF_OMP_FOR_KIND_CILKSIMD; break;
7214 case CILK_FOR: kind = GF_OMP_FOR_KIND_CILKFOR; break;
7215 case OMP_DISTRIBUTE: kind = GF_OMP_FOR_KIND_DISTRIBUTE; break;
7216 case OACC_LOOP: kind = GF_OMP_FOR_KIND_OACC_LOOP; break;
7217 default:
7218 gcc_unreachable ();
7220 gfor = gimple_build_omp_for (for_body, kind, OMP_FOR_CLAUSES (orig_for_stmt),
7221 TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)),
7222 for_pre_body);
7223 if (orig_for_stmt != for_stmt)
7224 gimple_omp_for_set_combined_p (gfor, true);
7225 if (gimplify_omp_ctxp
7226 && (gimplify_omp_ctxp->combined_loop
7227 || (gimplify_omp_ctxp->region_type == ORT_COMBINED_PARALLEL
7228 && gimplify_omp_ctxp->outer_context
7229 && gimplify_omp_ctxp->outer_context->combined_loop)))
7231 gimple_omp_for_set_combined_into_p (gfor, true);
7232 if (gimplify_omp_ctxp->combined_loop)
7233 gcc_assert (TREE_CODE (orig_for_stmt) == OMP_SIMD);
7234 else
7235 gcc_assert (TREE_CODE (orig_for_stmt) == OMP_FOR);
7238 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
7240 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
7241 gimple_omp_for_set_index (gfor, i, TREE_OPERAND (t, 0));
7242 gimple_omp_for_set_initial (gfor, i, TREE_OPERAND (t, 1));
7243 t = TREE_VEC_ELT (OMP_FOR_COND (for_stmt), i);
7244 gimple_omp_for_set_cond (gfor, i, TREE_CODE (t));
7245 gimple_omp_for_set_final (gfor, i, TREE_OPERAND (t, 1));
7246 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
7247 gimple_omp_for_set_incr (gfor, i, TREE_OPERAND (t, 1));
7250 gimplify_seq_add_stmt (pre_p, gfor);
7251 if (ret != GS_ALL_DONE)
7252 return GS_ERROR;
7253 *expr_p = NULL_TREE;
7254 return GS_ALL_DONE;
7257 /* Gimplify the gross structure of several OMP constructs. */
7259 static void
7260 gimplify_omp_workshare (tree *expr_p, gimple_seq *pre_p)
7262 tree expr = *expr_p;
7263 gimple stmt;
7264 gimple_seq body = NULL;
7265 enum omp_region_type ort;
7267 switch (TREE_CODE (expr))
7269 case OMP_SECTIONS:
7270 case OMP_SINGLE:
7271 ort = ORT_WORKSHARE;
7272 break;
7273 case OACC_KERNELS:
7274 case OACC_PARALLEL:
7275 case OMP_TARGET:
7276 ort = ORT_TARGET;
7277 break;
7278 case OACC_DATA:
7279 case OMP_TARGET_DATA:
7280 ort = ORT_TARGET_DATA;
7281 break;
7282 case OMP_TEAMS:
7283 ort = ORT_TEAMS;
7284 break;
7285 default:
7286 gcc_unreachable ();
7288 gimplify_scan_omp_clauses (&OMP_CLAUSES (expr), pre_p, ort);
7289 if (ort == ORT_TARGET || ort == ORT_TARGET_DATA)
7291 push_gimplify_context ();
7292 gimple g = gimplify_and_return_first (OMP_BODY (expr), &body);
7293 if (gimple_code (g) == GIMPLE_BIND)
7294 pop_gimplify_context (g);
7295 else
7296 pop_gimplify_context (NULL);
7297 if (ort == ORT_TARGET_DATA)
7299 enum built_in_function end_ix;
7300 switch (TREE_CODE (expr))
7302 case OACC_DATA:
7303 end_ix = BUILT_IN_GOACC_DATA_END;
7304 break;
7305 case OMP_TARGET_DATA:
7306 end_ix = BUILT_IN_GOMP_TARGET_END_DATA;
7307 break;
7308 default:
7309 gcc_unreachable ();
7311 tree fn = builtin_decl_explicit (end_ix);
7312 g = gimple_build_call (fn, 0);
7313 gimple_seq cleanup = NULL;
7314 gimple_seq_add_stmt (&cleanup, g);
7315 g = gimple_build_try (body, cleanup, GIMPLE_TRY_FINALLY);
7316 body = NULL;
7317 gimple_seq_add_stmt (&body, g);
7320 else
7321 gimplify_and_add (OMP_BODY (expr), &body);
7322 gimplify_adjust_omp_clauses (pre_p, &OMP_CLAUSES (expr));
7324 switch (TREE_CODE (expr))
7326 case OACC_DATA:
7327 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_DATA,
7328 OMP_CLAUSES (expr));
7329 break;
7330 case OACC_KERNELS:
7331 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_KERNELS,
7332 OMP_CLAUSES (expr));
7333 break;
7334 case OACC_PARALLEL:
7335 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_PARALLEL,
7336 OMP_CLAUSES (expr));
7337 break;
7338 case OMP_SECTIONS:
7339 stmt = gimple_build_omp_sections (body, OMP_CLAUSES (expr));
7340 break;
7341 case OMP_SINGLE:
7342 stmt = gimple_build_omp_single (body, OMP_CLAUSES (expr));
7343 break;
7344 case OMP_TARGET:
7345 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_REGION,
7346 OMP_CLAUSES (expr));
7347 break;
7348 case OMP_TARGET_DATA:
7349 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_DATA,
7350 OMP_CLAUSES (expr));
7351 break;
7352 case OMP_TEAMS:
7353 stmt = gimple_build_omp_teams (body, OMP_CLAUSES (expr));
7354 break;
7355 default:
7356 gcc_unreachable ();
7359 gimplify_seq_add_stmt (pre_p, stmt);
7360 *expr_p = NULL_TREE;
7363 /* Gimplify the gross structure of OpenACC enter/exit data, update, and OpenMP
7364 target update constructs. */
7366 static void
7367 gimplify_omp_target_update (tree *expr_p, gimple_seq *pre_p)
7369 tree expr = *expr_p, clauses;
7370 int kind;
7371 gomp_target *stmt;
7373 switch (TREE_CODE (expr))
7375 case OACC_ENTER_DATA:
7376 clauses = OACC_ENTER_DATA_CLAUSES (expr);
7377 kind = GF_OMP_TARGET_KIND_OACC_ENTER_EXIT_DATA;
7378 break;
7379 case OACC_EXIT_DATA:
7380 clauses = OACC_EXIT_DATA_CLAUSES (expr);
7381 kind = GF_OMP_TARGET_KIND_OACC_ENTER_EXIT_DATA;
7382 break;
7383 case OACC_UPDATE:
7384 clauses = OACC_UPDATE_CLAUSES (expr);
7385 kind = GF_OMP_TARGET_KIND_OACC_UPDATE;
7386 break;
7387 case OMP_TARGET_UPDATE:
7388 clauses = OMP_TARGET_UPDATE_CLAUSES (expr);
7389 kind = GF_OMP_TARGET_KIND_UPDATE;
7390 break;
7391 default:
7392 gcc_unreachable ();
7394 gimplify_scan_omp_clauses (&clauses, pre_p, ORT_WORKSHARE);
7395 gimplify_adjust_omp_clauses (pre_p, &clauses);
7396 stmt = gimple_build_omp_target (NULL, kind, clauses);
7398 gimplify_seq_add_stmt (pre_p, stmt);
7399 *expr_p = NULL_TREE;
7402 /* A subroutine of gimplify_omp_atomic. The front end is supposed to have
7403 stabilized the lhs of the atomic operation as *ADDR. Return true if
7404 EXPR is this stabilized form. */
7406 static bool
7407 goa_lhs_expr_p (tree expr, tree addr)
7409 /* Also include casts to other type variants. The C front end is fond
7410 of adding these for e.g. volatile variables. This is like
7411 STRIP_TYPE_NOPS but includes the main variant lookup. */
7412 STRIP_USELESS_TYPE_CONVERSION (expr);
7414 if (TREE_CODE (expr) == INDIRECT_REF)
7416 expr = TREE_OPERAND (expr, 0);
7417 while (expr != addr
7418 && (CONVERT_EXPR_P (expr)
7419 || TREE_CODE (expr) == NON_LVALUE_EXPR)
7420 && TREE_CODE (expr) == TREE_CODE (addr)
7421 && types_compatible_p (TREE_TYPE (expr), TREE_TYPE (addr)))
7423 expr = TREE_OPERAND (expr, 0);
7424 addr = TREE_OPERAND (addr, 0);
7426 if (expr == addr)
7427 return true;
7428 return (TREE_CODE (addr) == ADDR_EXPR
7429 && TREE_CODE (expr) == ADDR_EXPR
7430 && TREE_OPERAND (addr, 0) == TREE_OPERAND (expr, 0));
7432 if (TREE_CODE (addr) == ADDR_EXPR && expr == TREE_OPERAND (addr, 0))
7433 return true;
7434 return false;
7437 /* Walk *EXPR_P and replace appearances of *LHS_ADDR with LHS_VAR. If an
7438 expression does not involve the lhs, evaluate it into a temporary.
7439 Return 1 if the lhs appeared as a subexpression, 0 if it did not,
7440 or -1 if an error was encountered. */
7442 static int
7443 goa_stabilize_expr (tree *expr_p, gimple_seq *pre_p, tree lhs_addr,
7444 tree lhs_var)
7446 tree expr = *expr_p;
7447 int saw_lhs;
7449 if (goa_lhs_expr_p (expr, lhs_addr))
7451 *expr_p = lhs_var;
7452 return 1;
7454 if (is_gimple_val (expr))
7455 return 0;
7457 saw_lhs = 0;
7458 switch (TREE_CODE_CLASS (TREE_CODE (expr)))
7460 case tcc_binary:
7461 case tcc_comparison:
7462 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 1), pre_p, lhs_addr,
7463 lhs_var);
7464 case tcc_unary:
7465 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 0), pre_p, lhs_addr,
7466 lhs_var);
7467 break;
7468 case tcc_expression:
7469 switch (TREE_CODE (expr))
7471 case TRUTH_ANDIF_EXPR:
7472 case TRUTH_ORIF_EXPR:
7473 case TRUTH_AND_EXPR:
7474 case TRUTH_OR_EXPR:
7475 case TRUTH_XOR_EXPR:
7476 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 1), pre_p,
7477 lhs_addr, lhs_var);
7478 case TRUTH_NOT_EXPR:
7479 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 0), pre_p,
7480 lhs_addr, lhs_var);
7481 break;
7482 case COMPOUND_EXPR:
7483 /* Break out any preevaluations from cp_build_modify_expr. */
7484 for (; TREE_CODE (expr) == COMPOUND_EXPR;
7485 expr = TREE_OPERAND (expr, 1))
7486 gimplify_stmt (&TREE_OPERAND (expr, 0), pre_p);
7487 *expr_p = expr;
7488 return goa_stabilize_expr (expr_p, pre_p, lhs_addr, lhs_var);
7489 default:
7490 break;
7492 break;
7493 default:
7494 break;
7497 if (saw_lhs == 0)
7499 enum gimplify_status gs;
7500 gs = gimplify_expr (expr_p, pre_p, NULL, is_gimple_val, fb_rvalue);
7501 if (gs != GS_ALL_DONE)
7502 saw_lhs = -1;
7505 return saw_lhs;
7508 /* Gimplify an OMP_ATOMIC statement. */
7510 static enum gimplify_status
7511 gimplify_omp_atomic (tree *expr_p, gimple_seq *pre_p)
7513 tree addr = TREE_OPERAND (*expr_p, 0);
7514 tree rhs = TREE_CODE (*expr_p) == OMP_ATOMIC_READ
7515 ? NULL : TREE_OPERAND (*expr_p, 1);
7516 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (addr)));
7517 tree tmp_load;
7518 gomp_atomic_load *loadstmt;
7519 gomp_atomic_store *storestmt;
7521 tmp_load = create_tmp_reg (type);
7522 if (rhs && goa_stabilize_expr (&rhs, pre_p, addr, tmp_load) < 0)
7523 return GS_ERROR;
7525 if (gimplify_expr (&addr, pre_p, NULL, is_gimple_val, fb_rvalue)
7526 != GS_ALL_DONE)
7527 return GS_ERROR;
7529 loadstmt = gimple_build_omp_atomic_load (tmp_load, addr);
7530 gimplify_seq_add_stmt (pre_p, loadstmt);
7531 if (rhs && gimplify_expr (&rhs, pre_p, NULL, is_gimple_val, fb_rvalue)
7532 != GS_ALL_DONE)
7533 return GS_ERROR;
7535 if (TREE_CODE (*expr_p) == OMP_ATOMIC_READ)
7536 rhs = tmp_load;
7537 storestmt = gimple_build_omp_atomic_store (rhs);
7538 gimplify_seq_add_stmt (pre_p, storestmt);
7539 if (OMP_ATOMIC_SEQ_CST (*expr_p))
7541 gimple_omp_atomic_set_seq_cst (loadstmt);
7542 gimple_omp_atomic_set_seq_cst (storestmt);
7544 switch (TREE_CODE (*expr_p))
7546 case OMP_ATOMIC_READ:
7547 case OMP_ATOMIC_CAPTURE_OLD:
7548 *expr_p = tmp_load;
7549 gimple_omp_atomic_set_need_value (loadstmt);
7550 break;
7551 case OMP_ATOMIC_CAPTURE_NEW:
7552 *expr_p = rhs;
7553 gimple_omp_atomic_set_need_value (storestmt);
7554 break;
7555 default:
7556 *expr_p = NULL;
7557 break;
7560 return GS_ALL_DONE;
7563 /* Gimplify a TRANSACTION_EXPR. This involves gimplification of the
7564 body, and adding some EH bits. */
7566 static enum gimplify_status
7567 gimplify_transaction (tree *expr_p, gimple_seq *pre_p)
7569 tree expr = *expr_p, temp, tbody = TRANSACTION_EXPR_BODY (expr);
7570 gimple body_stmt;
7571 gtransaction *trans_stmt;
7572 gimple_seq body = NULL;
7573 int subcode = 0;
7575 /* Wrap the transaction body in a BIND_EXPR so we have a context
7576 where to put decls for OMP. */
7577 if (TREE_CODE (tbody) != BIND_EXPR)
7579 tree bind = build3 (BIND_EXPR, void_type_node, NULL, tbody, NULL);
7580 TREE_SIDE_EFFECTS (bind) = 1;
7581 SET_EXPR_LOCATION (bind, EXPR_LOCATION (tbody));
7582 TRANSACTION_EXPR_BODY (expr) = bind;
7585 push_gimplify_context ();
7586 temp = voidify_wrapper_expr (*expr_p, NULL);
7588 body_stmt = gimplify_and_return_first (TRANSACTION_EXPR_BODY (expr), &body);
7589 pop_gimplify_context (body_stmt);
7591 trans_stmt = gimple_build_transaction (body, NULL);
7592 if (TRANSACTION_EXPR_OUTER (expr))
7593 subcode = GTMA_IS_OUTER;
7594 else if (TRANSACTION_EXPR_RELAXED (expr))
7595 subcode = GTMA_IS_RELAXED;
7596 gimple_transaction_set_subcode (trans_stmt, subcode);
7598 gimplify_seq_add_stmt (pre_p, trans_stmt);
7600 if (temp)
7602 *expr_p = temp;
7603 return GS_OK;
7606 *expr_p = NULL_TREE;
7607 return GS_ALL_DONE;
7610 /* Convert the GENERIC expression tree *EXPR_P to GIMPLE. If the
7611 expression produces a value to be used as an operand inside a GIMPLE
7612 statement, the value will be stored back in *EXPR_P. This value will
7613 be a tree of class tcc_declaration, tcc_constant, tcc_reference or
7614 an SSA_NAME. The corresponding sequence of GIMPLE statements is
7615 emitted in PRE_P and POST_P.
7617 Additionally, this process may overwrite parts of the input
7618 expression during gimplification. Ideally, it should be
7619 possible to do non-destructive gimplification.
7621 EXPR_P points to the GENERIC expression to convert to GIMPLE. If
7622 the expression needs to evaluate to a value to be used as
7623 an operand in a GIMPLE statement, this value will be stored in
7624 *EXPR_P on exit. This happens when the caller specifies one
7625 of fb_lvalue or fb_rvalue fallback flags.
7627 PRE_P will contain the sequence of GIMPLE statements corresponding
7628 to the evaluation of EXPR and all the side-effects that must
7629 be executed before the main expression. On exit, the last
7630 statement of PRE_P is the core statement being gimplified. For
7631 instance, when gimplifying 'if (++a)' the last statement in
7632 PRE_P will be 'if (t.1)' where t.1 is the result of
7633 pre-incrementing 'a'.
7635 POST_P will contain the sequence of GIMPLE statements corresponding
7636 to the evaluation of all the side-effects that must be executed
7637 after the main expression. If this is NULL, the post
7638 side-effects are stored at the end of PRE_P.
7640 The reason why the output is split in two is to handle post
7641 side-effects explicitly. In some cases, an expression may have
7642 inner and outer post side-effects which need to be emitted in
7643 an order different from the one given by the recursive
7644 traversal. For instance, for the expression (*p--)++ the post
7645 side-effects of '--' must actually occur *after* the post
7646 side-effects of '++'. However, gimplification will first visit
7647 the inner expression, so if a separate POST sequence was not
7648 used, the resulting sequence would be:
7650 1 t.1 = *p
7651 2 p = p - 1
7652 3 t.2 = t.1 + 1
7653 4 *p = t.2
7655 However, the post-decrement operation in line #2 must not be
7656 evaluated until after the store to *p at line #4, so the
7657 correct sequence should be:
7659 1 t.1 = *p
7660 2 t.2 = t.1 + 1
7661 3 *p = t.2
7662 4 p = p - 1
7664 So, by specifying a separate post queue, it is possible
7665 to emit the post side-effects in the correct order.
7666 If POST_P is NULL, an internal queue will be used. Before
7667 returning to the caller, the sequence POST_P is appended to
7668 the main output sequence PRE_P.
7670 GIMPLE_TEST_F points to a function that takes a tree T and
7671 returns nonzero if T is in the GIMPLE form requested by the
7672 caller. The GIMPLE predicates are in gimple.c.
7674 FALLBACK tells the function what sort of a temporary we want if
7675 gimplification cannot produce an expression that complies with
7676 GIMPLE_TEST_F.
7678 fb_none means that no temporary should be generated
7679 fb_rvalue means that an rvalue is OK to generate
7680 fb_lvalue means that an lvalue is OK to generate
7681 fb_either means that either is OK, but an lvalue is preferable.
7682 fb_mayfail means that gimplification may fail (in which case
7683 GS_ERROR will be returned)
7685 The return value is either GS_ERROR or GS_ALL_DONE, since this
7686 function iterates until EXPR is completely gimplified or an error
7687 occurs. */
7689 enum gimplify_status
7690 gimplify_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
7691 bool (*gimple_test_f) (tree), fallback_t fallback)
7693 tree tmp;
7694 gimple_seq internal_pre = NULL;
7695 gimple_seq internal_post = NULL;
7696 tree save_expr;
7697 bool is_statement;
7698 location_t saved_location;
7699 enum gimplify_status ret;
7700 gimple_stmt_iterator pre_last_gsi, post_last_gsi;
7702 save_expr = *expr_p;
7703 if (save_expr == NULL_TREE)
7704 return GS_ALL_DONE;
7706 /* If we are gimplifying a top-level statement, PRE_P must be valid. */
7707 is_statement = gimple_test_f == is_gimple_stmt;
7708 if (is_statement)
7709 gcc_assert (pre_p);
7711 /* Consistency checks. */
7712 if (gimple_test_f == is_gimple_reg)
7713 gcc_assert (fallback & (fb_rvalue | fb_lvalue));
7714 else if (gimple_test_f == is_gimple_val
7715 || gimple_test_f == is_gimple_call_addr
7716 || gimple_test_f == is_gimple_condexpr
7717 || gimple_test_f == is_gimple_mem_rhs
7718 || gimple_test_f == is_gimple_mem_rhs_or_call
7719 || gimple_test_f == is_gimple_reg_rhs
7720 || gimple_test_f == is_gimple_reg_rhs_or_call
7721 || gimple_test_f == is_gimple_asm_val
7722 || gimple_test_f == is_gimple_mem_ref_addr)
7723 gcc_assert (fallback & fb_rvalue);
7724 else if (gimple_test_f == is_gimple_min_lval
7725 || gimple_test_f == is_gimple_lvalue)
7726 gcc_assert (fallback & fb_lvalue);
7727 else if (gimple_test_f == is_gimple_addressable)
7728 gcc_assert (fallback & fb_either);
7729 else if (gimple_test_f == is_gimple_stmt)
7730 gcc_assert (fallback == fb_none);
7731 else
7733 /* We should have recognized the GIMPLE_TEST_F predicate to
7734 know what kind of fallback to use in case a temporary is
7735 needed to hold the value or address of *EXPR_P. */
7736 gcc_unreachable ();
7739 /* We used to check the predicate here and return immediately if it
7740 succeeds. This is wrong; the design is for gimplification to be
7741 idempotent, and for the predicates to only test for valid forms, not
7742 whether they are fully simplified. */
7743 if (pre_p == NULL)
7744 pre_p = &internal_pre;
7746 if (post_p == NULL)
7747 post_p = &internal_post;
7749 /* Remember the last statements added to PRE_P and POST_P. Every
7750 new statement added by the gimplification helpers needs to be
7751 annotated with location information. To centralize the
7752 responsibility, we remember the last statement that had been
7753 added to both queues before gimplifying *EXPR_P. If
7754 gimplification produces new statements in PRE_P and POST_P, those
7755 statements will be annotated with the same location information
7756 as *EXPR_P. */
7757 pre_last_gsi = gsi_last (*pre_p);
7758 post_last_gsi = gsi_last (*post_p);
7760 saved_location = input_location;
7761 if (save_expr != error_mark_node
7762 && EXPR_HAS_LOCATION (*expr_p))
7763 input_location = EXPR_LOCATION (*expr_p);
7765 /* Loop over the specific gimplifiers until the toplevel node
7766 remains the same. */
7769 /* Strip away as many useless type conversions as possible
7770 at the toplevel. */
7771 STRIP_USELESS_TYPE_CONVERSION (*expr_p);
7773 /* Remember the expr. */
7774 save_expr = *expr_p;
7776 /* Die, die, die, my darling. */
7777 if (save_expr == error_mark_node
7778 || (TREE_TYPE (save_expr)
7779 && TREE_TYPE (save_expr) == error_mark_node))
7781 ret = GS_ERROR;
7782 break;
7785 /* Do any language-specific gimplification. */
7786 ret = ((enum gimplify_status)
7787 lang_hooks.gimplify_expr (expr_p, pre_p, post_p));
7788 if (ret == GS_OK)
7790 if (*expr_p == NULL_TREE)
7791 break;
7792 if (*expr_p != save_expr)
7793 continue;
7795 else if (ret != GS_UNHANDLED)
7796 break;
7798 /* Make sure that all the cases set 'ret' appropriately. */
7799 ret = GS_UNHANDLED;
7800 switch (TREE_CODE (*expr_p))
7802 /* First deal with the special cases. */
7804 case POSTINCREMENT_EXPR:
7805 case POSTDECREMENT_EXPR:
7806 case PREINCREMENT_EXPR:
7807 case PREDECREMENT_EXPR:
7808 ret = gimplify_self_mod_expr (expr_p, pre_p, post_p,
7809 fallback != fb_none,
7810 TREE_TYPE (*expr_p));
7811 break;
7813 case VIEW_CONVERT_EXPR:
7814 if (is_gimple_reg_type (TREE_TYPE (*expr_p))
7815 && is_gimple_reg_type (TREE_TYPE (TREE_OPERAND (*expr_p, 0))))
7817 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
7818 post_p, is_gimple_val, fb_rvalue);
7819 recalculate_side_effects (*expr_p);
7820 break;
7822 /* Fallthru. */
7824 case ARRAY_REF:
7825 case ARRAY_RANGE_REF:
7826 case REALPART_EXPR:
7827 case IMAGPART_EXPR:
7828 case COMPONENT_REF:
7829 ret = gimplify_compound_lval (expr_p, pre_p, post_p,
7830 fallback ? fallback : fb_rvalue);
7831 break;
7833 case COND_EXPR:
7834 ret = gimplify_cond_expr (expr_p, pre_p, fallback);
7836 /* C99 code may assign to an array in a structure value of a
7837 conditional expression, and this has undefined behavior
7838 only on execution, so create a temporary if an lvalue is
7839 required. */
7840 if (fallback == fb_lvalue)
7842 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
7843 mark_addressable (*expr_p);
7844 ret = GS_OK;
7846 break;
7848 case CALL_EXPR:
7849 ret = gimplify_call_expr (expr_p, pre_p, fallback != fb_none);
7851 /* C99 code may assign to an array in a structure returned
7852 from a function, and this has undefined behavior only on
7853 execution, so create a temporary if an lvalue is
7854 required. */
7855 if (fallback == fb_lvalue)
7857 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
7858 mark_addressable (*expr_p);
7859 ret = GS_OK;
7861 break;
7863 case TREE_LIST:
7864 gcc_unreachable ();
7866 case COMPOUND_EXPR:
7867 ret = gimplify_compound_expr (expr_p, pre_p, fallback != fb_none);
7868 break;
7870 case COMPOUND_LITERAL_EXPR:
7871 ret = gimplify_compound_literal_expr (expr_p, pre_p,
7872 gimple_test_f, fallback);
7873 break;
7875 case MODIFY_EXPR:
7876 case INIT_EXPR:
7877 ret = gimplify_modify_expr (expr_p, pre_p, post_p,
7878 fallback != fb_none);
7879 break;
7881 case TRUTH_ANDIF_EXPR:
7882 case TRUTH_ORIF_EXPR:
7884 /* Preserve the original type of the expression and the
7885 source location of the outer expression. */
7886 tree org_type = TREE_TYPE (*expr_p);
7887 *expr_p = gimple_boolify (*expr_p);
7888 *expr_p = build3_loc (input_location, COND_EXPR,
7889 org_type, *expr_p,
7890 fold_convert_loc
7891 (input_location,
7892 org_type, boolean_true_node),
7893 fold_convert_loc
7894 (input_location,
7895 org_type, boolean_false_node));
7896 ret = GS_OK;
7897 break;
7900 case TRUTH_NOT_EXPR:
7902 tree type = TREE_TYPE (*expr_p);
7903 /* The parsers are careful to generate TRUTH_NOT_EXPR
7904 only with operands that are always zero or one.
7905 We do not fold here but handle the only interesting case
7906 manually, as fold may re-introduce the TRUTH_NOT_EXPR. */
7907 *expr_p = gimple_boolify (*expr_p);
7908 if (TYPE_PRECISION (TREE_TYPE (*expr_p)) == 1)
7909 *expr_p = build1_loc (input_location, BIT_NOT_EXPR,
7910 TREE_TYPE (*expr_p),
7911 TREE_OPERAND (*expr_p, 0));
7912 else
7913 *expr_p = build2_loc (input_location, BIT_XOR_EXPR,
7914 TREE_TYPE (*expr_p),
7915 TREE_OPERAND (*expr_p, 0),
7916 build_int_cst (TREE_TYPE (*expr_p), 1));
7917 if (!useless_type_conversion_p (type, TREE_TYPE (*expr_p)))
7918 *expr_p = fold_convert_loc (input_location, type, *expr_p);
7919 ret = GS_OK;
7920 break;
7923 case ADDR_EXPR:
7924 ret = gimplify_addr_expr (expr_p, pre_p, post_p);
7925 break;
7927 case ANNOTATE_EXPR:
7929 tree cond = TREE_OPERAND (*expr_p, 0);
7930 tree kind = TREE_OPERAND (*expr_p, 1);
7931 tree type = TREE_TYPE (cond);
7932 if (!INTEGRAL_TYPE_P (type))
7934 *expr_p = cond;
7935 ret = GS_OK;
7936 break;
7938 tree tmp = create_tmp_var (type);
7939 gimplify_arg (&cond, pre_p, EXPR_LOCATION (*expr_p));
7940 gcall *call
7941 = gimple_build_call_internal (IFN_ANNOTATE, 2, cond, kind);
7942 gimple_call_set_lhs (call, tmp);
7943 gimplify_seq_add_stmt (pre_p, call);
7944 *expr_p = tmp;
7945 ret = GS_ALL_DONE;
7946 break;
7949 case VA_ARG_EXPR:
7950 ret = gimplify_va_arg_expr (expr_p, pre_p, post_p);
7951 break;
7953 CASE_CONVERT:
7954 if (IS_EMPTY_STMT (*expr_p))
7956 ret = GS_ALL_DONE;
7957 break;
7960 if (VOID_TYPE_P (TREE_TYPE (*expr_p))
7961 || fallback == fb_none)
7963 /* Just strip a conversion to void (or in void context) and
7964 try again. */
7965 *expr_p = TREE_OPERAND (*expr_p, 0);
7966 ret = GS_OK;
7967 break;
7970 ret = gimplify_conversion (expr_p);
7971 if (ret == GS_ERROR)
7972 break;
7973 if (*expr_p != save_expr)
7974 break;
7975 /* FALLTHRU */
7977 case FIX_TRUNC_EXPR:
7978 /* unary_expr: ... | '(' cast ')' val | ... */
7979 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
7980 is_gimple_val, fb_rvalue);
7981 recalculate_side_effects (*expr_p);
7982 break;
7984 case INDIRECT_REF:
7986 bool volatilep = TREE_THIS_VOLATILE (*expr_p);
7987 bool notrap = TREE_THIS_NOTRAP (*expr_p);
7988 tree saved_ptr_type = TREE_TYPE (TREE_OPERAND (*expr_p, 0));
7990 *expr_p = fold_indirect_ref_loc (input_location, *expr_p);
7991 if (*expr_p != save_expr)
7993 ret = GS_OK;
7994 break;
7997 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
7998 is_gimple_reg, fb_rvalue);
7999 if (ret == GS_ERROR)
8000 break;
8002 recalculate_side_effects (*expr_p);
8003 *expr_p = fold_build2_loc (input_location, MEM_REF,
8004 TREE_TYPE (*expr_p),
8005 TREE_OPERAND (*expr_p, 0),
8006 build_int_cst (saved_ptr_type, 0));
8007 TREE_THIS_VOLATILE (*expr_p) = volatilep;
8008 TREE_THIS_NOTRAP (*expr_p) = notrap;
8009 ret = GS_OK;
8010 break;
8013 /* We arrive here through the various re-gimplifcation paths. */
8014 case MEM_REF:
8015 /* First try re-folding the whole thing. */
8016 tmp = fold_binary (MEM_REF, TREE_TYPE (*expr_p),
8017 TREE_OPERAND (*expr_p, 0),
8018 TREE_OPERAND (*expr_p, 1));
8019 if (tmp)
8021 *expr_p = tmp;
8022 recalculate_side_effects (*expr_p);
8023 ret = GS_OK;
8024 break;
8026 /* Avoid re-gimplifying the address operand if it is already
8027 in suitable form. Re-gimplifying would mark the address
8028 operand addressable. Always gimplify when not in SSA form
8029 as we still may have to gimplify decls with value-exprs. */
8030 if (!gimplify_ctxp || !gimplify_ctxp->into_ssa
8031 || !is_gimple_mem_ref_addr (TREE_OPERAND (*expr_p, 0)))
8033 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
8034 is_gimple_mem_ref_addr, fb_rvalue);
8035 if (ret == GS_ERROR)
8036 break;
8038 recalculate_side_effects (*expr_p);
8039 ret = GS_ALL_DONE;
8040 break;
8042 /* Constants need not be gimplified. */
8043 case INTEGER_CST:
8044 case REAL_CST:
8045 case FIXED_CST:
8046 case STRING_CST:
8047 case COMPLEX_CST:
8048 case VECTOR_CST:
8049 /* Drop the overflow flag on constants, we do not want
8050 that in the GIMPLE IL. */
8051 if (TREE_OVERFLOW_P (*expr_p))
8052 *expr_p = drop_tree_overflow (*expr_p);
8053 ret = GS_ALL_DONE;
8054 break;
8056 case CONST_DECL:
8057 /* If we require an lvalue, such as for ADDR_EXPR, retain the
8058 CONST_DECL node. Otherwise the decl is replaceable by its
8059 value. */
8060 /* ??? Should be == fb_lvalue, but ADDR_EXPR passes fb_either. */
8061 if (fallback & fb_lvalue)
8062 ret = GS_ALL_DONE;
8063 else
8065 *expr_p = DECL_INITIAL (*expr_p);
8066 ret = GS_OK;
8068 break;
8070 case DECL_EXPR:
8071 ret = gimplify_decl_expr (expr_p, pre_p);
8072 break;
8074 case BIND_EXPR:
8075 ret = gimplify_bind_expr (expr_p, pre_p);
8076 break;
8078 case LOOP_EXPR:
8079 ret = gimplify_loop_expr (expr_p, pre_p);
8080 break;
8082 case SWITCH_EXPR:
8083 ret = gimplify_switch_expr (expr_p, pre_p);
8084 break;
8086 case EXIT_EXPR:
8087 ret = gimplify_exit_expr (expr_p);
8088 break;
8090 case GOTO_EXPR:
8091 /* If the target is not LABEL, then it is a computed jump
8092 and the target needs to be gimplified. */
8093 if (TREE_CODE (GOTO_DESTINATION (*expr_p)) != LABEL_DECL)
8095 ret = gimplify_expr (&GOTO_DESTINATION (*expr_p), pre_p,
8096 NULL, is_gimple_val, fb_rvalue);
8097 if (ret == GS_ERROR)
8098 break;
8100 gimplify_seq_add_stmt (pre_p,
8101 gimple_build_goto (GOTO_DESTINATION (*expr_p)));
8102 ret = GS_ALL_DONE;
8103 break;
8105 case PREDICT_EXPR:
8106 gimplify_seq_add_stmt (pre_p,
8107 gimple_build_predict (PREDICT_EXPR_PREDICTOR (*expr_p),
8108 PREDICT_EXPR_OUTCOME (*expr_p)));
8109 ret = GS_ALL_DONE;
8110 break;
8112 case LABEL_EXPR:
8113 ret = GS_ALL_DONE;
8114 gcc_assert (decl_function_context (LABEL_EXPR_LABEL (*expr_p))
8115 == current_function_decl);
8116 gimplify_seq_add_stmt (pre_p,
8117 gimple_build_label (LABEL_EXPR_LABEL (*expr_p)));
8118 break;
8120 case CASE_LABEL_EXPR:
8121 ret = gimplify_case_label_expr (expr_p, pre_p);
8122 break;
8124 case RETURN_EXPR:
8125 ret = gimplify_return_expr (*expr_p, pre_p);
8126 break;
8128 case CONSTRUCTOR:
8129 /* Don't reduce this in place; let gimplify_init_constructor work its
8130 magic. Buf if we're just elaborating this for side effects, just
8131 gimplify any element that has side-effects. */
8132 if (fallback == fb_none)
8134 unsigned HOST_WIDE_INT ix;
8135 tree val;
8136 tree temp = NULL_TREE;
8137 FOR_EACH_CONSTRUCTOR_VALUE (CONSTRUCTOR_ELTS (*expr_p), ix, val)
8138 if (TREE_SIDE_EFFECTS (val))
8139 append_to_statement_list (val, &temp);
8141 *expr_p = temp;
8142 ret = temp ? GS_OK : GS_ALL_DONE;
8144 /* C99 code may assign to an array in a constructed
8145 structure or union, and this has undefined behavior only
8146 on execution, so create a temporary if an lvalue is
8147 required. */
8148 else if (fallback == fb_lvalue)
8150 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
8151 mark_addressable (*expr_p);
8152 ret = GS_OK;
8154 else
8155 ret = GS_ALL_DONE;
8156 break;
8158 /* The following are special cases that are not handled by the
8159 original GIMPLE grammar. */
8161 /* SAVE_EXPR nodes are converted into a GIMPLE identifier and
8162 eliminated. */
8163 case SAVE_EXPR:
8164 ret = gimplify_save_expr (expr_p, pre_p, post_p);
8165 break;
8167 case BIT_FIELD_REF:
8168 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
8169 post_p, is_gimple_lvalue, fb_either);
8170 recalculate_side_effects (*expr_p);
8171 break;
8173 case TARGET_MEM_REF:
8175 enum gimplify_status r0 = GS_ALL_DONE, r1 = GS_ALL_DONE;
8177 if (TMR_BASE (*expr_p))
8178 r0 = gimplify_expr (&TMR_BASE (*expr_p), pre_p,
8179 post_p, is_gimple_mem_ref_addr, fb_either);
8180 if (TMR_INDEX (*expr_p))
8181 r1 = gimplify_expr (&TMR_INDEX (*expr_p), pre_p,
8182 post_p, is_gimple_val, fb_rvalue);
8183 if (TMR_INDEX2 (*expr_p))
8184 r1 = gimplify_expr (&TMR_INDEX2 (*expr_p), pre_p,
8185 post_p, is_gimple_val, fb_rvalue);
8186 /* TMR_STEP and TMR_OFFSET are always integer constants. */
8187 ret = MIN (r0, r1);
8189 break;
8191 case NON_LVALUE_EXPR:
8192 /* This should have been stripped above. */
8193 gcc_unreachable ();
8195 case ASM_EXPR:
8196 ret = gimplify_asm_expr (expr_p, pre_p, post_p);
8197 break;
8199 case TRY_FINALLY_EXPR:
8200 case TRY_CATCH_EXPR:
8202 gimple_seq eval, cleanup;
8203 gtry *try_;
8205 /* Calls to destructors are generated automatically in FINALLY/CATCH
8206 block. They should have location as UNKNOWN_LOCATION. However,
8207 gimplify_call_expr will reset these call stmts to input_location
8208 if it finds stmt's location is unknown. To prevent resetting for
8209 destructors, we set the input_location to unknown.
8210 Note that this only affects the destructor calls in FINALLY/CATCH
8211 block, and will automatically reset to its original value by the
8212 end of gimplify_expr. */
8213 input_location = UNKNOWN_LOCATION;
8214 eval = cleanup = NULL;
8215 gimplify_and_add (TREE_OPERAND (*expr_p, 0), &eval);
8216 gimplify_and_add (TREE_OPERAND (*expr_p, 1), &cleanup);
8217 /* Don't create bogus GIMPLE_TRY with empty cleanup. */
8218 if (gimple_seq_empty_p (cleanup))
8220 gimple_seq_add_seq (pre_p, eval);
8221 ret = GS_ALL_DONE;
8222 break;
8224 try_ = gimple_build_try (eval, cleanup,
8225 TREE_CODE (*expr_p) == TRY_FINALLY_EXPR
8226 ? GIMPLE_TRY_FINALLY
8227 : GIMPLE_TRY_CATCH);
8228 if (LOCATION_LOCUS (saved_location) != UNKNOWN_LOCATION)
8229 gimple_set_location (try_, saved_location);
8230 else
8231 gimple_set_location (try_, EXPR_LOCATION (save_expr));
8232 if (TREE_CODE (*expr_p) == TRY_CATCH_EXPR)
8233 gimple_try_set_catch_is_cleanup (try_,
8234 TRY_CATCH_IS_CLEANUP (*expr_p));
8235 gimplify_seq_add_stmt (pre_p, try_);
8236 ret = GS_ALL_DONE;
8237 break;
8240 case CLEANUP_POINT_EXPR:
8241 ret = gimplify_cleanup_point_expr (expr_p, pre_p);
8242 break;
8244 case TARGET_EXPR:
8245 ret = gimplify_target_expr (expr_p, pre_p, post_p);
8246 break;
8248 case CATCH_EXPR:
8250 gimple c;
8251 gimple_seq handler = NULL;
8252 gimplify_and_add (CATCH_BODY (*expr_p), &handler);
8253 c = gimple_build_catch (CATCH_TYPES (*expr_p), handler);
8254 gimplify_seq_add_stmt (pre_p, c);
8255 ret = GS_ALL_DONE;
8256 break;
8259 case EH_FILTER_EXPR:
8261 gimple ehf;
8262 gimple_seq failure = NULL;
8264 gimplify_and_add (EH_FILTER_FAILURE (*expr_p), &failure);
8265 ehf = gimple_build_eh_filter (EH_FILTER_TYPES (*expr_p), failure);
8266 gimple_set_no_warning (ehf, TREE_NO_WARNING (*expr_p));
8267 gimplify_seq_add_stmt (pre_p, ehf);
8268 ret = GS_ALL_DONE;
8269 break;
8272 case OBJ_TYPE_REF:
8274 enum gimplify_status r0, r1;
8275 r0 = gimplify_expr (&OBJ_TYPE_REF_OBJECT (*expr_p), pre_p,
8276 post_p, is_gimple_val, fb_rvalue);
8277 r1 = gimplify_expr (&OBJ_TYPE_REF_EXPR (*expr_p), pre_p,
8278 post_p, is_gimple_val, fb_rvalue);
8279 TREE_SIDE_EFFECTS (*expr_p) = 0;
8280 ret = MIN (r0, r1);
8282 break;
8284 case LABEL_DECL:
8285 /* We get here when taking the address of a label. We mark
8286 the label as "forced"; meaning it can never be removed and
8287 it is a potential target for any computed goto. */
8288 FORCED_LABEL (*expr_p) = 1;
8289 ret = GS_ALL_DONE;
8290 break;
8292 case STATEMENT_LIST:
8293 ret = gimplify_statement_list (expr_p, pre_p);
8294 break;
8296 case WITH_SIZE_EXPR:
8298 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
8299 post_p == &internal_post ? NULL : post_p,
8300 gimple_test_f, fallback);
8301 gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
8302 is_gimple_val, fb_rvalue);
8303 ret = GS_ALL_DONE;
8305 break;
8307 case VAR_DECL:
8308 case PARM_DECL:
8309 ret = gimplify_var_or_parm_decl (expr_p);
8310 break;
8312 case RESULT_DECL:
8313 /* When within an OMP context, notice uses of variables. */
8314 if (gimplify_omp_ctxp)
8315 omp_notice_variable (gimplify_omp_ctxp, *expr_p, true);
8316 ret = GS_ALL_DONE;
8317 break;
8319 case SSA_NAME:
8320 /* Allow callbacks into the gimplifier during optimization. */
8321 ret = GS_ALL_DONE;
8322 break;
8324 case OMP_PARALLEL:
8325 gimplify_omp_parallel (expr_p, pre_p);
8326 ret = GS_ALL_DONE;
8327 break;
8329 case OMP_TASK:
8330 gimplify_omp_task (expr_p, pre_p);
8331 ret = GS_ALL_DONE;
8332 break;
8334 case OMP_FOR:
8335 case OMP_SIMD:
8336 case CILK_SIMD:
8337 case CILK_FOR:
8338 case OMP_DISTRIBUTE:
8339 case OACC_LOOP:
8340 ret = gimplify_omp_for (expr_p, pre_p);
8341 break;
8343 case OACC_CACHE:
8344 gimplify_oacc_cache (expr_p, pre_p);
8345 ret = GS_ALL_DONE;
8346 break;
8348 case OACC_HOST_DATA:
8349 case OACC_DECLARE:
8350 sorry ("directive not yet implemented");
8351 ret = GS_ALL_DONE;
8352 break;
8354 case OACC_KERNELS:
8355 if (OACC_KERNELS_COMBINED (*expr_p))
8356 sorry ("directive not yet implemented");
8357 else
8358 gimplify_omp_workshare (expr_p, pre_p);
8359 ret = GS_ALL_DONE;
8360 break;
8362 case OACC_PARALLEL:
8363 if (OACC_PARALLEL_COMBINED (*expr_p))
8364 sorry ("directive not yet implemented");
8365 else
8366 gimplify_omp_workshare (expr_p, pre_p);
8367 ret = GS_ALL_DONE;
8368 break;
8370 case OACC_DATA:
8371 case OMP_SECTIONS:
8372 case OMP_SINGLE:
8373 case OMP_TARGET:
8374 case OMP_TARGET_DATA:
8375 case OMP_TEAMS:
8376 gimplify_omp_workshare (expr_p, pre_p);
8377 ret = GS_ALL_DONE;
8378 break;
8380 case OACC_ENTER_DATA:
8381 case OACC_EXIT_DATA:
8382 case OACC_UPDATE:
8383 case OMP_TARGET_UPDATE:
8384 gimplify_omp_target_update (expr_p, pre_p);
8385 ret = GS_ALL_DONE;
8386 break;
8388 case OMP_SECTION:
8389 case OMP_MASTER:
8390 case OMP_TASKGROUP:
8391 case OMP_ORDERED:
8392 case OMP_CRITICAL:
8394 gimple_seq body = NULL;
8395 gimple g;
8397 gimplify_and_add (OMP_BODY (*expr_p), &body);
8398 switch (TREE_CODE (*expr_p))
8400 case OMP_SECTION:
8401 g = gimple_build_omp_section (body);
8402 break;
8403 case OMP_MASTER:
8404 g = gimple_build_omp_master (body);
8405 break;
8406 case OMP_TASKGROUP:
8408 gimple_seq cleanup = NULL;
8409 tree fn
8410 = builtin_decl_explicit (BUILT_IN_GOMP_TASKGROUP_END);
8411 g = gimple_build_call (fn, 0);
8412 gimple_seq_add_stmt (&cleanup, g);
8413 g = gimple_build_try (body, cleanup, GIMPLE_TRY_FINALLY);
8414 body = NULL;
8415 gimple_seq_add_stmt (&body, g);
8416 g = gimple_build_omp_taskgroup (body);
8418 break;
8419 case OMP_ORDERED:
8420 g = gimple_build_omp_ordered (body);
8421 break;
8422 case OMP_CRITICAL:
8423 g = gimple_build_omp_critical (body,
8424 OMP_CRITICAL_NAME (*expr_p));
8425 break;
8426 default:
8427 gcc_unreachable ();
8429 gimplify_seq_add_stmt (pre_p, g);
8430 ret = GS_ALL_DONE;
8431 break;
8434 case OMP_ATOMIC:
8435 case OMP_ATOMIC_READ:
8436 case OMP_ATOMIC_CAPTURE_OLD:
8437 case OMP_ATOMIC_CAPTURE_NEW:
8438 ret = gimplify_omp_atomic (expr_p, pre_p);
8439 break;
8441 case TRANSACTION_EXPR:
8442 ret = gimplify_transaction (expr_p, pre_p);
8443 break;
8445 case TRUTH_AND_EXPR:
8446 case TRUTH_OR_EXPR:
8447 case TRUTH_XOR_EXPR:
8449 tree orig_type = TREE_TYPE (*expr_p);
8450 tree new_type, xop0, xop1;
8451 *expr_p = gimple_boolify (*expr_p);
8452 new_type = TREE_TYPE (*expr_p);
8453 if (!useless_type_conversion_p (orig_type, new_type))
8455 *expr_p = fold_convert_loc (input_location, orig_type, *expr_p);
8456 ret = GS_OK;
8457 break;
8460 /* Boolified binary truth expressions are semantically equivalent
8461 to bitwise binary expressions. Canonicalize them to the
8462 bitwise variant. */
8463 switch (TREE_CODE (*expr_p))
8465 case TRUTH_AND_EXPR:
8466 TREE_SET_CODE (*expr_p, BIT_AND_EXPR);
8467 break;
8468 case TRUTH_OR_EXPR:
8469 TREE_SET_CODE (*expr_p, BIT_IOR_EXPR);
8470 break;
8471 case TRUTH_XOR_EXPR:
8472 TREE_SET_CODE (*expr_p, BIT_XOR_EXPR);
8473 break;
8474 default:
8475 break;
8477 /* Now make sure that operands have compatible type to
8478 expression's new_type. */
8479 xop0 = TREE_OPERAND (*expr_p, 0);
8480 xop1 = TREE_OPERAND (*expr_p, 1);
8481 if (!useless_type_conversion_p (new_type, TREE_TYPE (xop0)))
8482 TREE_OPERAND (*expr_p, 0) = fold_convert_loc (input_location,
8483 new_type,
8484 xop0);
8485 if (!useless_type_conversion_p (new_type, TREE_TYPE (xop1)))
8486 TREE_OPERAND (*expr_p, 1) = fold_convert_loc (input_location,
8487 new_type,
8488 xop1);
8489 /* Continue classified as tcc_binary. */
8490 goto expr_2;
8493 case FMA_EXPR:
8494 case VEC_COND_EXPR:
8495 case VEC_PERM_EXPR:
8496 /* Classified as tcc_expression. */
8497 goto expr_3;
8499 case POINTER_PLUS_EXPR:
8501 enum gimplify_status r0, r1;
8502 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
8503 post_p, is_gimple_val, fb_rvalue);
8504 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
8505 post_p, is_gimple_val, fb_rvalue);
8506 recalculate_side_effects (*expr_p);
8507 ret = MIN (r0, r1);
8508 /* Convert &X + CST to invariant &MEM[&X, CST]. Do this
8509 after gimplifying operands - this is similar to how
8510 it would be folding all gimplified stmts on creation
8511 to have them canonicalized, which is what we eventually
8512 should do anyway. */
8513 if (TREE_CODE (TREE_OPERAND (*expr_p, 1)) == INTEGER_CST
8514 && is_gimple_min_invariant (TREE_OPERAND (*expr_p, 0)))
8516 *expr_p = build_fold_addr_expr_with_type_loc
8517 (input_location,
8518 fold_build2 (MEM_REF, TREE_TYPE (TREE_TYPE (*expr_p)),
8519 TREE_OPERAND (*expr_p, 0),
8520 fold_convert (ptr_type_node,
8521 TREE_OPERAND (*expr_p, 1))),
8522 TREE_TYPE (*expr_p));
8523 ret = MIN (ret, GS_OK);
8525 break;
8528 case CILK_SYNC_STMT:
8530 if (!fn_contains_cilk_spawn_p (cfun))
8532 error_at (EXPR_LOCATION (*expr_p),
8533 "expected %<_Cilk_spawn%> before %<_Cilk_sync%>");
8534 ret = GS_ERROR;
8536 else
8538 gimplify_cilk_sync (expr_p, pre_p);
8539 ret = GS_ALL_DONE;
8541 break;
8544 default:
8545 switch (TREE_CODE_CLASS (TREE_CODE (*expr_p)))
8547 case tcc_comparison:
8548 /* Handle comparison of objects of non scalar mode aggregates
8549 with a call to memcmp. It would be nice to only have to do
8550 this for variable-sized objects, but then we'd have to allow
8551 the same nest of reference nodes we allow for MODIFY_EXPR and
8552 that's too complex.
8554 Compare scalar mode aggregates as scalar mode values. Using
8555 memcmp for them would be very inefficient at best, and is
8556 plain wrong if bitfields are involved. */
8558 tree type = TREE_TYPE (TREE_OPERAND (*expr_p, 1));
8560 /* Vector comparisons need no boolification. */
8561 if (TREE_CODE (type) == VECTOR_TYPE)
8562 goto expr_2;
8563 else if (!AGGREGATE_TYPE_P (type))
8565 tree org_type = TREE_TYPE (*expr_p);
8566 *expr_p = gimple_boolify (*expr_p);
8567 if (!useless_type_conversion_p (org_type,
8568 TREE_TYPE (*expr_p)))
8570 *expr_p = fold_convert_loc (input_location,
8571 org_type, *expr_p);
8572 ret = GS_OK;
8574 else
8575 goto expr_2;
8577 else if (TYPE_MODE (type) != BLKmode)
8578 ret = gimplify_scalar_mode_aggregate_compare (expr_p);
8579 else
8580 ret = gimplify_variable_sized_compare (expr_p);
8582 break;
8585 /* If *EXPR_P does not need to be special-cased, handle it
8586 according to its class. */
8587 case tcc_unary:
8588 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
8589 post_p, is_gimple_val, fb_rvalue);
8590 break;
8592 case tcc_binary:
8593 expr_2:
8595 enum gimplify_status r0, r1;
8597 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
8598 post_p, is_gimple_val, fb_rvalue);
8599 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
8600 post_p, is_gimple_val, fb_rvalue);
8602 ret = MIN (r0, r1);
8603 break;
8606 expr_3:
8608 enum gimplify_status r0, r1, r2;
8610 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
8611 post_p, is_gimple_val, fb_rvalue);
8612 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
8613 post_p, is_gimple_val, fb_rvalue);
8614 r2 = gimplify_expr (&TREE_OPERAND (*expr_p, 2), pre_p,
8615 post_p, is_gimple_val, fb_rvalue);
8617 ret = MIN (MIN (r0, r1), r2);
8618 break;
8621 case tcc_declaration:
8622 case tcc_constant:
8623 ret = GS_ALL_DONE;
8624 goto dont_recalculate;
8626 default:
8627 gcc_unreachable ();
8630 recalculate_side_effects (*expr_p);
8632 dont_recalculate:
8633 break;
8636 gcc_assert (*expr_p || ret != GS_OK);
8638 while (ret == GS_OK);
8640 /* If we encountered an error_mark somewhere nested inside, either
8641 stub out the statement or propagate the error back out. */
8642 if (ret == GS_ERROR)
8644 if (is_statement)
8645 *expr_p = NULL;
8646 goto out;
8649 /* This was only valid as a return value from the langhook, which
8650 we handled. Make sure it doesn't escape from any other context. */
8651 gcc_assert (ret != GS_UNHANDLED);
8653 if (fallback == fb_none && *expr_p && !is_gimple_stmt (*expr_p))
8655 /* We aren't looking for a value, and we don't have a valid
8656 statement. If it doesn't have side-effects, throw it away. */
8657 if (!TREE_SIDE_EFFECTS (*expr_p))
8658 *expr_p = NULL;
8659 else if (!TREE_THIS_VOLATILE (*expr_p))
8661 /* This is probably a _REF that contains something nested that
8662 has side effects. Recurse through the operands to find it. */
8663 enum tree_code code = TREE_CODE (*expr_p);
8665 switch (code)
8667 case COMPONENT_REF:
8668 case REALPART_EXPR:
8669 case IMAGPART_EXPR:
8670 case VIEW_CONVERT_EXPR:
8671 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
8672 gimple_test_f, fallback);
8673 break;
8675 case ARRAY_REF:
8676 case ARRAY_RANGE_REF:
8677 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
8678 gimple_test_f, fallback);
8679 gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
8680 gimple_test_f, fallback);
8681 break;
8683 default:
8684 /* Anything else with side-effects must be converted to
8685 a valid statement before we get here. */
8686 gcc_unreachable ();
8689 *expr_p = NULL;
8691 else if (COMPLETE_TYPE_P (TREE_TYPE (*expr_p))
8692 && TYPE_MODE (TREE_TYPE (*expr_p)) != BLKmode)
8694 /* Historically, the compiler has treated a bare reference
8695 to a non-BLKmode volatile lvalue as forcing a load. */
8696 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (*expr_p));
8698 /* Normally, we do not want to create a temporary for a
8699 TREE_ADDRESSABLE type because such a type should not be
8700 copied by bitwise-assignment. However, we make an
8701 exception here, as all we are doing here is ensuring that
8702 we read the bytes that make up the type. We use
8703 create_tmp_var_raw because create_tmp_var will abort when
8704 given a TREE_ADDRESSABLE type. */
8705 tree tmp = create_tmp_var_raw (type, "vol");
8706 gimple_add_tmp_var (tmp);
8707 gimplify_assign (tmp, *expr_p, pre_p);
8708 *expr_p = NULL;
8710 else
8711 /* We can't do anything useful with a volatile reference to
8712 an incomplete type, so just throw it away. Likewise for
8713 a BLKmode type, since any implicit inner load should
8714 already have been turned into an explicit one by the
8715 gimplification process. */
8716 *expr_p = NULL;
8719 /* If we are gimplifying at the statement level, we're done. Tack
8720 everything together and return. */
8721 if (fallback == fb_none || is_statement)
8723 /* Since *EXPR_P has been converted into a GIMPLE tuple, clear
8724 it out for GC to reclaim it. */
8725 *expr_p = NULL_TREE;
8727 if (!gimple_seq_empty_p (internal_pre)
8728 || !gimple_seq_empty_p (internal_post))
8730 gimplify_seq_add_seq (&internal_pre, internal_post);
8731 gimplify_seq_add_seq (pre_p, internal_pre);
8734 /* The result of gimplifying *EXPR_P is going to be the last few
8735 statements in *PRE_P and *POST_P. Add location information
8736 to all the statements that were added by the gimplification
8737 helpers. */
8738 if (!gimple_seq_empty_p (*pre_p))
8739 annotate_all_with_location_after (*pre_p, pre_last_gsi, input_location);
8741 if (!gimple_seq_empty_p (*post_p))
8742 annotate_all_with_location_after (*post_p, post_last_gsi,
8743 input_location);
8745 goto out;
8748 #ifdef ENABLE_GIMPLE_CHECKING
8749 if (*expr_p)
8751 enum tree_code code = TREE_CODE (*expr_p);
8752 /* These expressions should already be in gimple IR form. */
8753 gcc_assert (code != MODIFY_EXPR
8754 && code != ASM_EXPR
8755 && code != BIND_EXPR
8756 && code != CATCH_EXPR
8757 && (code != COND_EXPR || gimplify_ctxp->allow_rhs_cond_expr)
8758 && code != EH_FILTER_EXPR
8759 && code != GOTO_EXPR
8760 && code != LABEL_EXPR
8761 && code != LOOP_EXPR
8762 && code != SWITCH_EXPR
8763 && code != TRY_FINALLY_EXPR
8764 && code != OACC_PARALLEL
8765 && code != OACC_KERNELS
8766 && code != OACC_DATA
8767 && code != OACC_HOST_DATA
8768 && code != OACC_DECLARE
8769 && code != OACC_UPDATE
8770 && code != OACC_ENTER_DATA
8771 && code != OACC_EXIT_DATA
8772 && code != OACC_CACHE
8773 && code != OMP_CRITICAL
8774 && code != OMP_FOR
8775 && code != OACC_LOOP
8776 && code != OMP_MASTER
8777 && code != OMP_TASKGROUP
8778 && code != OMP_ORDERED
8779 && code != OMP_PARALLEL
8780 && code != OMP_SECTIONS
8781 && code != OMP_SECTION
8782 && code != OMP_SINGLE);
8784 #endif
8786 /* Otherwise we're gimplifying a subexpression, so the resulting
8787 value is interesting. If it's a valid operand that matches
8788 GIMPLE_TEST_F, we're done. Unless we are handling some
8789 post-effects internally; if that's the case, we need to copy into
8790 a temporary before adding the post-effects to POST_P. */
8791 if (gimple_seq_empty_p (internal_post) && (*gimple_test_f) (*expr_p))
8792 goto out;
8794 /* Otherwise, we need to create a new temporary for the gimplified
8795 expression. */
8797 /* We can't return an lvalue if we have an internal postqueue. The
8798 object the lvalue refers to would (probably) be modified by the
8799 postqueue; we need to copy the value out first, which means an
8800 rvalue. */
8801 if ((fallback & fb_lvalue)
8802 && gimple_seq_empty_p (internal_post)
8803 && is_gimple_addressable (*expr_p))
8805 /* An lvalue will do. Take the address of the expression, store it
8806 in a temporary, and replace the expression with an INDIRECT_REF of
8807 that temporary. */
8808 tmp = build_fold_addr_expr_loc (input_location, *expr_p);
8809 gimplify_expr (&tmp, pre_p, post_p, is_gimple_reg, fb_rvalue);
8810 *expr_p = build_simple_mem_ref (tmp);
8812 else if ((fallback & fb_rvalue) && is_gimple_reg_rhs_or_call (*expr_p))
8814 /* An rvalue will do. Assign the gimplified expression into a
8815 new temporary TMP and replace the original expression with
8816 TMP. First, make sure that the expression has a type so that
8817 it can be assigned into a temporary. */
8818 gcc_assert (!VOID_TYPE_P (TREE_TYPE (*expr_p)));
8819 *expr_p = get_formal_tmp_var (*expr_p, pre_p);
8821 else
8823 #ifdef ENABLE_GIMPLE_CHECKING
8824 if (!(fallback & fb_mayfail))
8826 fprintf (stderr, "gimplification failed:\n");
8827 print_generic_expr (stderr, *expr_p, 0);
8828 debug_tree (*expr_p);
8829 internal_error ("gimplification failed");
8831 #endif
8832 gcc_assert (fallback & fb_mayfail);
8834 /* If this is an asm statement, and the user asked for the
8835 impossible, don't die. Fail and let gimplify_asm_expr
8836 issue an error. */
8837 ret = GS_ERROR;
8838 goto out;
8841 /* Make sure the temporary matches our predicate. */
8842 gcc_assert ((*gimple_test_f) (*expr_p));
8844 if (!gimple_seq_empty_p (internal_post))
8846 annotate_all_with_location (internal_post, input_location);
8847 gimplify_seq_add_seq (pre_p, internal_post);
8850 out:
8851 input_location = saved_location;
8852 return ret;
8855 /* Look through TYPE for variable-sized objects and gimplify each such
8856 size that we find. Add to LIST_P any statements generated. */
8858 void
8859 gimplify_type_sizes (tree type, gimple_seq *list_p)
8861 tree field, t;
8863 if (type == NULL || type == error_mark_node)
8864 return;
8866 /* We first do the main variant, then copy into any other variants. */
8867 type = TYPE_MAIN_VARIANT (type);
8869 /* Avoid infinite recursion. */
8870 if (TYPE_SIZES_GIMPLIFIED (type))
8871 return;
8873 TYPE_SIZES_GIMPLIFIED (type) = 1;
8875 switch (TREE_CODE (type))
8877 case INTEGER_TYPE:
8878 case ENUMERAL_TYPE:
8879 case BOOLEAN_TYPE:
8880 case REAL_TYPE:
8881 case FIXED_POINT_TYPE:
8882 gimplify_one_sizepos (&TYPE_MIN_VALUE (type), list_p);
8883 gimplify_one_sizepos (&TYPE_MAX_VALUE (type), list_p);
8885 for (t = TYPE_NEXT_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
8887 TYPE_MIN_VALUE (t) = TYPE_MIN_VALUE (type);
8888 TYPE_MAX_VALUE (t) = TYPE_MAX_VALUE (type);
8890 break;
8892 case ARRAY_TYPE:
8893 /* These types may not have declarations, so handle them here. */
8894 gimplify_type_sizes (TREE_TYPE (type), list_p);
8895 gimplify_type_sizes (TYPE_DOMAIN (type), list_p);
8896 /* Ensure VLA bounds aren't removed, for -O0 they should be variables
8897 with assigned stack slots, for -O1+ -g they should be tracked
8898 by VTA. */
8899 if (!(TYPE_NAME (type)
8900 && TREE_CODE (TYPE_NAME (type)) == TYPE_DECL
8901 && DECL_IGNORED_P (TYPE_NAME (type)))
8902 && TYPE_DOMAIN (type)
8903 && INTEGRAL_TYPE_P (TYPE_DOMAIN (type)))
8905 t = TYPE_MIN_VALUE (TYPE_DOMAIN (type));
8906 if (t && TREE_CODE (t) == VAR_DECL && DECL_ARTIFICIAL (t))
8907 DECL_IGNORED_P (t) = 0;
8908 t = TYPE_MAX_VALUE (TYPE_DOMAIN (type));
8909 if (t && TREE_CODE (t) == VAR_DECL && DECL_ARTIFICIAL (t))
8910 DECL_IGNORED_P (t) = 0;
8912 break;
8914 case RECORD_TYPE:
8915 case UNION_TYPE:
8916 case QUAL_UNION_TYPE:
8917 for (field = TYPE_FIELDS (type); field; field = DECL_CHAIN (field))
8918 if (TREE_CODE (field) == FIELD_DECL)
8920 gimplify_one_sizepos (&DECL_FIELD_OFFSET (field), list_p);
8921 gimplify_one_sizepos (&DECL_SIZE (field), list_p);
8922 gimplify_one_sizepos (&DECL_SIZE_UNIT (field), list_p);
8923 gimplify_type_sizes (TREE_TYPE (field), list_p);
8925 break;
8927 case POINTER_TYPE:
8928 case REFERENCE_TYPE:
8929 /* We used to recurse on the pointed-to type here, which turned out to
8930 be incorrect because its definition might refer to variables not
8931 yet initialized at this point if a forward declaration is involved.
8933 It was actually useful for anonymous pointed-to types to ensure
8934 that the sizes evaluation dominates every possible later use of the
8935 values. Restricting to such types here would be safe since there
8936 is no possible forward declaration around, but would introduce an
8937 undesirable middle-end semantic to anonymity. We then defer to
8938 front-ends the responsibility of ensuring that the sizes are
8939 evaluated both early and late enough, e.g. by attaching artificial
8940 type declarations to the tree. */
8941 break;
8943 default:
8944 break;
8947 gimplify_one_sizepos (&TYPE_SIZE (type), list_p);
8948 gimplify_one_sizepos (&TYPE_SIZE_UNIT (type), list_p);
8950 for (t = TYPE_NEXT_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
8952 TYPE_SIZE (t) = TYPE_SIZE (type);
8953 TYPE_SIZE_UNIT (t) = TYPE_SIZE_UNIT (type);
8954 TYPE_SIZES_GIMPLIFIED (t) = 1;
8958 /* A subroutine of gimplify_type_sizes to make sure that *EXPR_P,
8959 a size or position, has had all of its SAVE_EXPRs evaluated.
8960 We add any required statements to *STMT_P. */
8962 void
8963 gimplify_one_sizepos (tree *expr_p, gimple_seq *stmt_p)
8965 tree expr = *expr_p;
8967 /* We don't do anything if the value isn't there, is constant, or contains
8968 A PLACEHOLDER_EXPR. We also don't want to do anything if it's already
8969 a VAR_DECL. If it's a VAR_DECL from another function, the gimplifier
8970 will want to replace it with a new variable, but that will cause problems
8971 if this type is from outside the function. It's OK to have that here. */
8972 if (is_gimple_sizepos (expr))
8973 return;
8975 *expr_p = unshare_expr (expr);
8977 gimplify_expr (expr_p, stmt_p, NULL, is_gimple_val, fb_rvalue);
8980 /* Gimplify the body of statements of FNDECL and return a GIMPLE_BIND node
8981 containing the sequence of corresponding GIMPLE statements. If DO_PARMS
8982 is true, also gimplify the parameters. */
8984 gbind *
8985 gimplify_body (tree fndecl, bool do_parms)
8987 location_t saved_location = input_location;
8988 gimple_seq parm_stmts, seq;
8989 gimple outer_stmt;
8990 gbind *outer_bind;
8991 struct cgraph_node *cgn;
8993 timevar_push (TV_TREE_GIMPLIFY);
8995 /* Initialize for optimize_insn_for_s{ize,peed}_p possibly called during
8996 gimplification. */
8997 default_rtl_profile ();
8999 gcc_assert (gimplify_ctxp == NULL);
9000 push_gimplify_context ();
9002 if (flag_openacc || flag_openmp)
9004 gcc_assert (gimplify_omp_ctxp == NULL);
9005 if (lookup_attribute ("omp declare target", DECL_ATTRIBUTES (fndecl)))
9006 gimplify_omp_ctxp = new_omp_context (ORT_TARGET);
9009 /* Unshare most shared trees in the body and in that of any nested functions.
9010 It would seem we don't have to do this for nested functions because
9011 they are supposed to be output and then the outer function gimplified
9012 first, but the g++ front end doesn't always do it that way. */
9013 unshare_body (fndecl);
9014 unvisit_body (fndecl);
9016 cgn = cgraph_node::get (fndecl);
9017 if (cgn && cgn->origin)
9018 nonlocal_vlas = new hash_set<tree>;
9020 /* Make sure input_location isn't set to something weird. */
9021 input_location = DECL_SOURCE_LOCATION (fndecl);
9023 /* Resolve callee-copies. This has to be done before processing
9024 the body so that DECL_VALUE_EXPR gets processed correctly. */
9025 parm_stmts = do_parms ? gimplify_parameters () : NULL;
9027 /* Gimplify the function's body. */
9028 seq = NULL;
9029 gimplify_stmt (&DECL_SAVED_TREE (fndecl), &seq);
9030 outer_stmt = gimple_seq_first_stmt (seq);
9031 if (!outer_stmt)
9033 outer_stmt = gimple_build_nop ();
9034 gimplify_seq_add_stmt (&seq, outer_stmt);
9037 /* The body must contain exactly one statement, a GIMPLE_BIND. If this is
9038 not the case, wrap everything in a GIMPLE_BIND to make it so. */
9039 if (gimple_code (outer_stmt) == GIMPLE_BIND
9040 && gimple_seq_first (seq) == gimple_seq_last (seq))
9041 outer_bind = as_a <gbind *> (outer_stmt);
9042 else
9043 outer_bind = gimple_build_bind (NULL_TREE, seq, NULL);
9045 DECL_SAVED_TREE (fndecl) = NULL_TREE;
9047 /* If we had callee-copies statements, insert them at the beginning
9048 of the function and clear DECL_VALUE_EXPR_P on the parameters. */
9049 if (!gimple_seq_empty_p (parm_stmts))
9051 tree parm;
9053 gimplify_seq_add_seq (&parm_stmts, gimple_bind_body (outer_bind));
9054 gimple_bind_set_body (outer_bind, parm_stmts);
9056 for (parm = DECL_ARGUMENTS (current_function_decl);
9057 parm; parm = DECL_CHAIN (parm))
9058 if (DECL_HAS_VALUE_EXPR_P (parm))
9060 DECL_HAS_VALUE_EXPR_P (parm) = 0;
9061 DECL_IGNORED_P (parm) = 0;
9065 if (nonlocal_vlas)
9067 if (nonlocal_vla_vars)
9069 /* tree-nested.c may later on call declare_vars (..., true);
9070 which relies on BLOCK_VARS chain to be the tail of the
9071 gimple_bind_vars chain. Ensure we don't violate that
9072 assumption. */
9073 if (gimple_bind_block (outer_bind)
9074 == DECL_INITIAL (current_function_decl))
9075 declare_vars (nonlocal_vla_vars, outer_bind, true);
9076 else
9077 BLOCK_VARS (DECL_INITIAL (current_function_decl))
9078 = chainon (BLOCK_VARS (DECL_INITIAL (current_function_decl)),
9079 nonlocal_vla_vars);
9080 nonlocal_vla_vars = NULL_TREE;
9082 delete nonlocal_vlas;
9083 nonlocal_vlas = NULL;
9086 if ((flag_openacc || flag_openmp || flag_openmp_simd)
9087 && gimplify_omp_ctxp)
9089 delete_omp_context (gimplify_omp_ctxp);
9090 gimplify_omp_ctxp = NULL;
9093 pop_gimplify_context (outer_bind);
9094 gcc_assert (gimplify_ctxp == NULL);
9096 #ifdef ENABLE_CHECKING
9097 if (!seen_error ())
9098 verify_gimple_in_seq (gimple_bind_body (outer_bind));
9099 #endif
9101 timevar_pop (TV_TREE_GIMPLIFY);
9102 input_location = saved_location;
9104 return outer_bind;
9107 typedef char *char_p; /* For DEF_VEC_P. */
9109 /* Return whether we should exclude FNDECL from instrumentation. */
9111 static bool
9112 flag_instrument_functions_exclude_p (tree fndecl)
9114 vec<char_p> *v;
9116 v = (vec<char_p> *) flag_instrument_functions_exclude_functions;
9117 if (v && v->length () > 0)
9119 const char *name;
9120 int i;
9121 char *s;
9123 name = lang_hooks.decl_printable_name (fndecl, 0);
9124 FOR_EACH_VEC_ELT (*v, i, s)
9125 if (strstr (name, s) != NULL)
9126 return true;
9129 v = (vec<char_p> *) flag_instrument_functions_exclude_files;
9130 if (v && v->length () > 0)
9132 const char *name;
9133 int i;
9134 char *s;
9136 name = DECL_SOURCE_FILE (fndecl);
9137 FOR_EACH_VEC_ELT (*v, i, s)
9138 if (strstr (name, s) != NULL)
9139 return true;
9142 return false;
9145 /* Entry point to the gimplification pass. FNDECL is the FUNCTION_DECL
9146 node for the function we want to gimplify.
9148 Return the sequence of GIMPLE statements corresponding to the body
9149 of FNDECL. */
9151 void
9152 gimplify_function_tree (tree fndecl)
9154 tree parm, ret;
9155 gimple_seq seq;
9156 gbind *bind;
9158 gcc_assert (!gimple_body (fndecl));
9160 if (DECL_STRUCT_FUNCTION (fndecl))
9161 push_cfun (DECL_STRUCT_FUNCTION (fndecl));
9162 else
9163 push_struct_function (fndecl);
9165 for (parm = DECL_ARGUMENTS (fndecl); parm ; parm = DECL_CHAIN (parm))
9167 /* Preliminarily mark non-addressed complex variables as eligible
9168 for promotion to gimple registers. We'll transform their uses
9169 as we find them. */
9170 if ((TREE_CODE (TREE_TYPE (parm)) == COMPLEX_TYPE
9171 || TREE_CODE (TREE_TYPE (parm)) == VECTOR_TYPE)
9172 && !TREE_THIS_VOLATILE (parm)
9173 && !needs_to_live_in_memory (parm))
9174 DECL_GIMPLE_REG_P (parm) = 1;
9177 ret = DECL_RESULT (fndecl);
9178 if ((TREE_CODE (TREE_TYPE (ret)) == COMPLEX_TYPE
9179 || TREE_CODE (TREE_TYPE (ret)) == VECTOR_TYPE)
9180 && !needs_to_live_in_memory (ret))
9181 DECL_GIMPLE_REG_P (ret) = 1;
9183 bind = gimplify_body (fndecl, true);
9185 /* The tree body of the function is no longer needed, replace it
9186 with the new GIMPLE body. */
9187 seq = NULL;
9188 gimple_seq_add_stmt (&seq, bind);
9189 gimple_set_body (fndecl, seq);
9191 /* If we're instrumenting function entry/exit, then prepend the call to
9192 the entry hook and wrap the whole function in a TRY_FINALLY_EXPR to
9193 catch the exit hook. */
9194 /* ??? Add some way to ignore exceptions for this TFE. */
9195 if (flag_instrument_function_entry_exit
9196 && !DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (fndecl)
9197 && !flag_instrument_functions_exclude_p (fndecl))
9199 tree x;
9200 gbind *new_bind;
9201 gimple tf;
9202 gimple_seq cleanup = NULL, body = NULL;
9203 tree tmp_var;
9204 gcall *call;
9206 x = builtin_decl_implicit (BUILT_IN_RETURN_ADDRESS);
9207 call = gimple_build_call (x, 1, integer_zero_node);
9208 tmp_var = create_tmp_var (ptr_type_node, "return_addr");
9209 gimple_call_set_lhs (call, tmp_var);
9210 gimplify_seq_add_stmt (&cleanup, call);
9211 x = builtin_decl_implicit (BUILT_IN_PROFILE_FUNC_EXIT);
9212 call = gimple_build_call (x, 2,
9213 build_fold_addr_expr (current_function_decl),
9214 tmp_var);
9215 gimplify_seq_add_stmt (&cleanup, call);
9216 tf = gimple_build_try (seq, cleanup, GIMPLE_TRY_FINALLY);
9218 x = builtin_decl_implicit (BUILT_IN_RETURN_ADDRESS);
9219 call = gimple_build_call (x, 1, integer_zero_node);
9220 tmp_var = create_tmp_var (ptr_type_node, "return_addr");
9221 gimple_call_set_lhs (call, tmp_var);
9222 gimplify_seq_add_stmt (&body, call);
9223 x = builtin_decl_implicit (BUILT_IN_PROFILE_FUNC_ENTER);
9224 call = gimple_build_call (x, 2,
9225 build_fold_addr_expr (current_function_decl),
9226 tmp_var);
9227 gimplify_seq_add_stmt (&body, call);
9228 gimplify_seq_add_stmt (&body, tf);
9229 new_bind = gimple_build_bind (NULL, body, gimple_bind_block (bind));
9230 /* Clear the block for BIND, since it is no longer directly inside
9231 the function, but within a try block. */
9232 gimple_bind_set_block (bind, NULL);
9234 /* Replace the current function body with the body
9235 wrapped in the try/finally TF. */
9236 seq = NULL;
9237 gimple_seq_add_stmt (&seq, new_bind);
9238 gimple_set_body (fndecl, seq);
9239 bind = new_bind;
9242 if (flag_sanitize & SANITIZE_THREAD)
9244 gcall *call = gimple_build_call_internal (IFN_TSAN_FUNC_EXIT, 0);
9245 gimple tf = gimple_build_try (seq, call, GIMPLE_TRY_FINALLY);
9246 gbind *new_bind = gimple_build_bind (NULL, tf, gimple_bind_block (bind));
9247 /* Clear the block for BIND, since it is no longer directly inside
9248 the function, but within a try block. */
9249 gimple_bind_set_block (bind, NULL);
9250 /* Replace the current function body with the body
9251 wrapped in the try/finally TF. */
9252 seq = NULL;
9253 gimple_seq_add_stmt (&seq, new_bind);
9254 gimple_set_body (fndecl, seq);
9257 DECL_SAVED_TREE (fndecl) = NULL_TREE;
9258 cfun->curr_properties = PROP_gimple_any;
9260 pop_cfun ();
9263 /* Return a dummy expression of type TYPE in order to keep going after an
9264 error. */
9266 static tree
9267 dummy_object (tree type)
9269 tree t = build_int_cst (build_pointer_type (type), 0);
9270 return build2 (MEM_REF, type, t, t);
9273 /* Gimplify __builtin_va_arg, aka VA_ARG_EXPR, which is not really a
9274 builtin function, but a very special sort of operator. */
9276 enum gimplify_status
9277 gimplify_va_arg_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
9279 tree promoted_type, have_va_type;
9280 tree valist = TREE_OPERAND (*expr_p, 0);
9281 tree type = TREE_TYPE (*expr_p);
9282 tree t;
9283 location_t loc = EXPR_LOCATION (*expr_p);
9285 /* Verify that valist is of the proper type. */
9286 have_va_type = TREE_TYPE (valist);
9287 if (have_va_type == error_mark_node)
9288 return GS_ERROR;
9289 have_va_type = targetm.canonical_va_list_type (have_va_type);
9291 if (have_va_type == NULL_TREE)
9293 error_at (loc, "first argument to %<va_arg%> not of type %<va_list%>");
9294 return GS_ERROR;
9297 /* Generate a diagnostic for requesting data of a type that cannot
9298 be passed through `...' due to type promotion at the call site. */
9299 if ((promoted_type = lang_hooks.types.type_promotes_to (type))
9300 != type)
9302 static bool gave_help;
9303 bool warned;
9305 /* Unfortunately, this is merely undefined, rather than a constraint
9306 violation, so we cannot make this an error. If this call is never
9307 executed, the program is still strictly conforming. */
9308 warned = warning_at (loc, 0,
9309 "%qT is promoted to %qT when passed through %<...%>",
9310 type, promoted_type);
9311 if (!gave_help && warned)
9313 gave_help = true;
9314 inform (loc, "(so you should pass %qT not %qT to %<va_arg%>)",
9315 promoted_type, type);
9318 /* We can, however, treat "undefined" any way we please.
9319 Call abort to encourage the user to fix the program. */
9320 if (warned)
9321 inform (loc, "if this code is reached, the program will abort");
9322 /* Before the abort, allow the evaluation of the va_list
9323 expression to exit or longjmp. */
9324 gimplify_and_add (valist, pre_p);
9325 t = build_call_expr_loc (loc,
9326 builtin_decl_implicit (BUILT_IN_TRAP), 0);
9327 gimplify_and_add (t, pre_p);
9329 /* This is dead code, but go ahead and finish so that the
9330 mode of the result comes out right. */
9331 *expr_p = dummy_object (type);
9332 return GS_ALL_DONE;
9334 else
9336 /* Make it easier for the backends by protecting the valist argument
9337 from multiple evaluations. */
9338 if (TREE_CODE (have_va_type) == ARRAY_TYPE)
9340 /* For this case, the backends will be expecting a pointer to
9341 TREE_TYPE (abi), but it's possible we've
9342 actually been given an array (an actual TARGET_FN_ABI_VA_LIST).
9343 So fix it. */
9344 if (TREE_CODE (TREE_TYPE (valist)) == ARRAY_TYPE)
9346 tree p1 = build_pointer_type (TREE_TYPE (have_va_type));
9347 valist = fold_convert_loc (loc, p1,
9348 build_fold_addr_expr_loc (loc, valist));
9351 gimplify_expr (&valist, pre_p, post_p, is_gimple_val, fb_rvalue);
9353 else
9354 gimplify_expr (&valist, pre_p, post_p, is_gimple_min_lval, fb_lvalue);
9356 if (!targetm.gimplify_va_arg_expr)
9357 /* FIXME: Once most targets are converted we should merely
9358 assert this is non-null. */
9359 return GS_ALL_DONE;
9361 *expr_p = targetm.gimplify_va_arg_expr (valist, type, pre_p, post_p);
9362 return GS_OK;
9366 /* Build a new GIMPLE_ASSIGN tuple and append it to the end of *SEQ_P.
9368 DST/SRC are the destination and source respectively. You can pass
9369 ungimplified trees in DST or SRC, in which case they will be
9370 converted to a gimple operand if necessary.
9372 This function returns the newly created GIMPLE_ASSIGN tuple. */
9374 gimple
9375 gimplify_assign (tree dst, tree src, gimple_seq *seq_p)
9377 tree t = build2 (MODIFY_EXPR, TREE_TYPE (dst), dst, src);
9378 gimplify_and_add (t, seq_p);
9379 ggc_free (t);
9380 return gimple_seq_last_stmt (*seq_p);
9383 inline hashval_t
9384 gimplify_hasher::hash (const value_type *p)
9386 tree t = p->val;
9387 return iterative_hash_expr (t, 0);
9390 inline bool
9391 gimplify_hasher::equal (const value_type *p1, const compare_type *p2)
9393 tree t1 = p1->val;
9394 tree t2 = p2->val;
9395 enum tree_code code = TREE_CODE (t1);
9397 if (TREE_CODE (t2) != code
9398 || TREE_TYPE (t1) != TREE_TYPE (t2))
9399 return false;
9401 if (!operand_equal_p (t1, t2, 0))
9402 return false;
9404 #ifdef ENABLE_CHECKING
9405 /* Only allow them to compare equal if they also hash equal; otherwise
9406 results are nondeterminate, and we fail bootstrap comparison. */
9407 gcc_assert (hash (p1) == hash (p2));
9408 #endif
9410 return true;