Daily bump.
[official-gcc.git] / gcc / gimplify.c
blob7c5cead076d3c0ee3c0afd19bce8502e6b3ab79c
1 /* Tree lowering pass. This pass converts the GENERIC functions-as-trees
2 tree representation into the GIMPLE form.
3 Copyright (C) 2002-2016 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 "backend.h"
27 #include "target.h"
28 #include "rtl.h"
29 #include "tree.h"
30 #include "gimple.h"
31 #include "gimple-predict.h"
32 #include "tree-pass.h" /* FIXME: only for PROP_gimple_any */
33 #include "ssa.h"
34 #include "cgraph.h"
35 #include "tree-pretty-print.h"
36 #include "diagnostic-core.h"
37 #include "alias.h"
38 #include "fold-const.h"
39 #include "calls.h"
40 #include "varasm.h"
41 #include "stmt.h"
42 #include "expr.h"
43 #include "gimple-fold.h"
44 #include "tree-eh.h"
45 #include "gimplify.h"
46 #include "gimple-iterator.h"
47 #include "stor-layout.h"
48 #include "print-tree.h"
49 #include "tree-iterator.h"
50 #include "tree-inline.h"
51 #include "langhooks.h"
52 #include "tree-cfg.h"
53 #include "tree-ssa.h"
54 #include "omp-low.h"
55 #include "gimple-low.h"
56 #include "cilk.h"
57 #include "gomp-constants.h"
58 #include "tree-dump.h"
59 #include "gimple-walk.h"
60 #include "langhooks-def.h" /* FIXME: for lhd_set_decl_assembler_name */
61 #include "builtins.h"
63 enum gimplify_omp_var_data
65 GOVD_SEEN = 1,
66 GOVD_EXPLICIT = 2,
67 GOVD_SHARED = 4,
68 GOVD_PRIVATE = 8,
69 GOVD_FIRSTPRIVATE = 16,
70 GOVD_LASTPRIVATE = 32,
71 GOVD_REDUCTION = 64,
72 GOVD_LOCAL = 128,
73 GOVD_MAP = 256,
74 GOVD_DEBUG_PRIVATE = 512,
75 GOVD_PRIVATE_OUTER_REF = 1024,
76 GOVD_LINEAR = 2048,
77 GOVD_ALIGNED = 4096,
79 /* Flag for GOVD_MAP: don't copy back. */
80 GOVD_MAP_TO_ONLY = 8192,
82 /* Flag for GOVD_LINEAR or GOVD_LASTPRIVATE: no outer reference. */
83 GOVD_LINEAR_LASTPRIVATE_NO_OUTER = 16384,
85 GOVD_MAP_0LEN_ARRAY = 32768,
87 /* Flag for GOVD_MAP, if it is always, to or always, tofrom mapping. */
88 GOVD_MAP_ALWAYS_TO = 65536,
90 /* Flag for shared vars that are or might be stored to in the region. */
91 GOVD_WRITTEN = 131072,
93 /* Flag for GOVD_MAP, if it is a forced mapping. */
94 GOVD_MAP_FORCE = 262144,
96 GOVD_DATA_SHARE_CLASS = (GOVD_SHARED | GOVD_PRIVATE | GOVD_FIRSTPRIVATE
97 | GOVD_LASTPRIVATE | GOVD_REDUCTION | GOVD_LINEAR
98 | GOVD_LOCAL)
102 enum omp_region_type
104 ORT_WORKSHARE = 0x00,
105 ORT_SIMD = 0x01,
107 ORT_PARALLEL = 0x02,
108 ORT_COMBINED_PARALLEL = 0x03,
110 ORT_TASK = 0x04,
111 ORT_UNTIED_TASK = 0x05,
113 ORT_TEAMS = 0x08,
114 ORT_COMBINED_TEAMS = 0x09,
116 /* Data region. */
117 ORT_TARGET_DATA = 0x10,
119 /* Data region with offloading. */
120 ORT_TARGET = 0x20,
121 ORT_COMBINED_TARGET = 0x21,
123 /* OpenACC variants. */
124 ORT_ACC = 0x40, /* A generic OpenACC region. */
125 ORT_ACC_DATA = ORT_ACC | ORT_TARGET_DATA, /* Data construct. */
126 ORT_ACC_PARALLEL = ORT_ACC | ORT_TARGET, /* Parallel construct */
127 ORT_ACC_KERNELS = ORT_ACC | ORT_TARGET | 0x80, /* Kernels construct. */
128 ORT_ACC_HOST_DATA = ORT_ACC | ORT_TARGET_DATA | 0x80, /* Host data. */
130 /* Dummy OpenMP region, used to disable expansion of
131 DECL_VALUE_EXPRs in taskloop pre body. */
132 ORT_NONE = 0x100
135 /* Gimplify hashtable helper. */
137 struct gimplify_hasher : free_ptr_hash <elt_t>
139 static inline hashval_t hash (const elt_t *);
140 static inline bool equal (const elt_t *, const elt_t *);
143 struct gimplify_ctx
145 struct gimplify_ctx *prev_context;
147 vec<gbind *> bind_expr_stack;
148 tree temps;
149 gimple_seq conditional_cleanups;
150 tree exit_label;
151 tree return_temp;
153 vec<tree> case_labels;
154 /* The formal temporary table. Should this be persistent? */
155 hash_table<gimplify_hasher> *temp_htab;
157 int conditions;
158 unsigned into_ssa : 1;
159 unsigned allow_rhs_cond_expr : 1;
160 unsigned in_cleanup_point_expr : 1;
161 unsigned keep_stack : 1;
162 unsigned save_stack : 1;
165 struct gimplify_omp_ctx
167 struct gimplify_omp_ctx *outer_context;
168 splay_tree variables;
169 hash_set<tree> *privatized_types;
170 /* Iteration variables in an OMP_FOR. */
171 vec<tree> loop_iter_var;
172 location_t location;
173 enum omp_clause_default_kind default_kind;
174 enum omp_region_type region_type;
175 bool combined_loop;
176 bool distribute;
177 bool target_map_scalars_firstprivate;
178 bool target_map_pointers_as_0len_arrays;
179 bool target_firstprivatize_array_bases;
182 static struct gimplify_ctx *gimplify_ctxp;
183 static struct gimplify_omp_ctx *gimplify_omp_ctxp;
185 /* Forward declaration. */
186 static enum gimplify_status gimplify_compound_expr (tree *, gimple_seq *, bool);
187 static hash_map<tree, tree> *oacc_declare_returns;
189 /* Shorter alias name for the above function for use in gimplify.c
190 only. */
192 static inline void
193 gimplify_seq_add_stmt (gimple_seq *seq_p, gimple *gs)
195 gimple_seq_add_stmt_without_update (seq_p, gs);
198 /* Append sequence SRC to the end of sequence *DST_P. If *DST_P is
199 NULL, a new sequence is allocated. This function is
200 similar to gimple_seq_add_seq, but does not scan the operands.
201 During gimplification, we need to manipulate statement sequences
202 before the def/use vectors have been constructed. */
204 static void
205 gimplify_seq_add_seq (gimple_seq *dst_p, gimple_seq src)
207 gimple_stmt_iterator si;
209 if (src == NULL)
210 return;
212 si = gsi_last (*dst_p);
213 gsi_insert_seq_after_without_update (&si, src, GSI_NEW_STMT);
217 /* Pointer to a list of allocated gimplify_ctx structs to be used for pushing
218 and popping gimplify contexts. */
220 static struct gimplify_ctx *ctx_pool = NULL;
222 /* Return a gimplify context struct from the pool. */
224 static inline struct gimplify_ctx *
225 ctx_alloc (void)
227 struct gimplify_ctx * c = ctx_pool;
229 if (c)
230 ctx_pool = c->prev_context;
231 else
232 c = XNEW (struct gimplify_ctx);
234 memset (c, '\0', sizeof (*c));
235 return c;
238 /* Put gimplify context C back into the pool. */
240 static inline void
241 ctx_free (struct gimplify_ctx *c)
243 c->prev_context = ctx_pool;
244 ctx_pool = c;
247 /* Free allocated ctx stack memory. */
249 void
250 free_gimplify_stack (void)
252 struct gimplify_ctx *c;
254 while ((c = ctx_pool))
256 ctx_pool = c->prev_context;
257 free (c);
262 /* Set up a context for the gimplifier. */
264 void
265 push_gimplify_context (bool in_ssa, bool rhs_cond_ok)
267 struct gimplify_ctx *c = ctx_alloc ();
269 c->prev_context = gimplify_ctxp;
270 gimplify_ctxp = c;
271 gimplify_ctxp->into_ssa = in_ssa;
272 gimplify_ctxp->allow_rhs_cond_expr = rhs_cond_ok;
275 /* Tear down a context for the gimplifier. If BODY is non-null, then
276 put the temporaries into the outer BIND_EXPR. Otherwise, put them
277 in the local_decls.
279 BODY is not a sequence, but the first tuple in a sequence. */
281 void
282 pop_gimplify_context (gimple *body)
284 struct gimplify_ctx *c = gimplify_ctxp;
286 gcc_assert (c
287 && (!c->bind_expr_stack.exists ()
288 || c->bind_expr_stack.is_empty ()));
289 c->bind_expr_stack.release ();
290 gimplify_ctxp = c->prev_context;
292 if (body)
293 declare_vars (c->temps, body, false);
294 else
295 record_vars (c->temps);
297 delete c->temp_htab;
298 c->temp_htab = NULL;
299 ctx_free (c);
302 /* Push a GIMPLE_BIND tuple onto the stack of bindings. */
304 static void
305 gimple_push_bind_expr (gbind *bind_stmt)
307 gimplify_ctxp->bind_expr_stack.reserve (8);
308 gimplify_ctxp->bind_expr_stack.safe_push (bind_stmt);
311 /* Pop the first element off the stack of bindings. */
313 static void
314 gimple_pop_bind_expr (void)
316 gimplify_ctxp->bind_expr_stack.pop ();
319 /* Return the first element of the stack of bindings. */
321 gbind *
322 gimple_current_bind_expr (void)
324 return gimplify_ctxp->bind_expr_stack.last ();
327 /* Return the stack of bindings created during gimplification. */
329 vec<gbind *>
330 gimple_bind_expr_stack (void)
332 return gimplify_ctxp->bind_expr_stack;
335 /* Return true iff there is a COND_EXPR between us and the innermost
336 CLEANUP_POINT_EXPR. This info is used by gimple_push_cleanup. */
338 static bool
339 gimple_conditional_context (void)
341 return gimplify_ctxp->conditions > 0;
344 /* Note that we've entered a COND_EXPR. */
346 static void
347 gimple_push_condition (void)
349 #ifdef ENABLE_GIMPLE_CHECKING
350 if (gimplify_ctxp->conditions == 0)
351 gcc_assert (gimple_seq_empty_p (gimplify_ctxp->conditional_cleanups));
352 #endif
353 ++(gimplify_ctxp->conditions);
356 /* Note that we've left a COND_EXPR. If we're back at unconditional scope
357 now, add any conditional cleanups we've seen to the prequeue. */
359 static void
360 gimple_pop_condition (gimple_seq *pre_p)
362 int conds = --(gimplify_ctxp->conditions);
364 gcc_assert (conds >= 0);
365 if (conds == 0)
367 gimplify_seq_add_seq (pre_p, gimplify_ctxp->conditional_cleanups);
368 gimplify_ctxp->conditional_cleanups = NULL;
372 /* A stable comparison routine for use with splay trees and DECLs. */
374 static int
375 splay_tree_compare_decl_uid (splay_tree_key xa, splay_tree_key xb)
377 tree a = (tree) xa;
378 tree b = (tree) xb;
380 return DECL_UID (a) - DECL_UID (b);
383 /* Create a new omp construct that deals with variable remapping. */
385 static struct gimplify_omp_ctx *
386 new_omp_context (enum omp_region_type region_type)
388 struct gimplify_omp_ctx *c;
390 c = XCNEW (struct gimplify_omp_ctx);
391 c->outer_context = gimplify_omp_ctxp;
392 c->variables = splay_tree_new (splay_tree_compare_decl_uid, 0, 0);
393 c->privatized_types = new hash_set<tree>;
394 c->location = input_location;
395 c->region_type = region_type;
396 if ((region_type & ORT_TASK) == 0)
397 c->default_kind = OMP_CLAUSE_DEFAULT_SHARED;
398 else
399 c->default_kind = OMP_CLAUSE_DEFAULT_UNSPECIFIED;
401 return c;
404 /* Destroy an omp construct that deals with variable remapping. */
406 static void
407 delete_omp_context (struct gimplify_omp_ctx *c)
409 splay_tree_delete (c->variables);
410 delete c->privatized_types;
411 c->loop_iter_var.release ();
412 XDELETE (c);
415 static void omp_add_variable (struct gimplify_omp_ctx *, tree, unsigned int);
416 static bool omp_notice_variable (struct gimplify_omp_ctx *, tree, bool);
418 /* Both gimplify the statement T and append it to *SEQ_P. This function
419 behaves exactly as gimplify_stmt, but you don't have to pass T as a
420 reference. */
422 void
423 gimplify_and_add (tree t, gimple_seq *seq_p)
425 gimplify_stmt (&t, seq_p);
428 /* Gimplify statement T into sequence *SEQ_P, and return the first
429 tuple in the sequence of generated tuples for this statement.
430 Return NULL if gimplifying T produced no tuples. */
432 static gimple *
433 gimplify_and_return_first (tree t, gimple_seq *seq_p)
435 gimple_stmt_iterator last = gsi_last (*seq_p);
437 gimplify_and_add (t, seq_p);
439 if (!gsi_end_p (last))
441 gsi_next (&last);
442 return gsi_stmt (last);
444 else
445 return gimple_seq_first_stmt (*seq_p);
448 /* Returns true iff T is a valid RHS for an assignment to an un-renamed
449 LHS, or for a call argument. */
451 static bool
452 is_gimple_mem_rhs (tree t)
454 /* If we're dealing with a renamable type, either source or dest must be
455 a renamed variable. */
456 if (is_gimple_reg_type (TREE_TYPE (t)))
457 return is_gimple_val (t);
458 else
459 return is_gimple_val (t) || is_gimple_lvalue (t);
462 /* Return true if T is a CALL_EXPR or an expression that can be
463 assigned to a temporary. Note that this predicate should only be
464 used during gimplification. See the rationale for this in
465 gimplify_modify_expr. */
467 static bool
468 is_gimple_reg_rhs_or_call (tree t)
470 return (get_gimple_rhs_class (TREE_CODE (t)) != GIMPLE_INVALID_RHS
471 || TREE_CODE (t) == CALL_EXPR);
474 /* Return true if T is a valid memory RHS or a CALL_EXPR. Note that
475 this predicate should only be used during gimplification. See the
476 rationale for this in gimplify_modify_expr. */
478 static bool
479 is_gimple_mem_rhs_or_call (tree t)
481 /* If we're dealing with a renamable type, either source or dest must be
482 a renamed variable. */
483 if (is_gimple_reg_type (TREE_TYPE (t)))
484 return is_gimple_val (t);
485 else
486 return (is_gimple_val (t) || is_gimple_lvalue (t)
487 || TREE_CODE (t) == CALL_EXPR);
490 /* Create a temporary with a name derived from VAL. Subroutine of
491 lookup_tmp_var; nobody else should call this function. */
493 static inline tree
494 create_tmp_from_val (tree val)
496 /* Drop all qualifiers and address-space information from the value type. */
497 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (val));
498 tree var = create_tmp_var (type, get_name (val));
499 if (TREE_CODE (TREE_TYPE (var)) == COMPLEX_TYPE
500 || TREE_CODE (TREE_TYPE (var)) == VECTOR_TYPE)
501 DECL_GIMPLE_REG_P (var) = 1;
502 return var;
505 /* Create a temporary to hold the value of VAL. If IS_FORMAL, try to reuse
506 an existing expression temporary. */
508 static tree
509 lookup_tmp_var (tree val, bool is_formal)
511 tree ret;
513 /* If not optimizing, never really reuse a temporary. local-alloc
514 won't allocate any variable that is used in more than one basic
515 block, which means it will go into memory, causing much extra
516 work in reload and final and poorer code generation, outweighing
517 the extra memory allocation here. */
518 if (!optimize || !is_formal || TREE_SIDE_EFFECTS (val))
519 ret = create_tmp_from_val (val);
520 else
522 elt_t elt, *elt_p;
523 elt_t **slot;
525 elt.val = val;
526 if (!gimplify_ctxp->temp_htab)
527 gimplify_ctxp->temp_htab = new hash_table<gimplify_hasher> (1000);
528 slot = gimplify_ctxp->temp_htab->find_slot (&elt, INSERT);
529 if (*slot == NULL)
531 elt_p = XNEW (elt_t);
532 elt_p->val = val;
533 elt_p->temp = ret = create_tmp_from_val (val);
534 *slot = elt_p;
536 else
538 elt_p = *slot;
539 ret = elt_p->temp;
543 return ret;
546 /* Helper for get_formal_tmp_var and get_initialized_tmp_var. */
548 static tree
549 internal_get_tmp_var (tree val, gimple_seq *pre_p, gimple_seq *post_p,
550 bool is_formal)
552 tree t, mod;
554 /* Notice that we explicitly allow VAL to be a CALL_EXPR so that we
555 can create an INIT_EXPR and convert it into a GIMPLE_CALL below. */
556 gimplify_expr (&val, pre_p, post_p, is_gimple_reg_rhs_or_call,
557 fb_rvalue);
559 if (gimplify_ctxp->into_ssa
560 && is_gimple_reg_type (TREE_TYPE (val)))
561 t = make_ssa_name (TYPE_MAIN_VARIANT (TREE_TYPE (val)));
562 else
563 t = lookup_tmp_var (val, is_formal);
565 mod = build2 (INIT_EXPR, TREE_TYPE (t), t, unshare_expr (val));
567 SET_EXPR_LOCATION (mod, EXPR_LOC_OR_LOC (val, input_location));
569 /* gimplify_modify_expr might want to reduce this further. */
570 gimplify_and_add (mod, pre_p);
571 ggc_free (mod);
573 return t;
576 /* Return a formal temporary variable initialized with VAL. PRE_P is as
577 in gimplify_expr. Only use this function if:
579 1) The value of the unfactored expression represented by VAL will not
580 change between the initialization and use of the temporary, and
581 2) The temporary will not be otherwise modified.
583 For instance, #1 means that this is inappropriate for SAVE_EXPR temps,
584 and #2 means it is inappropriate for && temps.
586 For other cases, use get_initialized_tmp_var instead. */
588 tree
589 get_formal_tmp_var (tree val, gimple_seq *pre_p)
591 return internal_get_tmp_var (val, pre_p, NULL, true);
594 /* Return a temporary variable initialized with VAL. PRE_P and POST_P
595 are as in gimplify_expr. */
597 tree
598 get_initialized_tmp_var (tree val, gimple_seq *pre_p, gimple_seq *post_p)
600 return internal_get_tmp_var (val, pre_p, post_p, false);
603 /* Declare all the variables in VARS in SCOPE. If DEBUG_INFO is true,
604 generate debug info for them; otherwise don't. */
606 void
607 declare_vars (tree vars, gimple *gs, bool debug_info)
609 tree last = vars;
610 if (last)
612 tree temps, block;
614 gbind *scope = as_a <gbind *> (gs);
616 temps = nreverse (last);
618 block = gimple_bind_block (scope);
619 gcc_assert (!block || TREE_CODE (block) == BLOCK);
620 if (!block || !debug_info)
622 DECL_CHAIN (last) = gimple_bind_vars (scope);
623 gimple_bind_set_vars (scope, temps);
625 else
627 /* We need to attach the nodes both to the BIND_EXPR and to its
628 associated BLOCK for debugging purposes. The key point here
629 is that the BLOCK_VARS of the BIND_EXPR_BLOCK of a BIND_EXPR
630 is a subchain of the BIND_EXPR_VARS of the BIND_EXPR. */
631 if (BLOCK_VARS (block))
632 BLOCK_VARS (block) = chainon (BLOCK_VARS (block), temps);
633 else
635 gimple_bind_set_vars (scope,
636 chainon (gimple_bind_vars (scope), temps));
637 BLOCK_VARS (block) = temps;
643 /* For VAR a VAR_DECL of variable size, try to find a constant upper bound
644 for the size and adjust DECL_SIZE/DECL_SIZE_UNIT accordingly. Abort if
645 no such upper bound can be obtained. */
647 static void
648 force_constant_size (tree var)
650 /* The only attempt we make is by querying the maximum size of objects
651 of the variable's type. */
653 HOST_WIDE_INT max_size;
655 gcc_assert (TREE_CODE (var) == VAR_DECL);
657 max_size = max_int_size_in_bytes (TREE_TYPE (var));
659 gcc_assert (max_size >= 0);
661 DECL_SIZE_UNIT (var)
662 = build_int_cst (TREE_TYPE (DECL_SIZE_UNIT (var)), max_size);
663 DECL_SIZE (var)
664 = build_int_cst (TREE_TYPE (DECL_SIZE (var)), max_size * BITS_PER_UNIT);
667 /* Push the temporary variable TMP into the current binding. */
669 void
670 gimple_add_tmp_var_fn (struct function *fn, tree tmp)
672 gcc_assert (!DECL_CHAIN (tmp) && !DECL_SEEN_IN_BIND_EXPR_P (tmp));
674 /* Later processing assumes that the object size is constant, which might
675 not be true at this point. Force the use of a constant upper bound in
676 this case. */
677 if (!tree_fits_uhwi_p (DECL_SIZE_UNIT (tmp)))
678 force_constant_size (tmp);
680 DECL_CONTEXT (tmp) = fn->decl;
681 DECL_SEEN_IN_BIND_EXPR_P (tmp) = 1;
683 record_vars_into (tmp, fn->decl);
686 /* Push the temporary variable TMP into the current binding. */
688 void
689 gimple_add_tmp_var (tree tmp)
691 gcc_assert (!DECL_CHAIN (tmp) && !DECL_SEEN_IN_BIND_EXPR_P (tmp));
693 /* Later processing assumes that the object size is constant, which might
694 not be true at this point. Force the use of a constant upper bound in
695 this case. */
696 if (!tree_fits_uhwi_p (DECL_SIZE_UNIT (tmp)))
697 force_constant_size (tmp);
699 DECL_CONTEXT (tmp) = current_function_decl;
700 DECL_SEEN_IN_BIND_EXPR_P (tmp) = 1;
702 if (gimplify_ctxp)
704 DECL_CHAIN (tmp) = gimplify_ctxp->temps;
705 gimplify_ctxp->temps = tmp;
707 /* Mark temporaries local within the nearest enclosing parallel. */
708 if (gimplify_omp_ctxp)
710 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
711 while (ctx
712 && (ctx->region_type == ORT_WORKSHARE
713 || ctx->region_type == ORT_SIMD
714 || ctx->region_type == ORT_ACC))
715 ctx = ctx->outer_context;
716 if (ctx)
717 omp_add_variable (ctx, tmp, GOVD_LOCAL | GOVD_SEEN);
720 else if (cfun)
721 record_vars (tmp);
722 else
724 gimple_seq body_seq;
726 /* This case is for nested functions. We need to expose the locals
727 they create. */
728 body_seq = gimple_body (current_function_decl);
729 declare_vars (tmp, gimple_seq_first_stmt (body_seq), false);
735 /* This page contains routines to unshare tree nodes, i.e. to duplicate tree
736 nodes that are referenced more than once in GENERIC functions. This is
737 necessary because gimplification (translation into GIMPLE) is performed
738 by modifying tree nodes in-place, so gimplication of a shared node in a
739 first context could generate an invalid GIMPLE form in a second context.
741 This is achieved with a simple mark/copy/unmark algorithm that walks the
742 GENERIC representation top-down, marks nodes with TREE_VISITED the first
743 time it encounters them, duplicates them if they already have TREE_VISITED
744 set, and finally removes the TREE_VISITED marks it has set.
746 The algorithm works only at the function level, i.e. it generates a GENERIC
747 representation of a function with no nodes shared within the function when
748 passed a GENERIC function (except for nodes that are allowed to be shared).
750 At the global level, it is also necessary to unshare tree nodes that are
751 referenced in more than one function, for the same aforementioned reason.
752 This requires some cooperation from the front-end. There are 2 strategies:
754 1. Manual unsharing. The front-end needs to call unshare_expr on every
755 expression that might end up being shared across functions.
757 2. Deep unsharing. This is an extension of regular unsharing. Instead
758 of calling unshare_expr on expressions that might be shared across
759 functions, the front-end pre-marks them with TREE_VISITED. This will
760 ensure that they are unshared on the first reference within functions
761 when the regular unsharing algorithm runs. The counterpart is that
762 this algorithm must look deeper than for manual unsharing, which is
763 specified by LANG_HOOKS_DEEP_UNSHARING.
765 If there are only few specific cases of node sharing across functions, it is
766 probably easier for a front-end to unshare the expressions manually. On the
767 contrary, if the expressions generated at the global level are as widespread
768 as expressions generated within functions, deep unsharing is very likely the
769 way to go. */
771 /* Similar to copy_tree_r but do not copy SAVE_EXPR or TARGET_EXPR nodes.
772 These nodes model computations that must be done once. If we were to
773 unshare something like SAVE_EXPR(i++), the gimplification process would
774 create wrong code. However, if DATA is non-null, it must hold a pointer
775 set that is used to unshare the subtrees of these nodes. */
777 static tree
778 mostly_copy_tree_r (tree *tp, int *walk_subtrees, void *data)
780 tree t = *tp;
781 enum tree_code code = TREE_CODE (t);
783 /* Do not copy SAVE_EXPR, TARGET_EXPR or BIND_EXPR nodes themselves, but
784 copy their subtrees if we can make sure to do it only once. */
785 if (code == SAVE_EXPR || code == TARGET_EXPR || code == BIND_EXPR)
787 if (data && !((hash_set<tree> *)data)->add (t))
789 else
790 *walk_subtrees = 0;
793 /* Stop at types, decls, constants like copy_tree_r. */
794 else if (TREE_CODE_CLASS (code) == tcc_type
795 || TREE_CODE_CLASS (code) == tcc_declaration
796 || TREE_CODE_CLASS (code) == tcc_constant
797 /* We can't do anything sensible with a BLOCK used as an
798 expression, but we also can't just die when we see it
799 because of non-expression uses. So we avert our eyes
800 and cross our fingers. Silly Java. */
801 || code == BLOCK)
802 *walk_subtrees = 0;
804 /* Cope with the statement expression extension. */
805 else if (code == STATEMENT_LIST)
808 /* Leave the bulk of the work to copy_tree_r itself. */
809 else
810 copy_tree_r (tp, walk_subtrees, NULL);
812 return NULL_TREE;
815 /* Callback for walk_tree to unshare most of the shared trees rooted at *TP.
816 If *TP has been visited already, then *TP is deeply copied by calling
817 mostly_copy_tree_r. DATA is passed to mostly_copy_tree_r unmodified. */
819 static tree
820 copy_if_shared_r (tree *tp, int *walk_subtrees, void *data)
822 tree t = *tp;
823 enum tree_code code = TREE_CODE (t);
825 /* Skip types, decls, and constants. But we do want to look at their
826 types and the bounds of types. Mark them as visited so we properly
827 unmark their subtrees on the unmark pass. If we've already seen them,
828 don't look down further. */
829 if (TREE_CODE_CLASS (code) == tcc_type
830 || TREE_CODE_CLASS (code) == tcc_declaration
831 || TREE_CODE_CLASS (code) == tcc_constant)
833 if (TREE_VISITED (t))
834 *walk_subtrees = 0;
835 else
836 TREE_VISITED (t) = 1;
839 /* If this node has been visited already, unshare it and don't look
840 any deeper. */
841 else if (TREE_VISITED (t))
843 walk_tree (tp, mostly_copy_tree_r, data, NULL);
844 *walk_subtrees = 0;
847 /* Otherwise, mark the node as visited and keep looking. */
848 else
849 TREE_VISITED (t) = 1;
851 return NULL_TREE;
854 /* Unshare most of the shared trees rooted at *TP. DATA is passed to the
855 copy_if_shared_r callback unmodified. */
857 static inline void
858 copy_if_shared (tree *tp, void *data)
860 walk_tree (tp, copy_if_shared_r, data, NULL);
863 /* Unshare all the trees in the body of FNDECL, as well as in the bodies of
864 any nested functions. */
866 static void
867 unshare_body (tree fndecl)
869 struct cgraph_node *cgn = cgraph_node::get (fndecl);
870 /* If the language requires deep unsharing, we need a pointer set to make
871 sure we don't repeatedly unshare subtrees of unshareable nodes. */
872 hash_set<tree> *visited
873 = lang_hooks.deep_unsharing ? new hash_set<tree> : NULL;
875 copy_if_shared (&DECL_SAVED_TREE (fndecl), visited);
876 copy_if_shared (&DECL_SIZE (DECL_RESULT (fndecl)), visited);
877 copy_if_shared (&DECL_SIZE_UNIT (DECL_RESULT (fndecl)), visited);
879 delete visited;
881 if (cgn)
882 for (cgn = cgn->nested; cgn; cgn = cgn->next_nested)
883 unshare_body (cgn->decl);
886 /* Callback for walk_tree to unmark the visited trees rooted at *TP.
887 Subtrees are walked until the first unvisited node is encountered. */
889 static tree
890 unmark_visited_r (tree *tp, int *walk_subtrees, void *data ATTRIBUTE_UNUSED)
892 tree t = *tp;
894 /* If this node has been visited, unmark it and keep looking. */
895 if (TREE_VISITED (t))
896 TREE_VISITED (t) = 0;
898 /* Otherwise, don't look any deeper. */
899 else
900 *walk_subtrees = 0;
902 return NULL_TREE;
905 /* Unmark the visited trees rooted at *TP. */
907 static inline void
908 unmark_visited (tree *tp)
910 walk_tree (tp, unmark_visited_r, NULL, NULL);
913 /* Likewise, but mark all trees as not visited. */
915 static void
916 unvisit_body (tree fndecl)
918 struct cgraph_node *cgn = cgraph_node::get (fndecl);
920 unmark_visited (&DECL_SAVED_TREE (fndecl));
921 unmark_visited (&DECL_SIZE (DECL_RESULT (fndecl)));
922 unmark_visited (&DECL_SIZE_UNIT (DECL_RESULT (fndecl)));
924 if (cgn)
925 for (cgn = cgn->nested; cgn; cgn = cgn->next_nested)
926 unvisit_body (cgn->decl);
929 /* Unconditionally make an unshared copy of EXPR. This is used when using
930 stored expressions which span multiple functions, such as BINFO_VTABLE,
931 as the normal unsharing process can't tell that they're shared. */
933 tree
934 unshare_expr (tree expr)
936 walk_tree (&expr, mostly_copy_tree_r, NULL, NULL);
937 return expr;
940 /* Worker for unshare_expr_without_location. */
942 static tree
943 prune_expr_location (tree *tp, int *walk_subtrees, void *)
945 if (EXPR_P (*tp))
946 SET_EXPR_LOCATION (*tp, UNKNOWN_LOCATION);
947 else
948 *walk_subtrees = 0;
949 return NULL_TREE;
952 /* Similar to unshare_expr but also prune all expression locations
953 from EXPR. */
955 tree
956 unshare_expr_without_location (tree expr)
958 walk_tree (&expr, mostly_copy_tree_r, NULL, NULL);
959 if (EXPR_P (expr))
960 walk_tree (&expr, prune_expr_location, NULL, NULL);
961 return expr;
964 /* WRAPPER is a code such as BIND_EXPR or CLEANUP_POINT_EXPR which can both
965 contain statements and have a value. Assign its value to a temporary
966 and give it void_type_node. Return the temporary, or NULL_TREE if
967 WRAPPER was already void. */
969 tree
970 voidify_wrapper_expr (tree wrapper, tree temp)
972 tree type = TREE_TYPE (wrapper);
973 if (type && !VOID_TYPE_P (type))
975 tree *p;
977 /* Set p to point to the body of the wrapper. Loop until we find
978 something that isn't a wrapper. */
979 for (p = &wrapper; p && *p; )
981 switch (TREE_CODE (*p))
983 case BIND_EXPR:
984 TREE_SIDE_EFFECTS (*p) = 1;
985 TREE_TYPE (*p) = void_type_node;
986 /* For a BIND_EXPR, the body is operand 1. */
987 p = &BIND_EXPR_BODY (*p);
988 break;
990 case CLEANUP_POINT_EXPR:
991 case TRY_FINALLY_EXPR:
992 case TRY_CATCH_EXPR:
993 TREE_SIDE_EFFECTS (*p) = 1;
994 TREE_TYPE (*p) = void_type_node;
995 p = &TREE_OPERAND (*p, 0);
996 break;
998 case STATEMENT_LIST:
1000 tree_stmt_iterator i = tsi_last (*p);
1001 TREE_SIDE_EFFECTS (*p) = 1;
1002 TREE_TYPE (*p) = void_type_node;
1003 p = tsi_end_p (i) ? NULL : tsi_stmt_ptr (i);
1005 break;
1007 case COMPOUND_EXPR:
1008 /* Advance to the last statement. Set all container types to
1009 void. */
1010 for (; TREE_CODE (*p) == COMPOUND_EXPR; p = &TREE_OPERAND (*p, 1))
1012 TREE_SIDE_EFFECTS (*p) = 1;
1013 TREE_TYPE (*p) = void_type_node;
1015 break;
1017 case TRANSACTION_EXPR:
1018 TREE_SIDE_EFFECTS (*p) = 1;
1019 TREE_TYPE (*p) = void_type_node;
1020 p = &TRANSACTION_EXPR_BODY (*p);
1021 break;
1023 default:
1024 /* Assume that any tree upon which voidify_wrapper_expr is
1025 directly called is a wrapper, and that its body is op0. */
1026 if (p == &wrapper)
1028 TREE_SIDE_EFFECTS (*p) = 1;
1029 TREE_TYPE (*p) = void_type_node;
1030 p = &TREE_OPERAND (*p, 0);
1031 break;
1033 goto out;
1037 out:
1038 if (p == NULL || IS_EMPTY_STMT (*p))
1039 temp = NULL_TREE;
1040 else if (temp)
1042 /* The wrapper is on the RHS of an assignment that we're pushing
1043 down. */
1044 gcc_assert (TREE_CODE (temp) == INIT_EXPR
1045 || TREE_CODE (temp) == MODIFY_EXPR);
1046 TREE_OPERAND (temp, 1) = *p;
1047 *p = temp;
1049 else
1051 temp = create_tmp_var (type, "retval");
1052 *p = build2 (INIT_EXPR, type, temp, *p);
1055 return temp;
1058 return NULL_TREE;
1061 /* Prepare calls to builtins to SAVE and RESTORE the stack as well as
1062 a temporary through which they communicate. */
1064 static void
1065 build_stack_save_restore (gcall **save, gcall **restore)
1067 tree tmp_var;
1069 *save = gimple_build_call (builtin_decl_implicit (BUILT_IN_STACK_SAVE), 0);
1070 tmp_var = create_tmp_var (ptr_type_node, "saved_stack");
1071 gimple_call_set_lhs (*save, tmp_var);
1073 *restore
1074 = gimple_build_call (builtin_decl_implicit (BUILT_IN_STACK_RESTORE),
1075 1, tmp_var);
1078 /* Gimplify a BIND_EXPR. Just voidify and recurse. */
1080 static enum gimplify_status
1081 gimplify_bind_expr (tree *expr_p, gimple_seq *pre_p)
1083 tree bind_expr = *expr_p;
1084 bool old_keep_stack = gimplify_ctxp->keep_stack;
1085 bool old_save_stack = gimplify_ctxp->save_stack;
1086 tree t;
1087 gbind *bind_stmt;
1088 gimple_seq body, cleanup;
1089 gcall *stack_save;
1090 location_t start_locus = 0, end_locus = 0;
1091 tree ret_clauses = NULL;
1093 tree temp = voidify_wrapper_expr (bind_expr, NULL);
1095 /* Mark variables seen in this bind expr. */
1096 for (t = BIND_EXPR_VARS (bind_expr); t ; t = DECL_CHAIN (t))
1098 if (TREE_CODE (t) == VAR_DECL)
1100 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
1102 /* Mark variable as local. */
1103 if (ctx && ctx->region_type != ORT_NONE && !DECL_EXTERNAL (t)
1104 && (! DECL_SEEN_IN_BIND_EXPR_P (t)
1105 || splay_tree_lookup (ctx->variables,
1106 (splay_tree_key) t) == NULL))
1108 if (ctx->region_type == ORT_SIMD
1109 && TREE_ADDRESSABLE (t)
1110 && !TREE_STATIC (t))
1111 omp_add_variable (ctx, t, GOVD_PRIVATE | GOVD_SEEN);
1112 else
1113 omp_add_variable (ctx, t, GOVD_LOCAL | GOVD_SEEN);
1116 DECL_SEEN_IN_BIND_EXPR_P (t) = 1;
1118 if (DECL_HARD_REGISTER (t) && !is_global_var (t) && cfun)
1119 cfun->has_local_explicit_reg_vars = true;
1122 /* Preliminarily mark non-addressed complex variables as eligible
1123 for promotion to gimple registers. We'll transform their uses
1124 as we find them. */
1125 if ((TREE_CODE (TREE_TYPE (t)) == COMPLEX_TYPE
1126 || TREE_CODE (TREE_TYPE (t)) == VECTOR_TYPE)
1127 && !TREE_THIS_VOLATILE (t)
1128 && (TREE_CODE (t) == VAR_DECL && !DECL_HARD_REGISTER (t))
1129 && !needs_to_live_in_memory (t))
1130 DECL_GIMPLE_REG_P (t) = 1;
1133 bind_stmt = gimple_build_bind (BIND_EXPR_VARS (bind_expr), NULL,
1134 BIND_EXPR_BLOCK (bind_expr));
1135 gimple_push_bind_expr (bind_stmt);
1137 gimplify_ctxp->keep_stack = false;
1138 gimplify_ctxp->save_stack = false;
1140 /* Gimplify the body into the GIMPLE_BIND tuple's body. */
1141 body = NULL;
1142 gimplify_stmt (&BIND_EXPR_BODY (bind_expr), &body);
1143 gimple_bind_set_body (bind_stmt, body);
1145 /* Source location wise, the cleanup code (stack_restore and clobbers)
1146 belongs to the end of the block, so propagate what we have. The
1147 stack_save operation belongs to the beginning of block, which we can
1148 infer from the bind_expr directly if the block has no explicit
1149 assignment. */
1150 if (BIND_EXPR_BLOCK (bind_expr))
1152 end_locus = BLOCK_SOURCE_END_LOCATION (BIND_EXPR_BLOCK (bind_expr));
1153 start_locus = BLOCK_SOURCE_LOCATION (BIND_EXPR_BLOCK (bind_expr));
1155 if (start_locus == 0)
1156 start_locus = EXPR_LOCATION (bind_expr);
1158 cleanup = NULL;
1159 stack_save = NULL;
1161 /* If the code both contains VLAs and calls alloca, then we cannot reclaim
1162 the stack space allocated to the VLAs. */
1163 if (gimplify_ctxp->save_stack && !gimplify_ctxp->keep_stack)
1165 gcall *stack_restore;
1167 /* Save stack on entry and restore it on exit. Add a try_finally
1168 block to achieve this. */
1169 build_stack_save_restore (&stack_save, &stack_restore);
1171 gimple_set_location (stack_save, start_locus);
1172 gimple_set_location (stack_restore, end_locus);
1174 gimplify_seq_add_stmt (&cleanup, stack_restore);
1177 /* Add clobbers for all variables that go out of scope. */
1178 for (t = BIND_EXPR_VARS (bind_expr); t ; t = DECL_CHAIN (t))
1180 if (TREE_CODE (t) == VAR_DECL
1181 && !is_global_var (t)
1182 && DECL_CONTEXT (t) == current_function_decl
1183 && !DECL_HARD_REGISTER (t)
1184 && !TREE_THIS_VOLATILE (t)
1185 && !DECL_HAS_VALUE_EXPR_P (t)
1186 /* Only care for variables that have to be in memory. Others
1187 will be rewritten into SSA names, hence moved to the top-level. */
1188 && !is_gimple_reg (t)
1189 && flag_stack_reuse != SR_NONE)
1191 tree clobber = build_constructor (TREE_TYPE (t), NULL);
1192 gimple *clobber_stmt;
1193 TREE_THIS_VOLATILE (clobber) = 1;
1194 clobber_stmt = gimple_build_assign (t, clobber);
1195 gimple_set_location (clobber_stmt, end_locus);
1196 gimplify_seq_add_stmt (&cleanup, clobber_stmt);
1198 if (flag_openacc && oacc_declare_returns != NULL)
1200 tree *c = oacc_declare_returns->get (t);
1201 if (c != NULL)
1203 if (ret_clauses)
1204 OMP_CLAUSE_CHAIN (*c) = ret_clauses;
1206 ret_clauses = *c;
1208 oacc_declare_returns->remove (t);
1210 if (oacc_declare_returns->elements () == 0)
1212 delete oacc_declare_returns;
1213 oacc_declare_returns = NULL;
1220 if (ret_clauses)
1222 gomp_target *stmt;
1223 gimple_stmt_iterator si = gsi_start (cleanup);
1225 stmt = gimple_build_omp_target (NULL, GF_OMP_TARGET_KIND_OACC_DECLARE,
1226 ret_clauses);
1227 gsi_insert_seq_before_without_update (&si, stmt, GSI_NEW_STMT);
1230 if (cleanup)
1232 gtry *gs;
1233 gimple_seq new_body;
1235 new_body = NULL;
1236 gs = gimple_build_try (gimple_bind_body (bind_stmt), cleanup,
1237 GIMPLE_TRY_FINALLY);
1239 if (stack_save)
1240 gimplify_seq_add_stmt (&new_body, stack_save);
1241 gimplify_seq_add_stmt (&new_body, gs);
1242 gimple_bind_set_body (bind_stmt, new_body);
1245 /* keep_stack propagates all the way up to the outermost BIND_EXPR. */
1246 if (!gimplify_ctxp->keep_stack)
1247 gimplify_ctxp->keep_stack = old_keep_stack;
1248 gimplify_ctxp->save_stack = old_save_stack;
1250 gimple_pop_bind_expr ();
1252 gimplify_seq_add_stmt (pre_p, bind_stmt);
1254 if (temp)
1256 *expr_p = temp;
1257 return GS_OK;
1260 *expr_p = NULL_TREE;
1261 return GS_ALL_DONE;
1264 /* Gimplify a RETURN_EXPR. If the expression to be returned is not a
1265 GIMPLE value, it is assigned to a new temporary and the statement is
1266 re-written to return the temporary.
1268 PRE_P points to the sequence where side effects that must happen before
1269 STMT should be stored. */
1271 static enum gimplify_status
1272 gimplify_return_expr (tree stmt, gimple_seq *pre_p)
1274 greturn *ret;
1275 tree ret_expr = TREE_OPERAND (stmt, 0);
1276 tree result_decl, result;
1278 if (ret_expr == error_mark_node)
1279 return GS_ERROR;
1281 /* Implicit _Cilk_sync must be inserted right before any return statement
1282 if there is a _Cilk_spawn in the function. If the user has provided a
1283 _Cilk_sync, the optimizer should remove this duplicate one. */
1284 if (fn_contains_cilk_spawn_p (cfun))
1286 tree impl_sync = build0 (CILK_SYNC_STMT, void_type_node);
1287 gimplify_and_add (impl_sync, pre_p);
1290 if (!ret_expr
1291 || TREE_CODE (ret_expr) == RESULT_DECL
1292 || ret_expr == error_mark_node)
1294 greturn *ret = gimple_build_return (ret_expr);
1295 gimple_set_no_warning (ret, TREE_NO_WARNING (stmt));
1296 gimplify_seq_add_stmt (pre_p, ret);
1297 return GS_ALL_DONE;
1300 if (VOID_TYPE_P (TREE_TYPE (TREE_TYPE (current_function_decl))))
1301 result_decl = NULL_TREE;
1302 else
1304 result_decl = TREE_OPERAND (ret_expr, 0);
1306 /* See through a return by reference. */
1307 if (TREE_CODE (result_decl) == INDIRECT_REF)
1308 result_decl = TREE_OPERAND (result_decl, 0);
1310 gcc_assert ((TREE_CODE (ret_expr) == MODIFY_EXPR
1311 || TREE_CODE (ret_expr) == INIT_EXPR)
1312 && TREE_CODE (result_decl) == RESULT_DECL);
1315 /* If aggregate_value_p is true, then we can return the bare RESULT_DECL.
1316 Recall that aggregate_value_p is FALSE for any aggregate type that is
1317 returned in registers. If we're returning values in registers, then
1318 we don't want to extend the lifetime of the RESULT_DECL, particularly
1319 across another call. In addition, for those aggregates for which
1320 hard_function_value generates a PARALLEL, we'll die during normal
1321 expansion of structure assignments; there's special code in expand_return
1322 to handle this case that does not exist in expand_expr. */
1323 if (!result_decl)
1324 result = NULL_TREE;
1325 else if (aggregate_value_p (result_decl, TREE_TYPE (current_function_decl)))
1327 if (TREE_CODE (DECL_SIZE (result_decl)) != INTEGER_CST)
1329 if (!TYPE_SIZES_GIMPLIFIED (TREE_TYPE (result_decl)))
1330 gimplify_type_sizes (TREE_TYPE (result_decl), pre_p);
1331 /* Note that we don't use gimplify_vla_decl because the RESULT_DECL
1332 should be effectively allocated by the caller, i.e. all calls to
1333 this function must be subject to the Return Slot Optimization. */
1334 gimplify_one_sizepos (&DECL_SIZE (result_decl), pre_p);
1335 gimplify_one_sizepos (&DECL_SIZE_UNIT (result_decl), pre_p);
1337 result = result_decl;
1339 else if (gimplify_ctxp->return_temp)
1340 result = gimplify_ctxp->return_temp;
1341 else
1343 result = create_tmp_reg (TREE_TYPE (result_decl));
1345 /* ??? With complex control flow (usually involving abnormal edges),
1346 we can wind up warning about an uninitialized value for this. Due
1347 to how this variable is constructed and initialized, this is never
1348 true. Give up and never warn. */
1349 TREE_NO_WARNING (result) = 1;
1351 gimplify_ctxp->return_temp = result;
1354 /* Smash the lhs of the MODIFY_EXPR to the temporary we plan to use.
1355 Then gimplify the whole thing. */
1356 if (result != result_decl)
1357 TREE_OPERAND (ret_expr, 0) = result;
1359 gimplify_and_add (TREE_OPERAND (stmt, 0), pre_p);
1361 ret = gimple_build_return (result);
1362 gimple_set_no_warning (ret, TREE_NO_WARNING (stmt));
1363 gimplify_seq_add_stmt (pre_p, ret);
1365 return GS_ALL_DONE;
1368 /* Gimplify a variable-length array DECL. */
1370 static void
1371 gimplify_vla_decl (tree decl, gimple_seq *seq_p)
1373 /* This is a variable-sized decl. Simplify its size and mark it
1374 for deferred expansion. */
1375 tree t, addr, ptr_type;
1377 gimplify_one_sizepos (&DECL_SIZE (decl), seq_p);
1378 gimplify_one_sizepos (&DECL_SIZE_UNIT (decl), seq_p);
1380 /* Don't mess with a DECL_VALUE_EXPR set by the front-end. */
1381 if (DECL_HAS_VALUE_EXPR_P (decl))
1382 return;
1384 /* All occurrences of this decl in final gimplified code will be
1385 replaced by indirection. Setting DECL_VALUE_EXPR does two
1386 things: First, it lets the rest of the gimplifier know what
1387 replacement to use. Second, it lets the debug info know
1388 where to find the value. */
1389 ptr_type = build_pointer_type (TREE_TYPE (decl));
1390 addr = create_tmp_var (ptr_type, get_name (decl));
1391 DECL_IGNORED_P (addr) = 0;
1392 t = build_fold_indirect_ref (addr);
1393 TREE_THIS_NOTRAP (t) = 1;
1394 SET_DECL_VALUE_EXPR (decl, t);
1395 DECL_HAS_VALUE_EXPR_P (decl) = 1;
1397 t = builtin_decl_explicit (BUILT_IN_ALLOCA_WITH_ALIGN);
1398 t = build_call_expr (t, 2, DECL_SIZE_UNIT (decl),
1399 size_int (DECL_ALIGN (decl)));
1400 /* The call has been built for a variable-sized object. */
1401 CALL_ALLOCA_FOR_VAR_P (t) = 1;
1402 t = fold_convert (ptr_type, t);
1403 t = build2 (MODIFY_EXPR, TREE_TYPE (addr), addr, t);
1405 gimplify_and_add (t, seq_p);
1408 /* A helper function to be called via walk_tree. Mark all labels under *TP
1409 as being forced. To be called for DECL_INITIAL of static variables. */
1411 static tree
1412 force_labels_r (tree *tp, int *walk_subtrees, void *data ATTRIBUTE_UNUSED)
1414 if (TYPE_P (*tp))
1415 *walk_subtrees = 0;
1416 if (TREE_CODE (*tp) == LABEL_DECL)
1418 FORCED_LABEL (*tp) = 1;
1419 cfun->has_forced_label_in_static = 1;
1422 return NULL_TREE;
1425 /* Gimplify a DECL_EXPR node *STMT_P by making any necessary allocation
1426 and initialization explicit. */
1428 static enum gimplify_status
1429 gimplify_decl_expr (tree *stmt_p, gimple_seq *seq_p)
1431 tree stmt = *stmt_p;
1432 tree decl = DECL_EXPR_DECL (stmt);
1434 *stmt_p = NULL_TREE;
1436 if (TREE_TYPE (decl) == error_mark_node)
1437 return GS_ERROR;
1439 if ((TREE_CODE (decl) == TYPE_DECL
1440 || TREE_CODE (decl) == VAR_DECL)
1441 && !TYPE_SIZES_GIMPLIFIED (TREE_TYPE (decl)))
1443 gimplify_type_sizes (TREE_TYPE (decl), seq_p);
1444 if (TREE_CODE (TREE_TYPE (decl)) == REFERENCE_TYPE)
1445 gimplify_type_sizes (TREE_TYPE (TREE_TYPE (decl)), seq_p);
1448 /* ??? DECL_ORIGINAL_TYPE is streamed for LTO so it needs to be gimplified
1449 in case its size expressions contain problematic nodes like CALL_EXPR. */
1450 if (TREE_CODE (decl) == TYPE_DECL
1451 && DECL_ORIGINAL_TYPE (decl)
1452 && !TYPE_SIZES_GIMPLIFIED (DECL_ORIGINAL_TYPE (decl)))
1454 gimplify_type_sizes (DECL_ORIGINAL_TYPE (decl), seq_p);
1455 if (TREE_CODE (DECL_ORIGINAL_TYPE (decl)) == REFERENCE_TYPE)
1456 gimplify_type_sizes (TREE_TYPE (DECL_ORIGINAL_TYPE (decl)), seq_p);
1459 if (TREE_CODE (decl) == VAR_DECL && !DECL_EXTERNAL (decl))
1461 tree init = DECL_INITIAL (decl);
1463 if (TREE_CODE (DECL_SIZE_UNIT (decl)) != INTEGER_CST
1464 || (!TREE_STATIC (decl)
1465 && flag_stack_check == GENERIC_STACK_CHECK
1466 && compare_tree_int (DECL_SIZE_UNIT (decl),
1467 STACK_CHECK_MAX_VAR_SIZE) > 0))
1468 gimplify_vla_decl (decl, seq_p);
1470 /* Some front ends do not explicitly declare all anonymous
1471 artificial variables. We compensate here by declaring the
1472 variables, though it would be better if the front ends would
1473 explicitly declare them. */
1474 if (!DECL_SEEN_IN_BIND_EXPR_P (decl)
1475 && DECL_ARTIFICIAL (decl) && DECL_NAME (decl) == NULL_TREE)
1476 gimple_add_tmp_var (decl);
1478 if (init && init != error_mark_node)
1480 if (!TREE_STATIC (decl))
1482 DECL_INITIAL (decl) = NULL_TREE;
1483 init = build2 (INIT_EXPR, void_type_node, decl, init);
1484 gimplify_and_add (init, seq_p);
1485 ggc_free (init);
1487 else
1488 /* We must still examine initializers for static variables
1489 as they may contain a label address. */
1490 walk_tree (&init, force_labels_r, NULL, NULL);
1494 return GS_ALL_DONE;
1497 /* Gimplify a LOOP_EXPR. Normally this just involves gimplifying the body
1498 and replacing the LOOP_EXPR with goto, but if the loop contains an
1499 EXIT_EXPR, we need to append a label for it to jump to. */
1501 static enum gimplify_status
1502 gimplify_loop_expr (tree *expr_p, gimple_seq *pre_p)
1504 tree saved_label = gimplify_ctxp->exit_label;
1505 tree start_label = create_artificial_label (UNKNOWN_LOCATION);
1507 gimplify_seq_add_stmt (pre_p, gimple_build_label (start_label));
1509 gimplify_ctxp->exit_label = NULL_TREE;
1511 gimplify_and_add (LOOP_EXPR_BODY (*expr_p), pre_p);
1513 gimplify_seq_add_stmt (pre_p, gimple_build_goto (start_label));
1515 if (gimplify_ctxp->exit_label)
1516 gimplify_seq_add_stmt (pre_p,
1517 gimple_build_label (gimplify_ctxp->exit_label));
1519 gimplify_ctxp->exit_label = saved_label;
1521 *expr_p = NULL;
1522 return GS_ALL_DONE;
1525 /* Gimplify a statement list onto a sequence. These may be created either
1526 by an enlightened front-end, or by shortcut_cond_expr. */
1528 static enum gimplify_status
1529 gimplify_statement_list (tree *expr_p, gimple_seq *pre_p)
1531 tree temp = voidify_wrapper_expr (*expr_p, NULL);
1533 tree_stmt_iterator i = tsi_start (*expr_p);
1535 while (!tsi_end_p (i))
1537 gimplify_stmt (tsi_stmt_ptr (i), pre_p);
1538 tsi_delink (&i);
1541 if (temp)
1543 *expr_p = temp;
1544 return GS_OK;
1547 return GS_ALL_DONE;
1551 /* Gimplify a SWITCH_EXPR, and collect the vector of labels it can
1552 branch to. */
1554 static enum gimplify_status
1555 gimplify_switch_expr (tree *expr_p, gimple_seq *pre_p)
1557 tree switch_expr = *expr_p;
1558 gimple_seq switch_body_seq = NULL;
1559 enum gimplify_status ret;
1560 tree index_type = TREE_TYPE (switch_expr);
1561 if (index_type == NULL_TREE)
1562 index_type = TREE_TYPE (SWITCH_COND (switch_expr));
1564 ret = gimplify_expr (&SWITCH_COND (switch_expr), pre_p, NULL, is_gimple_val,
1565 fb_rvalue);
1566 if (ret == GS_ERROR || ret == GS_UNHANDLED)
1567 return ret;
1569 if (SWITCH_BODY (switch_expr))
1571 vec<tree> labels;
1572 vec<tree> saved_labels;
1573 tree default_case = NULL_TREE;
1574 gswitch *switch_stmt;
1576 /* If someone can be bothered to fill in the labels, they can
1577 be bothered to null out the body too. */
1578 gcc_assert (!SWITCH_LABELS (switch_expr));
1580 /* Save old labels, get new ones from body, then restore the old
1581 labels. Save all the things from the switch body to append after. */
1582 saved_labels = gimplify_ctxp->case_labels;
1583 gimplify_ctxp->case_labels.create (8);
1585 gimplify_stmt (&SWITCH_BODY (switch_expr), &switch_body_seq);
1586 labels = gimplify_ctxp->case_labels;
1587 gimplify_ctxp->case_labels = saved_labels;
1589 preprocess_case_label_vec_for_gimple (labels, index_type,
1590 &default_case);
1592 if (!default_case)
1594 glabel *new_default;
1596 default_case
1597 = build_case_label (NULL_TREE, NULL_TREE,
1598 create_artificial_label (UNKNOWN_LOCATION));
1599 new_default = gimple_build_label (CASE_LABEL (default_case));
1600 gimplify_seq_add_stmt (&switch_body_seq, new_default);
1603 switch_stmt = gimple_build_switch (SWITCH_COND (switch_expr),
1604 default_case, labels);
1605 gimplify_seq_add_stmt (pre_p, switch_stmt);
1606 gimplify_seq_add_seq (pre_p, switch_body_seq);
1607 labels.release ();
1609 else
1610 gcc_assert (SWITCH_LABELS (switch_expr));
1612 return GS_ALL_DONE;
1615 /* Gimplify the CASE_LABEL_EXPR pointed to by EXPR_P. */
1617 static enum gimplify_status
1618 gimplify_case_label_expr (tree *expr_p, gimple_seq *pre_p)
1620 struct gimplify_ctx *ctxp;
1621 glabel *label_stmt;
1623 /* Invalid programs can play Duff's Device type games with, for example,
1624 #pragma omp parallel. At least in the C front end, we don't
1625 detect such invalid branches until after gimplification, in the
1626 diagnose_omp_blocks pass. */
1627 for (ctxp = gimplify_ctxp; ; ctxp = ctxp->prev_context)
1628 if (ctxp->case_labels.exists ())
1629 break;
1631 label_stmt = gimple_build_label (CASE_LABEL (*expr_p));
1632 ctxp->case_labels.safe_push (*expr_p);
1633 gimplify_seq_add_stmt (pre_p, label_stmt);
1635 return GS_ALL_DONE;
1638 /* Build a GOTO to the LABEL_DECL pointed to by LABEL_P, building it first
1639 if necessary. */
1641 tree
1642 build_and_jump (tree *label_p)
1644 if (label_p == NULL)
1645 /* If there's nowhere to jump, just fall through. */
1646 return NULL_TREE;
1648 if (*label_p == NULL_TREE)
1650 tree label = create_artificial_label (UNKNOWN_LOCATION);
1651 *label_p = label;
1654 return build1 (GOTO_EXPR, void_type_node, *label_p);
1657 /* Gimplify an EXIT_EXPR by converting to a GOTO_EXPR inside a COND_EXPR.
1658 This also involves building a label to jump to and communicating it to
1659 gimplify_loop_expr through gimplify_ctxp->exit_label. */
1661 static enum gimplify_status
1662 gimplify_exit_expr (tree *expr_p)
1664 tree cond = TREE_OPERAND (*expr_p, 0);
1665 tree expr;
1667 expr = build_and_jump (&gimplify_ctxp->exit_label);
1668 expr = build3 (COND_EXPR, void_type_node, cond, expr, NULL_TREE);
1669 *expr_p = expr;
1671 return GS_OK;
1674 /* *EXPR_P is a COMPONENT_REF being used as an rvalue. If its type is
1675 different from its canonical type, wrap the whole thing inside a
1676 NOP_EXPR and force the type of the COMPONENT_REF to be the canonical
1677 type.
1679 The canonical type of a COMPONENT_REF is the type of the field being
1680 referenced--unless the field is a bit-field which can be read directly
1681 in a smaller mode, in which case the canonical type is the
1682 sign-appropriate type corresponding to that mode. */
1684 static void
1685 canonicalize_component_ref (tree *expr_p)
1687 tree expr = *expr_p;
1688 tree type;
1690 gcc_assert (TREE_CODE (expr) == COMPONENT_REF);
1692 if (INTEGRAL_TYPE_P (TREE_TYPE (expr)))
1693 type = TREE_TYPE (get_unwidened (expr, NULL_TREE));
1694 else
1695 type = TREE_TYPE (TREE_OPERAND (expr, 1));
1697 /* One could argue that all the stuff below is not necessary for
1698 the non-bitfield case and declare it a FE error if type
1699 adjustment would be needed. */
1700 if (TREE_TYPE (expr) != type)
1702 #ifdef ENABLE_TYPES_CHECKING
1703 tree old_type = TREE_TYPE (expr);
1704 #endif
1705 int type_quals;
1707 /* We need to preserve qualifiers and propagate them from
1708 operand 0. */
1709 type_quals = TYPE_QUALS (type)
1710 | TYPE_QUALS (TREE_TYPE (TREE_OPERAND (expr, 0)));
1711 if (TYPE_QUALS (type) != type_quals)
1712 type = build_qualified_type (TYPE_MAIN_VARIANT (type), type_quals);
1714 /* Set the type of the COMPONENT_REF to the underlying type. */
1715 TREE_TYPE (expr) = type;
1717 #ifdef ENABLE_TYPES_CHECKING
1718 /* It is now a FE error, if the conversion from the canonical
1719 type to the original expression type is not useless. */
1720 gcc_assert (useless_type_conversion_p (old_type, type));
1721 #endif
1725 /* If a NOP conversion is changing a pointer to array of foo to a pointer
1726 to foo, embed that change in the ADDR_EXPR by converting
1727 T array[U];
1728 (T *)&array
1730 &array[L]
1731 where L is the lower bound. For simplicity, only do this for constant
1732 lower bound.
1733 The constraint is that the type of &array[L] is trivially convertible
1734 to T *. */
1736 static void
1737 canonicalize_addr_expr (tree *expr_p)
1739 tree expr = *expr_p;
1740 tree addr_expr = TREE_OPERAND (expr, 0);
1741 tree datype, ddatype, pddatype;
1743 /* We simplify only conversions from an ADDR_EXPR to a pointer type. */
1744 if (!POINTER_TYPE_P (TREE_TYPE (expr))
1745 || TREE_CODE (addr_expr) != ADDR_EXPR)
1746 return;
1748 /* The addr_expr type should be a pointer to an array. */
1749 datype = TREE_TYPE (TREE_TYPE (addr_expr));
1750 if (TREE_CODE (datype) != ARRAY_TYPE)
1751 return;
1753 /* The pointer to element type shall be trivially convertible to
1754 the expression pointer type. */
1755 ddatype = TREE_TYPE (datype);
1756 pddatype = build_pointer_type (ddatype);
1757 if (!useless_type_conversion_p (TYPE_MAIN_VARIANT (TREE_TYPE (expr)),
1758 pddatype))
1759 return;
1761 /* The lower bound and element sizes must be constant. */
1762 if (!TYPE_SIZE_UNIT (ddatype)
1763 || TREE_CODE (TYPE_SIZE_UNIT (ddatype)) != INTEGER_CST
1764 || !TYPE_DOMAIN (datype) || !TYPE_MIN_VALUE (TYPE_DOMAIN (datype))
1765 || TREE_CODE (TYPE_MIN_VALUE (TYPE_DOMAIN (datype))) != INTEGER_CST)
1766 return;
1768 /* All checks succeeded. Build a new node to merge the cast. */
1769 *expr_p = build4 (ARRAY_REF, ddatype, TREE_OPERAND (addr_expr, 0),
1770 TYPE_MIN_VALUE (TYPE_DOMAIN (datype)),
1771 NULL_TREE, NULL_TREE);
1772 *expr_p = build1 (ADDR_EXPR, pddatype, *expr_p);
1774 /* We can have stripped a required restrict qualifier above. */
1775 if (!useless_type_conversion_p (TREE_TYPE (expr), TREE_TYPE (*expr_p)))
1776 *expr_p = fold_convert (TREE_TYPE (expr), *expr_p);
1779 /* *EXPR_P is a NOP_EXPR or CONVERT_EXPR. Remove it and/or other conversions
1780 underneath as appropriate. */
1782 static enum gimplify_status
1783 gimplify_conversion (tree *expr_p)
1785 location_t loc = EXPR_LOCATION (*expr_p);
1786 gcc_assert (CONVERT_EXPR_P (*expr_p));
1788 /* Then strip away all but the outermost conversion. */
1789 STRIP_SIGN_NOPS (TREE_OPERAND (*expr_p, 0));
1791 /* And remove the outermost conversion if it's useless. */
1792 if (tree_ssa_useless_type_conversion (*expr_p))
1793 *expr_p = TREE_OPERAND (*expr_p, 0);
1795 /* If we still have a conversion at the toplevel,
1796 then canonicalize some constructs. */
1797 if (CONVERT_EXPR_P (*expr_p))
1799 tree sub = TREE_OPERAND (*expr_p, 0);
1801 /* If a NOP conversion is changing the type of a COMPONENT_REF
1802 expression, then canonicalize its type now in order to expose more
1803 redundant conversions. */
1804 if (TREE_CODE (sub) == COMPONENT_REF)
1805 canonicalize_component_ref (&TREE_OPERAND (*expr_p, 0));
1807 /* If a NOP conversion is changing a pointer to array of foo
1808 to a pointer to foo, embed that change in the ADDR_EXPR. */
1809 else if (TREE_CODE (sub) == ADDR_EXPR)
1810 canonicalize_addr_expr (expr_p);
1813 /* If we have a conversion to a non-register type force the
1814 use of a VIEW_CONVERT_EXPR instead. */
1815 if (CONVERT_EXPR_P (*expr_p) && !is_gimple_reg_type (TREE_TYPE (*expr_p)))
1816 *expr_p = fold_build1_loc (loc, VIEW_CONVERT_EXPR, TREE_TYPE (*expr_p),
1817 TREE_OPERAND (*expr_p, 0));
1819 /* Canonicalize CONVERT_EXPR to NOP_EXPR. */
1820 if (TREE_CODE (*expr_p) == CONVERT_EXPR)
1821 TREE_SET_CODE (*expr_p, NOP_EXPR);
1823 return GS_OK;
1826 /* Nonlocal VLAs seen in the current function. */
1827 static hash_set<tree> *nonlocal_vlas;
1829 /* The VAR_DECLs created for nonlocal VLAs for debug info purposes. */
1830 static tree nonlocal_vla_vars;
1832 /* Gimplify a VAR_DECL or PARM_DECL. Return GS_OK if we expanded a
1833 DECL_VALUE_EXPR, and it's worth re-examining things. */
1835 static enum gimplify_status
1836 gimplify_var_or_parm_decl (tree *expr_p)
1838 tree decl = *expr_p;
1840 /* ??? If this is a local variable, and it has not been seen in any
1841 outer BIND_EXPR, then it's probably the result of a duplicate
1842 declaration, for which we've already issued an error. It would
1843 be really nice if the front end wouldn't leak these at all.
1844 Currently the only known culprit is C++ destructors, as seen
1845 in g++.old-deja/g++.jason/binding.C. */
1846 if (TREE_CODE (decl) == VAR_DECL
1847 && !DECL_SEEN_IN_BIND_EXPR_P (decl)
1848 && !TREE_STATIC (decl) && !DECL_EXTERNAL (decl)
1849 && decl_function_context (decl) == current_function_decl)
1851 gcc_assert (seen_error ());
1852 return GS_ERROR;
1855 /* When within an OMP context, notice uses of variables. */
1856 if (gimplify_omp_ctxp && omp_notice_variable (gimplify_omp_ctxp, decl, true))
1857 return GS_ALL_DONE;
1859 /* If the decl is an alias for another expression, substitute it now. */
1860 if (DECL_HAS_VALUE_EXPR_P (decl))
1862 tree value_expr = DECL_VALUE_EXPR (decl);
1864 /* For referenced nonlocal VLAs add a decl for debugging purposes
1865 to the current function. */
1866 if (TREE_CODE (decl) == VAR_DECL
1867 && TREE_CODE (DECL_SIZE_UNIT (decl)) != INTEGER_CST
1868 && nonlocal_vlas != NULL
1869 && TREE_CODE (value_expr) == INDIRECT_REF
1870 && TREE_CODE (TREE_OPERAND (value_expr, 0)) == VAR_DECL
1871 && decl_function_context (decl) != current_function_decl)
1873 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
1874 while (ctx
1875 && (ctx->region_type == ORT_WORKSHARE
1876 || ctx->region_type == ORT_SIMD
1877 || ctx->region_type == ORT_ACC))
1878 ctx = ctx->outer_context;
1879 if (!ctx && !nonlocal_vlas->add (decl))
1881 tree copy = copy_node (decl);
1883 lang_hooks.dup_lang_specific_decl (copy);
1884 SET_DECL_RTL (copy, 0);
1885 TREE_USED (copy) = 1;
1886 DECL_CHAIN (copy) = nonlocal_vla_vars;
1887 nonlocal_vla_vars = copy;
1888 SET_DECL_VALUE_EXPR (copy, unshare_expr (value_expr));
1889 DECL_HAS_VALUE_EXPR_P (copy) = 1;
1893 *expr_p = unshare_expr (value_expr);
1894 return GS_OK;
1897 return GS_ALL_DONE;
1900 /* Recalculate the value of the TREE_SIDE_EFFECTS flag for T. */
1902 static void
1903 recalculate_side_effects (tree t)
1905 enum tree_code code = TREE_CODE (t);
1906 int len = TREE_OPERAND_LENGTH (t);
1907 int i;
1909 switch (TREE_CODE_CLASS (code))
1911 case tcc_expression:
1912 switch (code)
1914 case INIT_EXPR:
1915 case MODIFY_EXPR:
1916 case VA_ARG_EXPR:
1917 case PREDECREMENT_EXPR:
1918 case PREINCREMENT_EXPR:
1919 case POSTDECREMENT_EXPR:
1920 case POSTINCREMENT_EXPR:
1921 /* All of these have side-effects, no matter what their
1922 operands are. */
1923 return;
1925 default:
1926 break;
1928 /* Fall through. */
1930 case tcc_comparison: /* a comparison expression */
1931 case tcc_unary: /* a unary arithmetic expression */
1932 case tcc_binary: /* a binary arithmetic expression */
1933 case tcc_reference: /* a reference */
1934 case tcc_vl_exp: /* a function call */
1935 TREE_SIDE_EFFECTS (t) = TREE_THIS_VOLATILE (t);
1936 for (i = 0; i < len; ++i)
1938 tree op = TREE_OPERAND (t, i);
1939 if (op && TREE_SIDE_EFFECTS (op))
1940 TREE_SIDE_EFFECTS (t) = 1;
1942 break;
1944 case tcc_constant:
1945 /* No side-effects. */
1946 return;
1948 default:
1949 gcc_unreachable ();
1953 /* Gimplify the COMPONENT_REF, ARRAY_REF, REALPART_EXPR or IMAGPART_EXPR
1954 node *EXPR_P.
1956 compound_lval
1957 : min_lval '[' val ']'
1958 | min_lval '.' ID
1959 | compound_lval '[' val ']'
1960 | compound_lval '.' ID
1962 This is not part of the original SIMPLE definition, which separates
1963 array and member references, but it seems reasonable to handle them
1964 together. Also, this way we don't run into problems with union
1965 aliasing; gcc requires that for accesses through a union to alias, the
1966 union reference must be explicit, which was not always the case when we
1967 were splitting up array and member refs.
1969 PRE_P points to the sequence where side effects that must happen before
1970 *EXPR_P should be stored.
1972 POST_P points to the sequence where side effects that must happen after
1973 *EXPR_P should be stored. */
1975 static enum gimplify_status
1976 gimplify_compound_lval (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
1977 fallback_t fallback)
1979 tree *p;
1980 enum gimplify_status ret = GS_ALL_DONE, tret;
1981 int i;
1982 location_t loc = EXPR_LOCATION (*expr_p);
1983 tree expr = *expr_p;
1985 /* Create a stack of the subexpressions so later we can walk them in
1986 order from inner to outer. */
1987 auto_vec<tree, 10> expr_stack;
1989 /* We can handle anything that get_inner_reference can deal with. */
1990 for (p = expr_p; ; p = &TREE_OPERAND (*p, 0))
1992 restart:
1993 /* Fold INDIRECT_REFs now to turn them into ARRAY_REFs. */
1994 if (TREE_CODE (*p) == INDIRECT_REF)
1995 *p = fold_indirect_ref_loc (loc, *p);
1997 if (handled_component_p (*p))
1999 /* Expand DECL_VALUE_EXPR now. In some cases that may expose
2000 additional COMPONENT_REFs. */
2001 else if ((TREE_CODE (*p) == VAR_DECL || TREE_CODE (*p) == PARM_DECL)
2002 && gimplify_var_or_parm_decl (p) == GS_OK)
2003 goto restart;
2004 else
2005 break;
2007 expr_stack.safe_push (*p);
2010 gcc_assert (expr_stack.length ());
2012 /* Now EXPR_STACK is a stack of pointers to all the refs we've
2013 walked through and P points to the innermost expression.
2015 Java requires that we elaborated nodes in source order. That
2016 means we must gimplify the inner expression followed by each of
2017 the indices, in order. But we can't gimplify the inner
2018 expression until we deal with any variable bounds, sizes, or
2019 positions in order to deal with PLACEHOLDER_EXPRs.
2021 So we do this in three steps. First we deal with the annotations
2022 for any variables in the components, then we gimplify the base,
2023 then we gimplify any indices, from left to right. */
2024 for (i = expr_stack.length () - 1; i >= 0; i--)
2026 tree t = expr_stack[i];
2028 if (TREE_CODE (t) == ARRAY_REF || TREE_CODE (t) == ARRAY_RANGE_REF)
2030 /* Gimplify the low bound and element type size and put them into
2031 the ARRAY_REF. If these values are set, they have already been
2032 gimplified. */
2033 if (TREE_OPERAND (t, 2) == NULL_TREE)
2035 tree low = unshare_expr (array_ref_low_bound (t));
2036 if (!is_gimple_min_invariant (low))
2038 TREE_OPERAND (t, 2) = low;
2039 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p,
2040 post_p, is_gimple_reg,
2041 fb_rvalue);
2042 ret = MIN (ret, tret);
2045 else
2047 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p, post_p,
2048 is_gimple_reg, fb_rvalue);
2049 ret = MIN (ret, tret);
2052 if (TREE_OPERAND (t, 3) == NULL_TREE)
2054 tree elmt_type = TREE_TYPE (TREE_TYPE (TREE_OPERAND (t, 0)));
2055 tree elmt_size = unshare_expr (array_ref_element_size (t));
2056 tree factor = size_int (TYPE_ALIGN_UNIT (elmt_type));
2058 /* Divide the element size by the alignment of the element
2059 type (above). */
2060 elmt_size
2061 = size_binop_loc (loc, EXACT_DIV_EXPR, elmt_size, factor);
2063 if (!is_gimple_min_invariant (elmt_size))
2065 TREE_OPERAND (t, 3) = elmt_size;
2066 tret = gimplify_expr (&TREE_OPERAND (t, 3), pre_p,
2067 post_p, is_gimple_reg,
2068 fb_rvalue);
2069 ret = MIN (ret, tret);
2072 else
2074 tret = gimplify_expr (&TREE_OPERAND (t, 3), pre_p, post_p,
2075 is_gimple_reg, fb_rvalue);
2076 ret = MIN (ret, tret);
2079 else if (TREE_CODE (t) == COMPONENT_REF)
2081 /* Set the field offset into T and gimplify it. */
2082 if (TREE_OPERAND (t, 2) == NULL_TREE)
2084 tree offset = unshare_expr (component_ref_field_offset (t));
2085 tree field = TREE_OPERAND (t, 1);
2086 tree factor
2087 = size_int (DECL_OFFSET_ALIGN (field) / BITS_PER_UNIT);
2089 /* Divide the offset by its alignment. */
2090 offset = size_binop_loc (loc, EXACT_DIV_EXPR, offset, factor);
2092 if (!is_gimple_min_invariant (offset))
2094 TREE_OPERAND (t, 2) = offset;
2095 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p,
2096 post_p, is_gimple_reg,
2097 fb_rvalue);
2098 ret = MIN (ret, tret);
2101 else
2103 tret = gimplify_expr (&TREE_OPERAND (t, 2), pre_p, post_p,
2104 is_gimple_reg, fb_rvalue);
2105 ret = MIN (ret, tret);
2110 /* Step 2 is to gimplify the base expression. Make sure lvalue is set
2111 so as to match the min_lval predicate. Failure to do so may result
2112 in the creation of large aggregate temporaries. */
2113 tret = gimplify_expr (p, pre_p, post_p, is_gimple_min_lval,
2114 fallback | fb_lvalue);
2115 ret = MIN (ret, tret);
2117 /* And finally, the indices and operands of ARRAY_REF. During this
2118 loop we also remove any useless conversions. */
2119 for (; expr_stack.length () > 0; )
2121 tree t = expr_stack.pop ();
2123 if (TREE_CODE (t) == ARRAY_REF || TREE_CODE (t) == ARRAY_RANGE_REF)
2125 /* Gimplify the dimension. */
2126 if (!is_gimple_min_invariant (TREE_OPERAND (t, 1)))
2128 tret = gimplify_expr (&TREE_OPERAND (t, 1), pre_p, post_p,
2129 is_gimple_val, fb_rvalue);
2130 ret = MIN (ret, tret);
2134 STRIP_USELESS_TYPE_CONVERSION (TREE_OPERAND (t, 0));
2136 /* The innermost expression P may have originally had
2137 TREE_SIDE_EFFECTS set which would have caused all the outer
2138 expressions in *EXPR_P leading to P to also have had
2139 TREE_SIDE_EFFECTS set. */
2140 recalculate_side_effects (t);
2143 /* If the outermost expression is a COMPONENT_REF, canonicalize its type. */
2144 if ((fallback & fb_rvalue) && TREE_CODE (*expr_p) == COMPONENT_REF)
2146 canonicalize_component_ref (expr_p);
2149 expr_stack.release ();
2151 gcc_assert (*expr_p == expr || ret != GS_ALL_DONE);
2153 return ret;
2156 /* Gimplify the self modifying expression pointed to by EXPR_P
2157 (++, --, +=, -=).
2159 PRE_P points to the list where side effects that must happen before
2160 *EXPR_P should be stored.
2162 POST_P points to the list where side effects that must happen after
2163 *EXPR_P should be stored.
2165 WANT_VALUE is nonzero iff we want to use the value of this expression
2166 in another expression.
2168 ARITH_TYPE is the type the computation should be performed in. */
2170 enum gimplify_status
2171 gimplify_self_mod_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
2172 bool want_value, tree arith_type)
2174 enum tree_code code;
2175 tree lhs, lvalue, rhs, t1;
2176 gimple_seq post = NULL, *orig_post_p = post_p;
2177 bool postfix;
2178 enum tree_code arith_code;
2179 enum gimplify_status ret;
2180 location_t loc = EXPR_LOCATION (*expr_p);
2182 code = TREE_CODE (*expr_p);
2184 gcc_assert (code == POSTINCREMENT_EXPR || code == POSTDECREMENT_EXPR
2185 || code == PREINCREMENT_EXPR || code == PREDECREMENT_EXPR);
2187 /* Prefix or postfix? */
2188 if (code == POSTINCREMENT_EXPR || code == POSTDECREMENT_EXPR)
2189 /* Faster to treat as prefix if result is not used. */
2190 postfix = want_value;
2191 else
2192 postfix = false;
2194 /* For postfix, make sure the inner expression's post side effects
2195 are executed after side effects from this expression. */
2196 if (postfix)
2197 post_p = &post;
2199 /* Add or subtract? */
2200 if (code == PREINCREMENT_EXPR || code == POSTINCREMENT_EXPR)
2201 arith_code = PLUS_EXPR;
2202 else
2203 arith_code = MINUS_EXPR;
2205 /* Gimplify the LHS into a GIMPLE lvalue. */
2206 lvalue = TREE_OPERAND (*expr_p, 0);
2207 ret = gimplify_expr (&lvalue, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
2208 if (ret == GS_ERROR)
2209 return ret;
2211 /* Extract the operands to the arithmetic operation. */
2212 lhs = lvalue;
2213 rhs = TREE_OPERAND (*expr_p, 1);
2215 /* For postfix operator, we evaluate the LHS to an rvalue and then use
2216 that as the result value and in the postqueue operation. */
2217 if (postfix)
2219 ret = gimplify_expr (&lhs, pre_p, post_p, is_gimple_val, fb_rvalue);
2220 if (ret == GS_ERROR)
2221 return ret;
2223 lhs = get_initialized_tmp_var (lhs, pre_p, NULL);
2226 /* For POINTERs increment, use POINTER_PLUS_EXPR. */
2227 if (POINTER_TYPE_P (TREE_TYPE (lhs)))
2229 rhs = convert_to_ptrofftype_loc (loc, rhs);
2230 if (arith_code == MINUS_EXPR)
2231 rhs = fold_build1_loc (loc, NEGATE_EXPR, TREE_TYPE (rhs), rhs);
2232 t1 = fold_build2 (POINTER_PLUS_EXPR, TREE_TYPE (*expr_p), lhs, rhs);
2234 else
2235 t1 = fold_convert (TREE_TYPE (*expr_p),
2236 fold_build2 (arith_code, arith_type,
2237 fold_convert (arith_type, lhs),
2238 fold_convert (arith_type, rhs)));
2240 if (postfix)
2242 gimplify_assign (lvalue, t1, pre_p);
2243 gimplify_seq_add_seq (orig_post_p, post);
2244 *expr_p = lhs;
2245 return GS_ALL_DONE;
2247 else
2249 *expr_p = build2 (MODIFY_EXPR, TREE_TYPE (lvalue), lvalue, t1);
2250 return GS_OK;
2254 /* If *EXPR_P has a variable sized type, wrap it in a WITH_SIZE_EXPR. */
2256 static void
2257 maybe_with_size_expr (tree *expr_p)
2259 tree expr = *expr_p;
2260 tree type = TREE_TYPE (expr);
2261 tree size;
2263 /* If we've already wrapped this or the type is error_mark_node, we can't do
2264 anything. */
2265 if (TREE_CODE (expr) == WITH_SIZE_EXPR
2266 || type == error_mark_node)
2267 return;
2269 /* If the size isn't known or is a constant, we have nothing to do. */
2270 size = TYPE_SIZE_UNIT (type);
2271 if (!size || TREE_CODE (size) == INTEGER_CST)
2272 return;
2274 /* Otherwise, make a WITH_SIZE_EXPR. */
2275 size = unshare_expr (size);
2276 size = SUBSTITUTE_PLACEHOLDER_IN_EXPR (size, expr);
2277 *expr_p = build2 (WITH_SIZE_EXPR, type, expr, size);
2280 /* Helper for gimplify_call_expr. Gimplify a single argument *ARG_P
2281 Store any side-effects in PRE_P. CALL_LOCATION is the location of
2282 the CALL_EXPR. */
2284 enum gimplify_status
2285 gimplify_arg (tree *arg_p, gimple_seq *pre_p, location_t call_location)
2287 bool (*test) (tree);
2288 fallback_t fb;
2290 /* In general, we allow lvalues for function arguments to avoid
2291 extra overhead of copying large aggregates out of even larger
2292 aggregates into temporaries only to copy the temporaries to
2293 the argument list. Make optimizers happy by pulling out to
2294 temporaries those types that fit in registers. */
2295 if (is_gimple_reg_type (TREE_TYPE (*arg_p)))
2296 test = is_gimple_val, fb = fb_rvalue;
2297 else
2299 test = is_gimple_lvalue, fb = fb_either;
2300 /* Also strip a TARGET_EXPR that would force an extra copy. */
2301 if (TREE_CODE (*arg_p) == TARGET_EXPR)
2303 tree init = TARGET_EXPR_INITIAL (*arg_p);
2304 if (init
2305 && !VOID_TYPE_P (TREE_TYPE (init)))
2306 *arg_p = init;
2310 /* If this is a variable sized type, we must remember the size. */
2311 maybe_with_size_expr (arg_p);
2313 /* FIXME diagnostics: This will mess up gcc.dg/Warray-bounds.c. */
2314 /* Make sure arguments have the same location as the function call
2315 itself. */
2316 protected_set_expr_location (*arg_p, call_location);
2318 /* There is a sequence point before a function call. Side effects in
2319 the argument list must occur before the actual call. So, when
2320 gimplifying arguments, force gimplify_expr to use an internal
2321 post queue which is then appended to the end of PRE_P. */
2322 return gimplify_expr (arg_p, pre_p, NULL, test, fb);
2325 /* Don't fold inside offloading or taskreg regions: it can break code by
2326 adding decl references that weren't in the source. We'll do it during
2327 omplower pass instead. */
2329 static bool
2330 maybe_fold_stmt (gimple_stmt_iterator *gsi)
2332 struct gimplify_omp_ctx *ctx;
2333 for (ctx = gimplify_omp_ctxp; ctx; ctx = ctx->outer_context)
2334 if ((ctx->region_type & (ORT_TARGET | ORT_PARALLEL | ORT_TASK)) != 0)
2335 return false;
2336 return fold_stmt (gsi);
2339 /* Gimplify the CALL_EXPR node *EXPR_P into the GIMPLE sequence PRE_P.
2340 WANT_VALUE is true if the result of the call is desired. */
2342 static enum gimplify_status
2343 gimplify_call_expr (tree *expr_p, gimple_seq *pre_p, bool want_value)
2345 tree fndecl, parms, p, fnptrtype;
2346 enum gimplify_status ret;
2347 int i, nargs;
2348 gcall *call;
2349 bool builtin_va_start_p = false;
2350 location_t loc = EXPR_LOCATION (*expr_p);
2352 gcc_assert (TREE_CODE (*expr_p) == CALL_EXPR);
2354 /* For reliable diagnostics during inlining, it is necessary that
2355 every call_expr be annotated with file and line. */
2356 if (! EXPR_HAS_LOCATION (*expr_p))
2357 SET_EXPR_LOCATION (*expr_p, input_location);
2359 /* Gimplify internal functions created in the FEs. */
2360 if (CALL_EXPR_FN (*expr_p) == NULL_TREE)
2362 if (want_value)
2363 return GS_ALL_DONE;
2365 nargs = call_expr_nargs (*expr_p);
2366 enum internal_fn ifn = CALL_EXPR_IFN (*expr_p);
2367 auto_vec<tree> vargs (nargs);
2369 for (i = 0; i < nargs; i++)
2371 gimplify_arg (&CALL_EXPR_ARG (*expr_p, i), pre_p,
2372 EXPR_LOCATION (*expr_p));
2373 vargs.quick_push (CALL_EXPR_ARG (*expr_p, i));
2375 gimple *call = gimple_build_call_internal_vec (ifn, vargs);
2376 gimplify_seq_add_stmt (pre_p, call);
2377 return GS_ALL_DONE;
2380 /* This may be a call to a builtin function.
2382 Builtin function calls may be transformed into different
2383 (and more efficient) builtin function calls under certain
2384 circumstances. Unfortunately, gimplification can muck things
2385 up enough that the builtin expanders are not aware that certain
2386 transformations are still valid.
2388 So we attempt transformation/gimplification of the call before
2389 we gimplify the CALL_EXPR. At this time we do not manage to
2390 transform all calls in the same manner as the expanders do, but
2391 we do transform most of them. */
2392 fndecl = get_callee_fndecl (*expr_p);
2393 if (fndecl
2394 && DECL_BUILT_IN_CLASS (fndecl) == BUILT_IN_NORMAL)
2395 switch (DECL_FUNCTION_CODE (fndecl))
2397 case BUILT_IN_ALLOCA:
2398 case BUILT_IN_ALLOCA_WITH_ALIGN:
2399 /* If the call has been built for a variable-sized object, then we
2400 want to restore the stack level when the enclosing BIND_EXPR is
2401 exited to reclaim the allocated space; otherwise, we precisely
2402 need to do the opposite and preserve the latest stack level. */
2403 if (CALL_ALLOCA_FOR_VAR_P (*expr_p))
2404 gimplify_ctxp->save_stack = true;
2405 else
2406 gimplify_ctxp->keep_stack = true;
2407 break;
2409 case BUILT_IN_VA_START:
2411 builtin_va_start_p = TRUE;
2412 if (call_expr_nargs (*expr_p) < 2)
2414 error ("too few arguments to function %<va_start%>");
2415 *expr_p = build_empty_stmt (EXPR_LOCATION (*expr_p));
2416 return GS_OK;
2419 if (fold_builtin_next_arg (*expr_p, true))
2421 *expr_p = build_empty_stmt (EXPR_LOCATION (*expr_p));
2422 return GS_OK;
2424 break;
2426 case BUILT_IN_LINE:
2428 *expr_p = build_int_cst (TREE_TYPE (*expr_p),
2429 LOCATION_LINE (EXPR_LOCATION (*expr_p)));
2430 return GS_OK;
2432 case BUILT_IN_FILE:
2434 const char *locfile = LOCATION_FILE (EXPR_LOCATION (*expr_p));
2435 *expr_p = build_string_literal (strlen (locfile) + 1, locfile);
2436 return GS_OK;
2438 case BUILT_IN_FUNCTION:
2440 const char *function;
2441 function = IDENTIFIER_POINTER (DECL_NAME (current_function_decl));
2442 *expr_p = build_string_literal (strlen (function) + 1, function);
2443 return GS_OK;
2445 default:
2448 if (fndecl && DECL_BUILT_IN (fndecl))
2450 tree new_tree = fold_call_expr (input_location, *expr_p, !want_value);
2451 if (new_tree && new_tree != *expr_p)
2453 /* There was a transformation of this call which computes the
2454 same value, but in a more efficient way. Return and try
2455 again. */
2456 *expr_p = new_tree;
2457 return GS_OK;
2461 /* Remember the original function pointer type. */
2462 fnptrtype = TREE_TYPE (CALL_EXPR_FN (*expr_p));
2464 /* There is a sequence point before the call, so any side effects in
2465 the calling expression must occur before the actual call. Force
2466 gimplify_expr to use an internal post queue. */
2467 ret = gimplify_expr (&CALL_EXPR_FN (*expr_p), pre_p, NULL,
2468 is_gimple_call_addr, fb_rvalue);
2470 nargs = call_expr_nargs (*expr_p);
2472 /* Get argument types for verification. */
2473 fndecl = get_callee_fndecl (*expr_p);
2474 parms = NULL_TREE;
2475 if (fndecl)
2476 parms = TYPE_ARG_TYPES (TREE_TYPE (fndecl));
2477 else
2478 parms = TYPE_ARG_TYPES (TREE_TYPE (fnptrtype));
2480 if (fndecl && DECL_ARGUMENTS (fndecl))
2481 p = DECL_ARGUMENTS (fndecl);
2482 else if (parms)
2483 p = parms;
2484 else
2485 p = NULL_TREE;
2486 for (i = 0; i < nargs && p; i++, p = TREE_CHAIN (p))
2489 /* If the last argument is __builtin_va_arg_pack () and it is not
2490 passed as a named argument, decrease the number of CALL_EXPR
2491 arguments and set instead the CALL_EXPR_VA_ARG_PACK flag. */
2492 if (!p
2493 && i < nargs
2494 && TREE_CODE (CALL_EXPR_ARG (*expr_p, nargs - 1)) == CALL_EXPR)
2496 tree last_arg = CALL_EXPR_ARG (*expr_p, nargs - 1);
2497 tree last_arg_fndecl = get_callee_fndecl (last_arg);
2499 if (last_arg_fndecl
2500 && TREE_CODE (last_arg_fndecl) == FUNCTION_DECL
2501 && DECL_BUILT_IN_CLASS (last_arg_fndecl) == BUILT_IN_NORMAL
2502 && DECL_FUNCTION_CODE (last_arg_fndecl) == BUILT_IN_VA_ARG_PACK)
2504 tree call = *expr_p;
2506 --nargs;
2507 *expr_p = build_call_array_loc (loc, TREE_TYPE (call),
2508 CALL_EXPR_FN (call),
2509 nargs, CALL_EXPR_ARGP (call));
2511 /* Copy all CALL_EXPR flags, location and block, except
2512 CALL_EXPR_VA_ARG_PACK flag. */
2513 CALL_EXPR_STATIC_CHAIN (*expr_p) = CALL_EXPR_STATIC_CHAIN (call);
2514 CALL_EXPR_TAILCALL (*expr_p) = CALL_EXPR_TAILCALL (call);
2515 CALL_EXPR_RETURN_SLOT_OPT (*expr_p)
2516 = CALL_EXPR_RETURN_SLOT_OPT (call);
2517 CALL_FROM_THUNK_P (*expr_p) = CALL_FROM_THUNK_P (call);
2518 SET_EXPR_LOCATION (*expr_p, EXPR_LOCATION (call));
2520 /* Set CALL_EXPR_VA_ARG_PACK. */
2521 CALL_EXPR_VA_ARG_PACK (*expr_p) = 1;
2525 /* Gimplify the function arguments. */
2526 if (nargs > 0)
2528 for (i = (PUSH_ARGS_REVERSED ? nargs - 1 : 0);
2529 PUSH_ARGS_REVERSED ? i >= 0 : i < nargs;
2530 PUSH_ARGS_REVERSED ? i-- : i++)
2532 enum gimplify_status t;
2534 /* Avoid gimplifying the second argument to va_start, which needs to
2535 be the plain PARM_DECL. */
2536 if ((i != 1) || !builtin_va_start_p)
2538 t = gimplify_arg (&CALL_EXPR_ARG (*expr_p, i), pre_p,
2539 EXPR_LOCATION (*expr_p));
2541 if (t == GS_ERROR)
2542 ret = GS_ERROR;
2547 /* Gimplify the static chain. */
2548 if (CALL_EXPR_STATIC_CHAIN (*expr_p))
2550 if (fndecl && !DECL_STATIC_CHAIN (fndecl))
2551 CALL_EXPR_STATIC_CHAIN (*expr_p) = NULL;
2552 else
2554 enum gimplify_status t;
2555 t = gimplify_arg (&CALL_EXPR_STATIC_CHAIN (*expr_p), pre_p,
2556 EXPR_LOCATION (*expr_p));
2557 if (t == GS_ERROR)
2558 ret = GS_ERROR;
2562 /* Verify the function result. */
2563 if (want_value && fndecl
2564 && VOID_TYPE_P (TREE_TYPE (TREE_TYPE (fnptrtype))))
2566 error_at (loc, "using result of function returning %<void%>");
2567 ret = GS_ERROR;
2570 /* Try this again in case gimplification exposed something. */
2571 if (ret != GS_ERROR)
2573 tree new_tree = fold_call_expr (input_location, *expr_p, !want_value);
2575 if (new_tree && new_tree != *expr_p)
2577 /* There was a transformation of this call which computes the
2578 same value, but in a more efficient way. Return and try
2579 again. */
2580 *expr_p = new_tree;
2581 return GS_OK;
2584 else
2586 *expr_p = error_mark_node;
2587 return GS_ERROR;
2590 /* If the function is "const" or "pure", then clear TREE_SIDE_EFFECTS on its
2591 decl. This allows us to eliminate redundant or useless
2592 calls to "const" functions. */
2593 if (TREE_CODE (*expr_p) == CALL_EXPR)
2595 int flags = call_expr_flags (*expr_p);
2596 if (flags & (ECF_CONST | ECF_PURE)
2597 /* An infinite loop is considered a side effect. */
2598 && !(flags & (ECF_LOOPING_CONST_OR_PURE)))
2599 TREE_SIDE_EFFECTS (*expr_p) = 0;
2602 /* If the value is not needed by the caller, emit a new GIMPLE_CALL
2603 and clear *EXPR_P. Otherwise, leave *EXPR_P in its gimplified
2604 form and delegate the creation of a GIMPLE_CALL to
2605 gimplify_modify_expr. This is always possible because when
2606 WANT_VALUE is true, the caller wants the result of this call into
2607 a temporary, which means that we will emit an INIT_EXPR in
2608 internal_get_tmp_var which will then be handled by
2609 gimplify_modify_expr. */
2610 if (!want_value)
2612 /* The CALL_EXPR in *EXPR_P is already in GIMPLE form, so all we
2613 have to do is replicate it as a GIMPLE_CALL tuple. */
2614 gimple_stmt_iterator gsi;
2615 call = gimple_build_call_from_tree (*expr_p);
2616 gimple_call_set_fntype (call, TREE_TYPE (fnptrtype));
2617 notice_special_calls (call);
2618 gimplify_seq_add_stmt (pre_p, call);
2619 gsi = gsi_last (*pre_p);
2620 maybe_fold_stmt (&gsi);
2621 *expr_p = NULL_TREE;
2623 else
2624 /* Remember the original function type. */
2625 CALL_EXPR_FN (*expr_p) = build1 (NOP_EXPR, fnptrtype,
2626 CALL_EXPR_FN (*expr_p));
2628 return ret;
2631 /* Handle shortcut semantics in the predicate operand of a COND_EXPR by
2632 rewriting it into multiple COND_EXPRs, and possibly GOTO_EXPRs.
2634 TRUE_LABEL_P and FALSE_LABEL_P point to the labels to jump to if the
2635 condition is true or false, respectively. If null, we should generate
2636 our own to skip over the evaluation of this specific expression.
2638 LOCUS is the source location of the COND_EXPR.
2640 This function is the tree equivalent of do_jump.
2642 shortcut_cond_r should only be called by shortcut_cond_expr. */
2644 static tree
2645 shortcut_cond_r (tree pred, tree *true_label_p, tree *false_label_p,
2646 location_t locus)
2648 tree local_label = NULL_TREE;
2649 tree t, expr = NULL;
2651 /* OK, it's not a simple case; we need to pull apart the COND_EXPR to
2652 retain the shortcut semantics. Just insert the gotos here;
2653 shortcut_cond_expr will append the real blocks later. */
2654 if (TREE_CODE (pred) == TRUTH_ANDIF_EXPR)
2656 location_t new_locus;
2658 /* Turn if (a && b) into
2660 if (a); else goto no;
2661 if (b) goto yes; else goto no;
2662 (no:) */
2664 if (false_label_p == NULL)
2665 false_label_p = &local_label;
2667 /* Keep the original source location on the first 'if'. */
2668 t = shortcut_cond_r (TREE_OPERAND (pred, 0), NULL, false_label_p, locus);
2669 append_to_statement_list (t, &expr);
2671 /* Set the source location of the && on the second 'if'. */
2672 new_locus = EXPR_HAS_LOCATION (pred) ? EXPR_LOCATION (pred) : locus;
2673 t = shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p, false_label_p,
2674 new_locus);
2675 append_to_statement_list (t, &expr);
2677 else if (TREE_CODE (pred) == TRUTH_ORIF_EXPR)
2679 location_t new_locus;
2681 /* Turn if (a || b) into
2683 if (a) goto yes;
2684 if (b) goto yes; else goto no;
2685 (yes:) */
2687 if (true_label_p == NULL)
2688 true_label_p = &local_label;
2690 /* Keep the original source location on the first 'if'. */
2691 t = shortcut_cond_r (TREE_OPERAND (pred, 0), true_label_p, NULL, locus);
2692 append_to_statement_list (t, &expr);
2694 /* Set the source location of the || on the second 'if'. */
2695 new_locus = EXPR_HAS_LOCATION (pred) ? EXPR_LOCATION (pred) : locus;
2696 t = shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p, false_label_p,
2697 new_locus);
2698 append_to_statement_list (t, &expr);
2700 else if (TREE_CODE (pred) == COND_EXPR
2701 && !VOID_TYPE_P (TREE_TYPE (TREE_OPERAND (pred, 1)))
2702 && !VOID_TYPE_P (TREE_TYPE (TREE_OPERAND (pred, 2))))
2704 location_t new_locus;
2706 /* As long as we're messing with gotos, turn if (a ? b : c) into
2707 if (a)
2708 if (b) goto yes; else goto no;
2709 else
2710 if (c) goto yes; else goto no;
2712 Don't do this if one of the arms has void type, which can happen
2713 in C++ when the arm is throw. */
2715 /* Keep the original source location on the first 'if'. Set the source
2716 location of the ? on the second 'if'. */
2717 new_locus = EXPR_HAS_LOCATION (pred) ? EXPR_LOCATION (pred) : locus;
2718 expr = build3 (COND_EXPR, void_type_node, TREE_OPERAND (pred, 0),
2719 shortcut_cond_r (TREE_OPERAND (pred, 1), true_label_p,
2720 false_label_p, locus),
2721 shortcut_cond_r (TREE_OPERAND (pred, 2), true_label_p,
2722 false_label_p, new_locus));
2724 else
2726 expr = build3 (COND_EXPR, void_type_node, pred,
2727 build_and_jump (true_label_p),
2728 build_and_jump (false_label_p));
2729 SET_EXPR_LOCATION (expr, locus);
2732 if (local_label)
2734 t = build1 (LABEL_EXPR, void_type_node, local_label);
2735 append_to_statement_list (t, &expr);
2738 return expr;
2741 /* Given a conditional expression EXPR with short-circuit boolean
2742 predicates using TRUTH_ANDIF_EXPR or TRUTH_ORIF_EXPR, break the
2743 predicate apart into the equivalent sequence of conditionals. */
2745 static tree
2746 shortcut_cond_expr (tree expr)
2748 tree pred = TREE_OPERAND (expr, 0);
2749 tree then_ = TREE_OPERAND (expr, 1);
2750 tree else_ = TREE_OPERAND (expr, 2);
2751 tree true_label, false_label, end_label, t;
2752 tree *true_label_p;
2753 tree *false_label_p;
2754 bool emit_end, emit_false, jump_over_else;
2755 bool then_se = then_ && TREE_SIDE_EFFECTS (then_);
2756 bool else_se = else_ && TREE_SIDE_EFFECTS (else_);
2758 /* First do simple transformations. */
2759 if (!else_se)
2761 /* If there is no 'else', turn
2762 if (a && b) then c
2763 into
2764 if (a) if (b) then c. */
2765 while (TREE_CODE (pred) == TRUTH_ANDIF_EXPR)
2767 /* Keep the original source location on the first 'if'. */
2768 location_t locus = EXPR_LOC_OR_LOC (expr, input_location);
2769 TREE_OPERAND (expr, 0) = TREE_OPERAND (pred, 1);
2770 /* Set the source location of the && on the second 'if'. */
2771 if (EXPR_HAS_LOCATION (pred))
2772 SET_EXPR_LOCATION (expr, EXPR_LOCATION (pred));
2773 then_ = shortcut_cond_expr (expr);
2774 then_se = then_ && TREE_SIDE_EFFECTS (then_);
2775 pred = TREE_OPERAND (pred, 0);
2776 expr = build3 (COND_EXPR, void_type_node, pred, then_, NULL_TREE);
2777 SET_EXPR_LOCATION (expr, locus);
2781 if (!then_se)
2783 /* If there is no 'then', turn
2784 if (a || b); else d
2785 into
2786 if (a); else if (b); else d. */
2787 while (TREE_CODE (pred) == TRUTH_ORIF_EXPR)
2789 /* Keep the original source location on the first 'if'. */
2790 location_t locus = EXPR_LOC_OR_LOC (expr, input_location);
2791 TREE_OPERAND (expr, 0) = TREE_OPERAND (pred, 1);
2792 /* Set the source location of the || on the second 'if'. */
2793 if (EXPR_HAS_LOCATION (pred))
2794 SET_EXPR_LOCATION (expr, EXPR_LOCATION (pred));
2795 else_ = shortcut_cond_expr (expr);
2796 else_se = else_ && TREE_SIDE_EFFECTS (else_);
2797 pred = TREE_OPERAND (pred, 0);
2798 expr = build3 (COND_EXPR, void_type_node, pred, NULL_TREE, else_);
2799 SET_EXPR_LOCATION (expr, locus);
2803 /* If we're done, great. */
2804 if (TREE_CODE (pred) != TRUTH_ANDIF_EXPR
2805 && TREE_CODE (pred) != TRUTH_ORIF_EXPR)
2806 return expr;
2808 /* Otherwise we need to mess with gotos. Change
2809 if (a) c; else d;
2811 if (a); else goto no;
2812 c; goto end;
2813 no: d; end:
2814 and recursively gimplify the condition. */
2816 true_label = false_label = end_label = NULL_TREE;
2818 /* If our arms just jump somewhere, hijack those labels so we don't
2819 generate jumps to jumps. */
2821 if (then_
2822 && TREE_CODE (then_) == GOTO_EXPR
2823 && TREE_CODE (GOTO_DESTINATION (then_)) == LABEL_DECL)
2825 true_label = GOTO_DESTINATION (then_);
2826 then_ = NULL;
2827 then_se = false;
2830 if (else_
2831 && TREE_CODE (else_) == GOTO_EXPR
2832 && TREE_CODE (GOTO_DESTINATION (else_)) == LABEL_DECL)
2834 false_label = GOTO_DESTINATION (else_);
2835 else_ = NULL;
2836 else_se = false;
2839 /* If we aren't hijacking a label for the 'then' branch, it falls through. */
2840 if (true_label)
2841 true_label_p = &true_label;
2842 else
2843 true_label_p = NULL;
2845 /* The 'else' branch also needs a label if it contains interesting code. */
2846 if (false_label || else_se)
2847 false_label_p = &false_label;
2848 else
2849 false_label_p = NULL;
2851 /* If there was nothing else in our arms, just forward the label(s). */
2852 if (!then_se && !else_se)
2853 return shortcut_cond_r (pred, true_label_p, false_label_p,
2854 EXPR_LOC_OR_LOC (expr, input_location));
2856 /* If our last subexpression already has a terminal label, reuse it. */
2857 if (else_se)
2858 t = expr_last (else_);
2859 else if (then_se)
2860 t = expr_last (then_);
2861 else
2862 t = NULL;
2863 if (t && TREE_CODE (t) == LABEL_EXPR)
2864 end_label = LABEL_EXPR_LABEL (t);
2866 /* If we don't care about jumping to the 'else' branch, jump to the end
2867 if the condition is false. */
2868 if (!false_label_p)
2869 false_label_p = &end_label;
2871 /* We only want to emit these labels if we aren't hijacking them. */
2872 emit_end = (end_label == NULL_TREE);
2873 emit_false = (false_label == NULL_TREE);
2875 /* We only emit the jump over the else clause if we have to--if the
2876 then clause may fall through. Otherwise we can wind up with a
2877 useless jump and a useless label at the end of gimplified code,
2878 which will cause us to think that this conditional as a whole
2879 falls through even if it doesn't. If we then inline a function
2880 which ends with such a condition, that can cause us to issue an
2881 inappropriate warning about control reaching the end of a
2882 non-void function. */
2883 jump_over_else = block_may_fallthru (then_);
2885 pred = shortcut_cond_r (pred, true_label_p, false_label_p,
2886 EXPR_LOC_OR_LOC (expr, input_location));
2888 expr = NULL;
2889 append_to_statement_list (pred, &expr);
2891 append_to_statement_list (then_, &expr);
2892 if (else_se)
2894 if (jump_over_else)
2896 tree last = expr_last (expr);
2897 t = build_and_jump (&end_label);
2898 if (EXPR_HAS_LOCATION (last))
2899 SET_EXPR_LOCATION (t, EXPR_LOCATION (last));
2900 append_to_statement_list (t, &expr);
2902 if (emit_false)
2904 t = build1 (LABEL_EXPR, void_type_node, false_label);
2905 append_to_statement_list (t, &expr);
2907 append_to_statement_list (else_, &expr);
2909 if (emit_end && end_label)
2911 t = build1 (LABEL_EXPR, void_type_node, end_label);
2912 append_to_statement_list (t, &expr);
2915 return expr;
2918 /* EXPR is used in a boolean context; make sure it has BOOLEAN_TYPE. */
2920 tree
2921 gimple_boolify (tree expr)
2923 tree type = TREE_TYPE (expr);
2924 location_t loc = EXPR_LOCATION (expr);
2926 if (TREE_CODE (expr) == NE_EXPR
2927 && TREE_CODE (TREE_OPERAND (expr, 0)) == CALL_EXPR
2928 && integer_zerop (TREE_OPERAND (expr, 1)))
2930 tree call = TREE_OPERAND (expr, 0);
2931 tree fn = get_callee_fndecl (call);
2933 /* For __builtin_expect ((long) (x), y) recurse into x as well
2934 if x is truth_value_p. */
2935 if (fn
2936 && DECL_BUILT_IN_CLASS (fn) == BUILT_IN_NORMAL
2937 && DECL_FUNCTION_CODE (fn) == BUILT_IN_EXPECT
2938 && call_expr_nargs (call) == 2)
2940 tree arg = CALL_EXPR_ARG (call, 0);
2941 if (arg)
2943 if (TREE_CODE (arg) == NOP_EXPR
2944 && TREE_TYPE (arg) == TREE_TYPE (call))
2945 arg = TREE_OPERAND (arg, 0);
2946 if (truth_value_p (TREE_CODE (arg)))
2948 arg = gimple_boolify (arg);
2949 CALL_EXPR_ARG (call, 0)
2950 = fold_convert_loc (loc, TREE_TYPE (call), arg);
2956 switch (TREE_CODE (expr))
2958 case TRUTH_AND_EXPR:
2959 case TRUTH_OR_EXPR:
2960 case TRUTH_XOR_EXPR:
2961 case TRUTH_ANDIF_EXPR:
2962 case TRUTH_ORIF_EXPR:
2963 /* Also boolify the arguments of truth exprs. */
2964 TREE_OPERAND (expr, 1) = gimple_boolify (TREE_OPERAND (expr, 1));
2965 /* FALLTHRU */
2967 case TRUTH_NOT_EXPR:
2968 TREE_OPERAND (expr, 0) = gimple_boolify (TREE_OPERAND (expr, 0));
2970 /* These expressions always produce boolean results. */
2971 if (TREE_CODE (type) != BOOLEAN_TYPE)
2972 TREE_TYPE (expr) = boolean_type_node;
2973 return expr;
2975 case ANNOTATE_EXPR:
2976 switch ((enum annot_expr_kind) TREE_INT_CST_LOW (TREE_OPERAND (expr, 1)))
2978 case annot_expr_ivdep_kind:
2979 case annot_expr_no_vector_kind:
2980 case annot_expr_vector_kind:
2981 TREE_OPERAND (expr, 0) = gimple_boolify (TREE_OPERAND (expr, 0));
2982 if (TREE_CODE (type) != BOOLEAN_TYPE)
2983 TREE_TYPE (expr) = boolean_type_node;
2984 return expr;
2985 default:
2986 gcc_unreachable ();
2989 default:
2990 if (COMPARISON_CLASS_P (expr))
2992 /* There expressions always prduce boolean results. */
2993 if (TREE_CODE (type) != BOOLEAN_TYPE)
2994 TREE_TYPE (expr) = boolean_type_node;
2995 return expr;
2997 /* Other expressions that get here must have boolean values, but
2998 might need to be converted to the appropriate mode. */
2999 if (TREE_CODE (type) == BOOLEAN_TYPE)
3000 return expr;
3001 return fold_convert_loc (loc, boolean_type_node, expr);
3005 /* Given a conditional expression *EXPR_P without side effects, gimplify
3006 its operands. New statements are inserted to PRE_P. */
3008 static enum gimplify_status
3009 gimplify_pure_cond_expr (tree *expr_p, gimple_seq *pre_p)
3011 tree expr = *expr_p, cond;
3012 enum gimplify_status ret, tret;
3013 enum tree_code code;
3015 cond = gimple_boolify (COND_EXPR_COND (expr));
3017 /* We need to handle && and || specially, as their gimplification
3018 creates pure cond_expr, thus leading to an infinite cycle otherwise. */
3019 code = TREE_CODE (cond);
3020 if (code == TRUTH_ANDIF_EXPR)
3021 TREE_SET_CODE (cond, TRUTH_AND_EXPR);
3022 else if (code == TRUTH_ORIF_EXPR)
3023 TREE_SET_CODE (cond, TRUTH_OR_EXPR);
3024 ret = gimplify_expr (&cond, pre_p, NULL, is_gimple_condexpr, fb_rvalue);
3025 COND_EXPR_COND (*expr_p) = cond;
3027 tret = gimplify_expr (&COND_EXPR_THEN (expr), pre_p, NULL,
3028 is_gimple_val, fb_rvalue);
3029 ret = MIN (ret, tret);
3030 tret = gimplify_expr (&COND_EXPR_ELSE (expr), pre_p, NULL,
3031 is_gimple_val, fb_rvalue);
3033 return MIN (ret, tret);
3036 /* Return true if evaluating EXPR could trap.
3037 EXPR is GENERIC, while tree_could_trap_p can be called
3038 only on GIMPLE. */
3040 static bool
3041 generic_expr_could_trap_p (tree expr)
3043 unsigned i, n;
3045 if (!expr || is_gimple_val (expr))
3046 return false;
3048 if (!EXPR_P (expr) || tree_could_trap_p (expr))
3049 return true;
3051 n = TREE_OPERAND_LENGTH (expr);
3052 for (i = 0; i < n; i++)
3053 if (generic_expr_could_trap_p (TREE_OPERAND (expr, i)))
3054 return true;
3056 return false;
3059 /* Convert the conditional expression pointed to by EXPR_P '(p) ? a : b;'
3060 into
3062 if (p) if (p)
3063 t1 = a; a;
3064 else or else
3065 t1 = b; b;
3068 The second form is used when *EXPR_P is of type void.
3070 PRE_P points to the list where side effects that must happen before
3071 *EXPR_P should be stored. */
3073 static enum gimplify_status
3074 gimplify_cond_expr (tree *expr_p, gimple_seq *pre_p, fallback_t fallback)
3076 tree expr = *expr_p;
3077 tree type = TREE_TYPE (expr);
3078 location_t loc = EXPR_LOCATION (expr);
3079 tree tmp, arm1, arm2;
3080 enum gimplify_status ret;
3081 tree label_true, label_false, label_cont;
3082 bool have_then_clause_p, have_else_clause_p;
3083 gcond *cond_stmt;
3084 enum tree_code pred_code;
3085 gimple_seq seq = NULL;
3087 /* If this COND_EXPR has a value, copy the values into a temporary within
3088 the arms. */
3089 if (!VOID_TYPE_P (type))
3091 tree then_ = TREE_OPERAND (expr, 1), else_ = TREE_OPERAND (expr, 2);
3092 tree result;
3094 /* If either an rvalue is ok or we do not require an lvalue, create the
3095 temporary. But we cannot do that if the type is addressable. */
3096 if (((fallback & fb_rvalue) || !(fallback & fb_lvalue))
3097 && !TREE_ADDRESSABLE (type))
3099 if (gimplify_ctxp->allow_rhs_cond_expr
3100 /* If either branch has side effects or could trap, it can't be
3101 evaluated unconditionally. */
3102 && !TREE_SIDE_EFFECTS (then_)
3103 && !generic_expr_could_trap_p (then_)
3104 && !TREE_SIDE_EFFECTS (else_)
3105 && !generic_expr_could_trap_p (else_))
3106 return gimplify_pure_cond_expr (expr_p, pre_p);
3108 tmp = create_tmp_var (type, "iftmp");
3109 result = tmp;
3112 /* Otherwise, only create and copy references to the values. */
3113 else
3115 type = build_pointer_type (type);
3117 if (!VOID_TYPE_P (TREE_TYPE (then_)))
3118 then_ = build_fold_addr_expr_loc (loc, then_);
3120 if (!VOID_TYPE_P (TREE_TYPE (else_)))
3121 else_ = build_fold_addr_expr_loc (loc, else_);
3123 expr
3124 = build3 (COND_EXPR, type, TREE_OPERAND (expr, 0), then_, else_);
3126 tmp = create_tmp_var (type, "iftmp");
3127 result = build_simple_mem_ref_loc (loc, tmp);
3130 /* Build the new then clause, `tmp = then_;'. But don't build the
3131 assignment if the value is void; in C++ it can be if it's a throw. */
3132 if (!VOID_TYPE_P (TREE_TYPE (then_)))
3133 TREE_OPERAND (expr, 1) = build2 (MODIFY_EXPR, type, tmp, then_);
3135 /* Similarly, build the new else clause, `tmp = else_;'. */
3136 if (!VOID_TYPE_P (TREE_TYPE (else_)))
3137 TREE_OPERAND (expr, 2) = build2 (MODIFY_EXPR, type, tmp, else_);
3139 TREE_TYPE (expr) = void_type_node;
3140 recalculate_side_effects (expr);
3142 /* Move the COND_EXPR to the prequeue. */
3143 gimplify_stmt (&expr, pre_p);
3145 *expr_p = result;
3146 return GS_ALL_DONE;
3149 /* Remove any COMPOUND_EXPR so the following cases will be caught. */
3150 STRIP_TYPE_NOPS (TREE_OPERAND (expr, 0));
3151 if (TREE_CODE (TREE_OPERAND (expr, 0)) == COMPOUND_EXPR)
3152 gimplify_compound_expr (&TREE_OPERAND (expr, 0), pre_p, true);
3154 /* Make sure the condition has BOOLEAN_TYPE. */
3155 TREE_OPERAND (expr, 0) = gimple_boolify (TREE_OPERAND (expr, 0));
3157 /* Break apart && and || conditions. */
3158 if (TREE_CODE (TREE_OPERAND (expr, 0)) == TRUTH_ANDIF_EXPR
3159 || TREE_CODE (TREE_OPERAND (expr, 0)) == TRUTH_ORIF_EXPR)
3161 expr = shortcut_cond_expr (expr);
3163 if (expr != *expr_p)
3165 *expr_p = expr;
3167 /* We can't rely on gimplify_expr to re-gimplify the expanded
3168 form properly, as cleanups might cause the target labels to be
3169 wrapped in a TRY_FINALLY_EXPR. To prevent that, we need to
3170 set up a conditional context. */
3171 gimple_push_condition ();
3172 gimplify_stmt (expr_p, &seq);
3173 gimple_pop_condition (pre_p);
3174 gimple_seq_add_seq (pre_p, seq);
3176 return GS_ALL_DONE;
3180 /* Now do the normal gimplification. */
3182 /* Gimplify condition. */
3183 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, NULL, is_gimple_condexpr,
3184 fb_rvalue);
3185 if (ret == GS_ERROR)
3186 return GS_ERROR;
3187 gcc_assert (TREE_OPERAND (expr, 0) != NULL_TREE);
3189 gimple_push_condition ();
3191 have_then_clause_p = have_else_clause_p = false;
3192 if (TREE_OPERAND (expr, 1) != NULL
3193 && TREE_CODE (TREE_OPERAND (expr, 1)) == GOTO_EXPR
3194 && TREE_CODE (GOTO_DESTINATION (TREE_OPERAND (expr, 1))) == LABEL_DECL
3195 && (DECL_CONTEXT (GOTO_DESTINATION (TREE_OPERAND (expr, 1)))
3196 == current_function_decl)
3197 /* For -O0 avoid this optimization if the COND_EXPR and GOTO_EXPR
3198 have different locations, otherwise we end up with incorrect
3199 location information on the branches. */
3200 && (optimize
3201 || !EXPR_HAS_LOCATION (expr)
3202 || !EXPR_HAS_LOCATION (TREE_OPERAND (expr, 1))
3203 || EXPR_LOCATION (expr) == EXPR_LOCATION (TREE_OPERAND (expr, 1))))
3205 label_true = GOTO_DESTINATION (TREE_OPERAND (expr, 1));
3206 have_then_clause_p = true;
3208 else
3209 label_true = create_artificial_label (UNKNOWN_LOCATION);
3210 if (TREE_OPERAND (expr, 2) != NULL
3211 && TREE_CODE (TREE_OPERAND (expr, 2)) == GOTO_EXPR
3212 && TREE_CODE (GOTO_DESTINATION (TREE_OPERAND (expr, 2))) == LABEL_DECL
3213 && (DECL_CONTEXT (GOTO_DESTINATION (TREE_OPERAND (expr, 2)))
3214 == current_function_decl)
3215 /* For -O0 avoid this optimization if the COND_EXPR and GOTO_EXPR
3216 have different locations, otherwise we end up with incorrect
3217 location information on the branches. */
3218 && (optimize
3219 || !EXPR_HAS_LOCATION (expr)
3220 || !EXPR_HAS_LOCATION (TREE_OPERAND (expr, 2))
3221 || EXPR_LOCATION (expr) == EXPR_LOCATION (TREE_OPERAND (expr, 2))))
3223 label_false = GOTO_DESTINATION (TREE_OPERAND (expr, 2));
3224 have_else_clause_p = true;
3226 else
3227 label_false = create_artificial_label (UNKNOWN_LOCATION);
3229 gimple_cond_get_ops_from_tree (COND_EXPR_COND (expr), &pred_code, &arm1,
3230 &arm2);
3231 cond_stmt = gimple_build_cond (pred_code, arm1, arm2, label_true,
3232 label_false);
3233 gimple_set_no_warning (cond_stmt, TREE_NO_WARNING (COND_EXPR_COND (expr)));
3234 gimplify_seq_add_stmt (&seq, cond_stmt);
3235 gimple_stmt_iterator gsi = gsi_last (seq);
3236 maybe_fold_stmt (&gsi);
3238 label_cont = NULL_TREE;
3239 if (!have_then_clause_p)
3241 /* For if (...) {} else { code; } put label_true after
3242 the else block. */
3243 if (TREE_OPERAND (expr, 1) == NULL_TREE
3244 && !have_else_clause_p
3245 && TREE_OPERAND (expr, 2) != NULL_TREE)
3246 label_cont = label_true;
3247 else
3249 gimplify_seq_add_stmt (&seq, gimple_build_label (label_true));
3250 have_then_clause_p = gimplify_stmt (&TREE_OPERAND (expr, 1), &seq);
3251 /* For if (...) { code; } else {} or
3252 if (...) { code; } else goto label; or
3253 if (...) { code; return; } else { ... }
3254 label_cont isn't needed. */
3255 if (!have_else_clause_p
3256 && TREE_OPERAND (expr, 2) != NULL_TREE
3257 && gimple_seq_may_fallthru (seq))
3259 gimple *g;
3260 label_cont = create_artificial_label (UNKNOWN_LOCATION);
3262 g = gimple_build_goto (label_cont);
3264 /* GIMPLE_COND's are very low level; they have embedded
3265 gotos. This particular embedded goto should not be marked
3266 with the location of the original COND_EXPR, as it would
3267 correspond to the COND_EXPR's condition, not the ELSE or the
3268 THEN arms. To avoid marking it with the wrong location, flag
3269 it as "no location". */
3270 gimple_set_do_not_emit_location (g);
3272 gimplify_seq_add_stmt (&seq, g);
3276 if (!have_else_clause_p)
3278 gimplify_seq_add_stmt (&seq, gimple_build_label (label_false));
3279 have_else_clause_p = gimplify_stmt (&TREE_OPERAND (expr, 2), &seq);
3281 if (label_cont)
3282 gimplify_seq_add_stmt (&seq, gimple_build_label (label_cont));
3284 gimple_pop_condition (pre_p);
3285 gimple_seq_add_seq (pre_p, seq);
3287 if (ret == GS_ERROR)
3288 ; /* Do nothing. */
3289 else if (have_then_clause_p || have_else_clause_p)
3290 ret = GS_ALL_DONE;
3291 else
3293 /* Both arms are empty; replace the COND_EXPR with its predicate. */
3294 expr = TREE_OPERAND (expr, 0);
3295 gimplify_stmt (&expr, pre_p);
3298 *expr_p = NULL;
3299 return ret;
3302 /* Prepare the node pointed to by EXPR_P, an is_gimple_addressable expression,
3303 to be marked addressable.
3305 We cannot rely on such an expression being directly markable if a temporary
3306 has been created by the gimplification. In this case, we create another
3307 temporary and initialize it with a copy, which will become a store after we
3308 mark it addressable. This can happen if the front-end passed us something
3309 that it could not mark addressable yet, like a Fortran pass-by-reference
3310 parameter (int) floatvar. */
3312 static void
3313 prepare_gimple_addressable (tree *expr_p, gimple_seq *seq_p)
3315 while (handled_component_p (*expr_p))
3316 expr_p = &TREE_OPERAND (*expr_p, 0);
3317 if (is_gimple_reg (*expr_p))
3319 tree var = get_initialized_tmp_var (*expr_p, seq_p, NULL);
3320 DECL_GIMPLE_REG_P (var) = 0;
3321 *expr_p = var;
3325 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
3326 a call to __builtin_memcpy. */
3328 static enum gimplify_status
3329 gimplify_modify_expr_to_memcpy (tree *expr_p, tree size, bool want_value,
3330 gimple_seq *seq_p)
3332 tree t, to, to_ptr, from, from_ptr;
3333 gcall *gs;
3334 location_t loc = EXPR_LOCATION (*expr_p);
3336 to = TREE_OPERAND (*expr_p, 0);
3337 from = TREE_OPERAND (*expr_p, 1);
3339 /* Mark the RHS addressable. Beware that it may not be possible to do so
3340 directly if a temporary has been created by the gimplification. */
3341 prepare_gimple_addressable (&from, seq_p);
3343 mark_addressable (from);
3344 from_ptr = build_fold_addr_expr_loc (loc, from);
3345 gimplify_arg (&from_ptr, seq_p, loc);
3347 mark_addressable (to);
3348 to_ptr = build_fold_addr_expr_loc (loc, to);
3349 gimplify_arg (&to_ptr, seq_p, loc);
3351 t = builtin_decl_implicit (BUILT_IN_MEMCPY);
3353 gs = gimple_build_call (t, 3, to_ptr, from_ptr, size);
3355 if (want_value)
3357 /* tmp = memcpy() */
3358 t = create_tmp_var (TREE_TYPE (to_ptr));
3359 gimple_call_set_lhs (gs, t);
3360 gimplify_seq_add_stmt (seq_p, gs);
3362 *expr_p = build_simple_mem_ref (t);
3363 return GS_ALL_DONE;
3366 gimplify_seq_add_stmt (seq_p, gs);
3367 *expr_p = NULL;
3368 return GS_ALL_DONE;
3371 /* A subroutine of gimplify_modify_expr. Replace a MODIFY_EXPR with
3372 a call to __builtin_memset. In this case we know that the RHS is
3373 a CONSTRUCTOR with an empty element list. */
3375 static enum gimplify_status
3376 gimplify_modify_expr_to_memset (tree *expr_p, tree size, bool want_value,
3377 gimple_seq *seq_p)
3379 tree t, from, to, to_ptr;
3380 gcall *gs;
3381 location_t loc = EXPR_LOCATION (*expr_p);
3383 /* Assert our assumptions, to abort instead of producing wrong code
3384 silently if they are not met. Beware that the RHS CONSTRUCTOR might
3385 not be immediately exposed. */
3386 from = TREE_OPERAND (*expr_p, 1);
3387 if (TREE_CODE (from) == WITH_SIZE_EXPR)
3388 from = TREE_OPERAND (from, 0);
3390 gcc_assert (TREE_CODE (from) == CONSTRUCTOR
3391 && vec_safe_is_empty (CONSTRUCTOR_ELTS (from)));
3393 /* Now proceed. */
3394 to = TREE_OPERAND (*expr_p, 0);
3396 to_ptr = build_fold_addr_expr_loc (loc, to);
3397 gimplify_arg (&to_ptr, seq_p, loc);
3398 t = builtin_decl_implicit (BUILT_IN_MEMSET);
3400 gs = gimple_build_call (t, 3, to_ptr, integer_zero_node, size);
3402 if (want_value)
3404 /* tmp = memset() */
3405 t = create_tmp_var (TREE_TYPE (to_ptr));
3406 gimple_call_set_lhs (gs, t);
3407 gimplify_seq_add_stmt (seq_p, gs);
3409 *expr_p = build1 (INDIRECT_REF, TREE_TYPE (to), t);
3410 return GS_ALL_DONE;
3413 gimplify_seq_add_stmt (seq_p, gs);
3414 *expr_p = NULL;
3415 return GS_ALL_DONE;
3418 /* A subroutine of gimplify_init_ctor_preeval. Called via walk_tree,
3419 determine, cautiously, if a CONSTRUCTOR overlaps the lhs of an
3420 assignment. Return non-null if we detect a potential overlap. */
3422 struct gimplify_init_ctor_preeval_data
3424 /* The base decl of the lhs object. May be NULL, in which case we
3425 have to assume the lhs is indirect. */
3426 tree lhs_base_decl;
3428 /* The alias set of the lhs object. */
3429 alias_set_type lhs_alias_set;
3432 static tree
3433 gimplify_init_ctor_preeval_1 (tree *tp, int *walk_subtrees, void *xdata)
3435 struct gimplify_init_ctor_preeval_data *data
3436 = (struct gimplify_init_ctor_preeval_data *) xdata;
3437 tree t = *tp;
3439 /* If we find the base object, obviously we have overlap. */
3440 if (data->lhs_base_decl == t)
3441 return t;
3443 /* If the constructor component is indirect, determine if we have a
3444 potential overlap with the lhs. The only bits of information we
3445 have to go on at this point are addressability and alias sets. */
3446 if ((INDIRECT_REF_P (t)
3447 || TREE_CODE (t) == MEM_REF)
3448 && (!data->lhs_base_decl || TREE_ADDRESSABLE (data->lhs_base_decl))
3449 && alias_sets_conflict_p (data->lhs_alias_set, get_alias_set (t)))
3450 return t;
3452 /* If the constructor component is a call, determine if it can hide a
3453 potential overlap with the lhs through an INDIRECT_REF like above.
3454 ??? Ugh - this is completely broken. In fact this whole analysis
3455 doesn't look conservative. */
3456 if (TREE_CODE (t) == CALL_EXPR)
3458 tree type, fntype = TREE_TYPE (TREE_TYPE (CALL_EXPR_FN (t)));
3460 for (type = TYPE_ARG_TYPES (fntype); type; type = TREE_CHAIN (type))
3461 if (POINTER_TYPE_P (TREE_VALUE (type))
3462 && (!data->lhs_base_decl || TREE_ADDRESSABLE (data->lhs_base_decl))
3463 && alias_sets_conflict_p (data->lhs_alias_set,
3464 get_alias_set
3465 (TREE_TYPE (TREE_VALUE (type)))))
3466 return t;
3469 if (IS_TYPE_OR_DECL_P (t))
3470 *walk_subtrees = 0;
3471 return NULL;
3474 /* A subroutine of gimplify_init_constructor. Pre-evaluate EXPR,
3475 force values that overlap with the lhs (as described by *DATA)
3476 into temporaries. */
3478 static void
3479 gimplify_init_ctor_preeval (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
3480 struct gimplify_init_ctor_preeval_data *data)
3482 enum gimplify_status one;
3484 /* If the value is constant, then there's nothing to pre-evaluate. */
3485 if (TREE_CONSTANT (*expr_p))
3487 /* Ensure it does not have side effects, it might contain a reference to
3488 the object we're initializing. */
3489 gcc_assert (!TREE_SIDE_EFFECTS (*expr_p));
3490 return;
3493 /* If the type has non-trivial constructors, we can't pre-evaluate. */
3494 if (TREE_ADDRESSABLE (TREE_TYPE (*expr_p)))
3495 return;
3497 /* Recurse for nested constructors. */
3498 if (TREE_CODE (*expr_p) == CONSTRUCTOR)
3500 unsigned HOST_WIDE_INT ix;
3501 constructor_elt *ce;
3502 vec<constructor_elt, va_gc> *v = CONSTRUCTOR_ELTS (*expr_p);
3504 FOR_EACH_VEC_SAFE_ELT (v, ix, ce)
3505 gimplify_init_ctor_preeval (&ce->value, pre_p, post_p, data);
3507 return;
3510 /* If this is a variable sized type, we must remember the size. */
3511 maybe_with_size_expr (expr_p);
3513 /* Gimplify the constructor element to something appropriate for the rhs
3514 of a MODIFY_EXPR. Given that we know the LHS is an aggregate, we know
3515 the gimplifier will consider this a store to memory. Doing this
3516 gimplification now means that we won't have to deal with complicated
3517 language-specific trees, nor trees like SAVE_EXPR that can induce
3518 exponential search behavior. */
3519 one = gimplify_expr (expr_p, pre_p, post_p, is_gimple_mem_rhs, fb_rvalue);
3520 if (one == GS_ERROR)
3522 *expr_p = NULL;
3523 return;
3526 /* If we gimplified to a bare decl, we can be sure that it doesn't overlap
3527 with the lhs, since "a = { .x=a }" doesn't make sense. This will
3528 always be true for all scalars, since is_gimple_mem_rhs insists on a
3529 temporary variable for them. */
3530 if (DECL_P (*expr_p))
3531 return;
3533 /* If this is of variable size, we have no choice but to assume it doesn't
3534 overlap since we can't make a temporary for it. */
3535 if (TREE_CODE (TYPE_SIZE (TREE_TYPE (*expr_p))) != INTEGER_CST)
3536 return;
3538 /* Otherwise, we must search for overlap ... */
3539 if (!walk_tree (expr_p, gimplify_init_ctor_preeval_1, data, NULL))
3540 return;
3542 /* ... and if found, force the value into a temporary. */
3543 *expr_p = get_formal_tmp_var (*expr_p, pre_p);
3546 /* A subroutine of gimplify_init_ctor_eval. Create a loop for
3547 a RANGE_EXPR in a CONSTRUCTOR for an array.
3549 var = lower;
3550 loop_entry:
3551 object[var] = value;
3552 if (var == upper)
3553 goto loop_exit;
3554 var = var + 1;
3555 goto loop_entry;
3556 loop_exit:
3558 We increment var _after_ the loop exit check because we might otherwise
3559 fail if upper == TYPE_MAX_VALUE (type for upper).
3561 Note that we never have to deal with SAVE_EXPRs here, because this has
3562 already been taken care of for us, in gimplify_init_ctor_preeval(). */
3564 static void gimplify_init_ctor_eval (tree, vec<constructor_elt, va_gc> *,
3565 gimple_seq *, bool);
3567 static void
3568 gimplify_init_ctor_eval_range (tree object, tree lower, tree upper,
3569 tree value, tree array_elt_type,
3570 gimple_seq *pre_p, bool cleared)
3572 tree loop_entry_label, loop_exit_label, fall_thru_label;
3573 tree var, var_type, cref, tmp;
3575 loop_entry_label = create_artificial_label (UNKNOWN_LOCATION);
3576 loop_exit_label = create_artificial_label (UNKNOWN_LOCATION);
3577 fall_thru_label = create_artificial_label (UNKNOWN_LOCATION);
3579 /* Create and initialize the index variable. */
3580 var_type = TREE_TYPE (upper);
3581 var = create_tmp_var (var_type);
3582 gimplify_seq_add_stmt (pre_p, gimple_build_assign (var, lower));
3584 /* Add the loop entry label. */
3585 gimplify_seq_add_stmt (pre_p, gimple_build_label (loop_entry_label));
3587 /* Build the reference. */
3588 cref = build4 (ARRAY_REF, array_elt_type, unshare_expr (object),
3589 var, NULL_TREE, NULL_TREE);
3591 /* If we are a constructor, just call gimplify_init_ctor_eval to do
3592 the store. Otherwise just assign value to the reference. */
3594 if (TREE_CODE (value) == CONSTRUCTOR)
3595 /* NB we might have to call ourself recursively through
3596 gimplify_init_ctor_eval if the value is a constructor. */
3597 gimplify_init_ctor_eval (cref, CONSTRUCTOR_ELTS (value),
3598 pre_p, cleared);
3599 else
3600 gimplify_seq_add_stmt (pre_p, gimple_build_assign (cref, value));
3602 /* We exit the loop when the index var is equal to the upper bound. */
3603 gimplify_seq_add_stmt (pre_p,
3604 gimple_build_cond (EQ_EXPR, var, upper,
3605 loop_exit_label, fall_thru_label));
3607 gimplify_seq_add_stmt (pre_p, gimple_build_label (fall_thru_label));
3609 /* Otherwise, increment the index var... */
3610 tmp = build2 (PLUS_EXPR, var_type, var,
3611 fold_convert (var_type, integer_one_node));
3612 gimplify_seq_add_stmt (pre_p, gimple_build_assign (var, tmp));
3614 /* ...and jump back to the loop entry. */
3615 gimplify_seq_add_stmt (pre_p, gimple_build_goto (loop_entry_label));
3617 /* Add the loop exit label. */
3618 gimplify_seq_add_stmt (pre_p, gimple_build_label (loop_exit_label));
3621 /* Return true if FDECL is accessing a field that is zero sized. */
3623 static bool
3624 zero_sized_field_decl (const_tree fdecl)
3626 if (TREE_CODE (fdecl) == FIELD_DECL && DECL_SIZE (fdecl)
3627 && integer_zerop (DECL_SIZE (fdecl)))
3628 return true;
3629 return false;
3632 /* Return true if TYPE is zero sized. */
3634 static bool
3635 zero_sized_type (const_tree type)
3637 if (AGGREGATE_TYPE_P (type) && TYPE_SIZE (type)
3638 && integer_zerop (TYPE_SIZE (type)))
3639 return true;
3640 return false;
3643 /* A subroutine of gimplify_init_constructor. Generate individual
3644 MODIFY_EXPRs for a CONSTRUCTOR. OBJECT is the LHS against which the
3645 assignments should happen. ELTS is the CONSTRUCTOR_ELTS of the
3646 CONSTRUCTOR. CLEARED is true if the entire LHS object has been
3647 zeroed first. */
3649 static void
3650 gimplify_init_ctor_eval (tree object, vec<constructor_elt, va_gc> *elts,
3651 gimple_seq *pre_p, bool cleared)
3653 tree array_elt_type = NULL;
3654 unsigned HOST_WIDE_INT ix;
3655 tree purpose, value;
3657 if (TREE_CODE (TREE_TYPE (object)) == ARRAY_TYPE)
3658 array_elt_type = TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (object)));
3660 FOR_EACH_CONSTRUCTOR_ELT (elts, ix, purpose, value)
3662 tree cref;
3664 /* NULL values are created above for gimplification errors. */
3665 if (value == NULL)
3666 continue;
3668 if (cleared && initializer_zerop (value))
3669 continue;
3671 /* ??? Here's to hoping the front end fills in all of the indices,
3672 so we don't have to figure out what's missing ourselves. */
3673 gcc_assert (purpose);
3675 /* Skip zero-sized fields, unless value has side-effects. This can
3676 happen with calls to functions returning a zero-sized type, which
3677 we shouldn't discard. As a number of downstream passes don't
3678 expect sets of zero-sized fields, we rely on the gimplification of
3679 the MODIFY_EXPR we make below to drop the assignment statement. */
3680 if (! TREE_SIDE_EFFECTS (value) && zero_sized_field_decl (purpose))
3681 continue;
3683 /* If we have a RANGE_EXPR, we have to build a loop to assign the
3684 whole range. */
3685 if (TREE_CODE (purpose) == RANGE_EXPR)
3687 tree lower = TREE_OPERAND (purpose, 0);
3688 tree upper = TREE_OPERAND (purpose, 1);
3690 /* If the lower bound is equal to upper, just treat it as if
3691 upper was the index. */
3692 if (simple_cst_equal (lower, upper))
3693 purpose = upper;
3694 else
3696 gimplify_init_ctor_eval_range (object, lower, upper, value,
3697 array_elt_type, pre_p, cleared);
3698 continue;
3702 if (array_elt_type)
3704 /* Do not use bitsizetype for ARRAY_REF indices. */
3705 if (TYPE_DOMAIN (TREE_TYPE (object)))
3706 purpose
3707 = fold_convert (TREE_TYPE (TYPE_DOMAIN (TREE_TYPE (object))),
3708 purpose);
3709 cref = build4 (ARRAY_REF, array_elt_type, unshare_expr (object),
3710 purpose, NULL_TREE, NULL_TREE);
3712 else
3714 gcc_assert (TREE_CODE (purpose) == FIELD_DECL);
3715 cref = build3 (COMPONENT_REF, TREE_TYPE (purpose),
3716 unshare_expr (object), purpose, NULL_TREE);
3719 if (TREE_CODE (value) == CONSTRUCTOR
3720 && TREE_CODE (TREE_TYPE (value)) != VECTOR_TYPE)
3721 gimplify_init_ctor_eval (cref, CONSTRUCTOR_ELTS (value),
3722 pre_p, cleared);
3723 else
3725 tree init = build2 (INIT_EXPR, TREE_TYPE (cref), cref, value);
3726 gimplify_and_add (init, pre_p);
3727 ggc_free (init);
3732 /* Return the appropriate RHS predicate for this LHS. */
3734 gimple_predicate
3735 rhs_predicate_for (tree lhs)
3737 if (is_gimple_reg (lhs))
3738 return is_gimple_reg_rhs_or_call;
3739 else
3740 return is_gimple_mem_rhs_or_call;
3743 /* Gimplify a C99 compound literal expression. This just means adding
3744 the DECL_EXPR before the current statement and using its anonymous
3745 decl instead. */
3747 static enum gimplify_status
3748 gimplify_compound_literal_expr (tree *expr_p, gimple_seq *pre_p,
3749 bool (*gimple_test_f) (tree),
3750 fallback_t fallback)
3752 tree decl_s = COMPOUND_LITERAL_EXPR_DECL_EXPR (*expr_p);
3753 tree decl = DECL_EXPR_DECL (decl_s);
3754 tree init = DECL_INITIAL (decl);
3755 /* Mark the decl as addressable if the compound literal
3756 expression is addressable now, otherwise it is marked too late
3757 after we gimplify the initialization expression. */
3758 if (TREE_ADDRESSABLE (*expr_p))
3759 TREE_ADDRESSABLE (decl) = 1;
3760 /* Otherwise, if we don't need an lvalue and have a literal directly
3761 substitute it. Check if it matches the gimple predicate, as
3762 otherwise we'd generate a new temporary, and we can as well just
3763 use the decl we already have. */
3764 else if (!TREE_ADDRESSABLE (decl)
3765 && init
3766 && (fallback & fb_lvalue) == 0
3767 && gimple_test_f (init))
3769 *expr_p = init;
3770 return GS_OK;
3773 /* Preliminarily mark non-addressed complex variables as eligible
3774 for promotion to gimple registers. We'll transform their uses
3775 as we find them. */
3776 if ((TREE_CODE (TREE_TYPE (decl)) == COMPLEX_TYPE
3777 || TREE_CODE (TREE_TYPE (decl)) == VECTOR_TYPE)
3778 && !TREE_THIS_VOLATILE (decl)
3779 && !needs_to_live_in_memory (decl))
3780 DECL_GIMPLE_REG_P (decl) = 1;
3782 /* If the decl is not addressable, then it is being used in some
3783 expression or on the right hand side of a statement, and it can
3784 be put into a readonly data section. */
3785 if (!TREE_ADDRESSABLE (decl) && (fallback & fb_lvalue) == 0)
3786 TREE_READONLY (decl) = 1;
3788 /* This decl isn't mentioned in the enclosing block, so add it to the
3789 list of temps. FIXME it seems a bit of a kludge to say that
3790 anonymous artificial vars aren't pushed, but everything else is. */
3791 if (DECL_NAME (decl) == NULL_TREE && !DECL_SEEN_IN_BIND_EXPR_P (decl))
3792 gimple_add_tmp_var (decl);
3794 gimplify_and_add (decl_s, pre_p);
3795 *expr_p = decl;
3796 return GS_OK;
3799 /* Optimize embedded COMPOUND_LITERAL_EXPRs within a CONSTRUCTOR,
3800 return a new CONSTRUCTOR if something changed. */
3802 static tree
3803 optimize_compound_literals_in_ctor (tree orig_ctor)
3805 tree ctor = orig_ctor;
3806 vec<constructor_elt, va_gc> *elts = CONSTRUCTOR_ELTS (ctor);
3807 unsigned int idx, num = vec_safe_length (elts);
3809 for (idx = 0; idx < num; idx++)
3811 tree value = (*elts)[idx].value;
3812 tree newval = value;
3813 if (TREE_CODE (value) == CONSTRUCTOR)
3814 newval = optimize_compound_literals_in_ctor (value);
3815 else if (TREE_CODE (value) == COMPOUND_LITERAL_EXPR)
3817 tree decl_s = COMPOUND_LITERAL_EXPR_DECL_EXPR (value);
3818 tree decl = DECL_EXPR_DECL (decl_s);
3819 tree init = DECL_INITIAL (decl);
3821 if (!TREE_ADDRESSABLE (value)
3822 && !TREE_ADDRESSABLE (decl)
3823 && init
3824 && TREE_CODE (init) == CONSTRUCTOR)
3825 newval = optimize_compound_literals_in_ctor (init);
3827 if (newval == value)
3828 continue;
3830 if (ctor == orig_ctor)
3832 ctor = copy_node (orig_ctor);
3833 CONSTRUCTOR_ELTS (ctor) = vec_safe_copy (elts);
3834 elts = CONSTRUCTOR_ELTS (ctor);
3836 (*elts)[idx].value = newval;
3838 return ctor;
3841 /* A subroutine of gimplify_modify_expr. Break out elements of a
3842 CONSTRUCTOR used as an initializer into separate MODIFY_EXPRs.
3844 Note that we still need to clear any elements that don't have explicit
3845 initializers, so if not all elements are initialized we keep the
3846 original MODIFY_EXPR, we just remove all of the constructor elements.
3848 If NOTIFY_TEMP_CREATION is true, do not gimplify, just return
3849 GS_ERROR if we would have to create a temporary when gimplifying
3850 this constructor. Otherwise, return GS_OK.
3852 If NOTIFY_TEMP_CREATION is false, just do the gimplification. */
3854 static enum gimplify_status
3855 gimplify_init_constructor (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
3856 bool want_value, bool notify_temp_creation)
3858 tree object, ctor, type;
3859 enum gimplify_status ret;
3860 vec<constructor_elt, va_gc> *elts;
3862 gcc_assert (TREE_CODE (TREE_OPERAND (*expr_p, 1)) == CONSTRUCTOR);
3864 if (!notify_temp_creation)
3866 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
3867 is_gimple_lvalue, fb_lvalue);
3868 if (ret == GS_ERROR)
3869 return ret;
3872 object = TREE_OPERAND (*expr_p, 0);
3873 ctor = TREE_OPERAND (*expr_p, 1) =
3874 optimize_compound_literals_in_ctor (TREE_OPERAND (*expr_p, 1));
3875 type = TREE_TYPE (ctor);
3876 elts = CONSTRUCTOR_ELTS (ctor);
3877 ret = GS_ALL_DONE;
3879 switch (TREE_CODE (type))
3881 case RECORD_TYPE:
3882 case UNION_TYPE:
3883 case QUAL_UNION_TYPE:
3884 case ARRAY_TYPE:
3886 struct gimplify_init_ctor_preeval_data preeval_data;
3887 HOST_WIDE_INT num_ctor_elements, num_nonzero_elements;
3888 bool cleared, complete_p, valid_const_initializer;
3890 /* Aggregate types must lower constructors to initialization of
3891 individual elements. The exception is that a CONSTRUCTOR node
3892 with no elements indicates zero-initialization of the whole. */
3893 if (vec_safe_is_empty (elts))
3895 if (notify_temp_creation)
3896 return GS_OK;
3897 break;
3900 /* Fetch information about the constructor to direct later processing.
3901 We might want to make static versions of it in various cases, and
3902 can only do so if it known to be a valid constant initializer. */
3903 valid_const_initializer
3904 = categorize_ctor_elements (ctor, &num_nonzero_elements,
3905 &num_ctor_elements, &complete_p);
3907 /* If a const aggregate variable is being initialized, then it
3908 should never be a lose to promote the variable to be static. */
3909 if (valid_const_initializer
3910 && num_nonzero_elements > 1
3911 && TREE_READONLY (object)
3912 && TREE_CODE (object) == VAR_DECL
3913 && (flag_merge_constants >= 2 || !TREE_ADDRESSABLE (object)))
3915 if (notify_temp_creation)
3916 return GS_ERROR;
3917 DECL_INITIAL (object) = ctor;
3918 TREE_STATIC (object) = 1;
3919 if (!DECL_NAME (object))
3920 DECL_NAME (object) = create_tmp_var_name ("C");
3921 walk_tree (&DECL_INITIAL (object), force_labels_r, NULL, NULL);
3923 /* ??? C++ doesn't automatically append a .<number> to the
3924 assembler name, and even when it does, it looks at FE private
3925 data structures to figure out what that number should be,
3926 which are not set for this variable. I suppose this is
3927 important for local statics for inline functions, which aren't
3928 "local" in the object file sense. So in order to get a unique
3929 TU-local symbol, we must invoke the lhd version now. */
3930 lhd_set_decl_assembler_name (object);
3932 *expr_p = NULL_TREE;
3933 break;
3936 /* If there are "lots" of initialized elements, even discounting
3937 those that are not address constants (and thus *must* be
3938 computed at runtime), then partition the constructor into
3939 constant and non-constant parts. Block copy the constant
3940 parts in, then generate code for the non-constant parts. */
3941 /* TODO. There's code in cp/typeck.c to do this. */
3943 if (int_size_in_bytes (TREE_TYPE (ctor)) < 0)
3944 /* store_constructor will ignore the clearing of variable-sized
3945 objects. Initializers for such objects must explicitly set
3946 every field that needs to be set. */
3947 cleared = false;
3948 else if (!complete_p && !CONSTRUCTOR_NO_CLEARING (ctor))
3949 /* If the constructor isn't complete, clear the whole object
3950 beforehand, unless CONSTRUCTOR_NO_CLEARING is set on it.
3952 ??? This ought not to be needed. For any element not present
3953 in the initializer, we should simply set them to zero. Except
3954 we'd need to *find* the elements that are not present, and that
3955 requires trickery to avoid quadratic compile-time behavior in
3956 large cases or excessive memory use in small cases. */
3957 cleared = true;
3958 else if (num_ctor_elements - num_nonzero_elements
3959 > CLEAR_RATIO (optimize_function_for_speed_p (cfun))
3960 && num_nonzero_elements < num_ctor_elements / 4)
3961 /* If there are "lots" of zeros, it's more efficient to clear
3962 the memory and then set the nonzero elements. */
3963 cleared = true;
3964 else
3965 cleared = false;
3967 /* If there are "lots" of initialized elements, and all of them
3968 are valid address constants, then the entire initializer can
3969 be dropped to memory, and then memcpy'd out. Don't do this
3970 for sparse arrays, though, as it's more efficient to follow
3971 the standard CONSTRUCTOR behavior of memset followed by
3972 individual element initialization. Also don't do this for small
3973 all-zero initializers (which aren't big enough to merit
3974 clearing), and don't try to make bitwise copies of
3975 TREE_ADDRESSABLE types.
3977 We cannot apply such transformation when compiling chkp static
3978 initializer because creation of initializer image in the memory
3979 will require static initialization of bounds for it. It should
3980 result in another gimplification of similar initializer and we
3981 may fall into infinite loop. */
3982 if (valid_const_initializer
3983 && !(cleared || num_nonzero_elements == 0)
3984 && !TREE_ADDRESSABLE (type)
3985 && (!current_function_decl
3986 || !lookup_attribute ("chkp ctor",
3987 DECL_ATTRIBUTES (current_function_decl))))
3989 HOST_WIDE_INT size = int_size_in_bytes (type);
3990 unsigned int align;
3992 /* ??? We can still get unbounded array types, at least
3993 from the C++ front end. This seems wrong, but attempt
3994 to work around it for now. */
3995 if (size < 0)
3997 size = int_size_in_bytes (TREE_TYPE (object));
3998 if (size >= 0)
3999 TREE_TYPE (ctor) = type = TREE_TYPE (object);
4002 /* Find the maximum alignment we can assume for the object. */
4003 /* ??? Make use of DECL_OFFSET_ALIGN. */
4004 if (DECL_P (object))
4005 align = DECL_ALIGN (object);
4006 else
4007 align = TYPE_ALIGN (type);
4009 /* Do a block move either if the size is so small as to make
4010 each individual move a sub-unit move on average, or if it
4011 is so large as to make individual moves inefficient. */
4012 if (size > 0
4013 && num_nonzero_elements > 1
4014 && (size < num_nonzero_elements
4015 || !can_move_by_pieces (size, align)))
4017 if (notify_temp_creation)
4018 return GS_ERROR;
4020 walk_tree (&ctor, force_labels_r, NULL, NULL);
4021 ctor = tree_output_constant_def (ctor);
4022 if (!useless_type_conversion_p (type, TREE_TYPE (ctor)))
4023 ctor = build1 (VIEW_CONVERT_EXPR, type, ctor);
4024 TREE_OPERAND (*expr_p, 1) = ctor;
4026 /* This is no longer an assignment of a CONSTRUCTOR, but
4027 we still may have processing to do on the LHS. So
4028 pretend we didn't do anything here to let that happen. */
4029 return GS_UNHANDLED;
4033 /* If the target is volatile, we have non-zero elements and more than
4034 one field to assign, initialize the target from a temporary. */
4035 if (TREE_THIS_VOLATILE (object)
4036 && !TREE_ADDRESSABLE (type)
4037 && num_nonzero_elements > 0
4038 && vec_safe_length (elts) > 1)
4040 tree temp = create_tmp_var (TYPE_MAIN_VARIANT (type));
4041 TREE_OPERAND (*expr_p, 0) = temp;
4042 *expr_p = build2 (COMPOUND_EXPR, TREE_TYPE (*expr_p),
4043 *expr_p,
4044 build2 (MODIFY_EXPR, void_type_node,
4045 object, temp));
4046 return GS_OK;
4049 if (notify_temp_creation)
4050 return GS_OK;
4052 /* If there are nonzero elements and if needed, pre-evaluate to capture
4053 elements overlapping with the lhs into temporaries. We must do this
4054 before clearing to fetch the values before they are zeroed-out. */
4055 if (num_nonzero_elements > 0 && TREE_CODE (*expr_p) != INIT_EXPR)
4057 preeval_data.lhs_base_decl = get_base_address (object);
4058 if (!DECL_P (preeval_data.lhs_base_decl))
4059 preeval_data.lhs_base_decl = NULL;
4060 preeval_data.lhs_alias_set = get_alias_set (object);
4062 gimplify_init_ctor_preeval (&TREE_OPERAND (*expr_p, 1),
4063 pre_p, post_p, &preeval_data);
4066 bool ctor_has_side_effects_p
4067 = TREE_SIDE_EFFECTS (TREE_OPERAND (*expr_p, 1));
4069 if (cleared)
4071 /* Zap the CONSTRUCTOR element list, which simplifies this case.
4072 Note that we still have to gimplify, in order to handle the
4073 case of variable sized types. Avoid shared tree structures. */
4074 CONSTRUCTOR_ELTS (ctor) = NULL;
4075 TREE_SIDE_EFFECTS (ctor) = 0;
4076 object = unshare_expr (object);
4077 gimplify_stmt (expr_p, pre_p);
4080 /* If we have not block cleared the object, or if there are nonzero
4081 elements in the constructor, or if the constructor has side effects,
4082 add assignments to the individual scalar fields of the object. */
4083 if (!cleared
4084 || num_nonzero_elements > 0
4085 || ctor_has_side_effects_p)
4086 gimplify_init_ctor_eval (object, elts, pre_p, cleared);
4088 *expr_p = NULL_TREE;
4090 break;
4092 case COMPLEX_TYPE:
4094 tree r, i;
4096 if (notify_temp_creation)
4097 return GS_OK;
4099 /* Extract the real and imaginary parts out of the ctor. */
4100 gcc_assert (elts->length () == 2);
4101 r = (*elts)[0].value;
4102 i = (*elts)[1].value;
4103 if (r == NULL || i == NULL)
4105 tree zero = build_zero_cst (TREE_TYPE (type));
4106 if (r == NULL)
4107 r = zero;
4108 if (i == NULL)
4109 i = zero;
4112 /* Complex types have either COMPLEX_CST or COMPLEX_EXPR to
4113 represent creation of a complex value. */
4114 if (TREE_CONSTANT (r) && TREE_CONSTANT (i))
4116 ctor = build_complex (type, r, i);
4117 TREE_OPERAND (*expr_p, 1) = ctor;
4119 else
4121 ctor = build2 (COMPLEX_EXPR, type, r, i);
4122 TREE_OPERAND (*expr_p, 1) = ctor;
4123 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 1),
4124 pre_p,
4125 post_p,
4126 rhs_predicate_for (TREE_OPERAND (*expr_p, 0)),
4127 fb_rvalue);
4130 break;
4132 case VECTOR_TYPE:
4134 unsigned HOST_WIDE_INT ix;
4135 constructor_elt *ce;
4137 if (notify_temp_creation)
4138 return GS_OK;
4140 /* Go ahead and simplify constant constructors to VECTOR_CST. */
4141 if (TREE_CONSTANT (ctor))
4143 bool constant_p = true;
4144 tree value;
4146 /* Even when ctor is constant, it might contain non-*_CST
4147 elements, such as addresses or trapping values like
4148 1.0/0.0 - 1.0/0.0. Such expressions don't belong
4149 in VECTOR_CST nodes. */
4150 FOR_EACH_CONSTRUCTOR_VALUE (elts, ix, value)
4151 if (!CONSTANT_CLASS_P (value))
4153 constant_p = false;
4154 break;
4157 if (constant_p)
4159 TREE_OPERAND (*expr_p, 1) = build_vector_from_ctor (type, elts);
4160 break;
4163 TREE_CONSTANT (ctor) = 0;
4166 /* Vector types use CONSTRUCTOR all the way through gimple
4167 compilation as a general initializer. */
4168 FOR_EACH_VEC_SAFE_ELT (elts, ix, ce)
4170 enum gimplify_status tret;
4171 tret = gimplify_expr (&ce->value, pre_p, post_p, is_gimple_val,
4172 fb_rvalue);
4173 if (tret == GS_ERROR)
4174 ret = GS_ERROR;
4175 else if (TREE_STATIC (ctor)
4176 && !initializer_constant_valid_p (ce->value,
4177 TREE_TYPE (ce->value)))
4178 TREE_STATIC (ctor) = 0;
4180 if (!is_gimple_reg (TREE_OPERAND (*expr_p, 0)))
4181 TREE_OPERAND (*expr_p, 1) = get_formal_tmp_var (ctor, pre_p);
4183 break;
4185 default:
4186 /* So how did we get a CONSTRUCTOR for a scalar type? */
4187 gcc_unreachable ();
4190 if (ret == GS_ERROR)
4191 return GS_ERROR;
4192 /* If we have gimplified both sides of the initializer but have
4193 not emitted an assignment, do so now. */
4194 if (*expr_p)
4196 tree lhs = TREE_OPERAND (*expr_p, 0);
4197 tree rhs = TREE_OPERAND (*expr_p, 1);
4198 gassign *init = gimple_build_assign (lhs, rhs);
4199 gimplify_seq_add_stmt (pre_p, init);
4201 if (want_value)
4203 *expr_p = object;
4204 return GS_OK;
4206 else
4208 *expr_p = NULL;
4209 return GS_ALL_DONE;
4213 /* Given a pointer value OP0, return a simplified version of an
4214 indirection through OP0, or NULL_TREE if no simplification is
4215 possible. This may only be applied to a rhs of an expression.
4216 Note that the resulting type may be different from the type pointed
4217 to in the sense that it is still compatible from the langhooks
4218 point of view. */
4220 static tree
4221 gimple_fold_indirect_ref_rhs (tree t)
4223 return gimple_fold_indirect_ref (t);
4226 /* Subroutine of gimplify_modify_expr to do simplifications of
4227 MODIFY_EXPRs based on the code of the RHS. We loop for as long as
4228 something changes. */
4230 static enum gimplify_status
4231 gimplify_modify_expr_rhs (tree *expr_p, tree *from_p, tree *to_p,
4232 gimple_seq *pre_p, gimple_seq *post_p,
4233 bool want_value)
4235 enum gimplify_status ret = GS_UNHANDLED;
4236 bool changed;
4240 changed = false;
4241 switch (TREE_CODE (*from_p))
4243 case VAR_DECL:
4244 /* If we're assigning from a read-only variable initialized with
4245 a constructor, do the direct assignment from the constructor,
4246 but only if neither source nor target are volatile since this
4247 latter assignment might end up being done on a per-field basis. */
4248 if (DECL_INITIAL (*from_p)
4249 && TREE_READONLY (*from_p)
4250 && !TREE_THIS_VOLATILE (*from_p)
4251 && !TREE_THIS_VOLATILE (*to_p)
4252 && TREE_CODE (DECL_INITIAL (*from_p)) == CONSTRUCTOR)
4254 tree old_from = *from_p;
4255 enum gimplify_status subret;
4257 /* Move the constructor into the RHS. */
4258 *from_p = unshare_expr (DECL_INITIAL (*from_p));
4260 /* Let's see if gimplify_init_constructor will need to put
4261 it in memory. */
4262 subret = gimplify_init_constructor (expr_p, NULL, NULL,
4263 false, true);
4264 if (subret == GS_ERROR)
4266 /* If so, revert the change. */
4267 *from_p = old_from;
4269 else
4271 ret = GS_OK;
4272 changed = true;
4275 break;
4276 case INDIRECT_REF:
4278 /* If we have code like
4280 *(const A*)(A*)&x
4282 where the type of "x" is a (possibly cv-qualified variant
4283 of "A"), treat the entire expression as identical to "x".
4284 This kind of code arises in C++ when an object is bound
4285 to a const reference, and if "x" is a TARGET_EXPR we want
4286 to take advantage of the optimization below. */
4287 bool volatile_p = TREE_THIS_VOLATILE (*from_p);
4288 tree t = gimple_fold_indirect_ref_rhs (TREE_OPERAND (*from_p, 0));
4289 if (t)
4291 if (TREE_THIS_VOLATILE (t) != volatile_p)
4293 if (DECL_P (t))
4294 t = build_simple_mem_ref_loc (EXPR_LOCATION (*from_p),
4295 build_fold_addr_expr (t));
4296 if (REFERENCE_CLASS_P (t))
4297 TREE_THIS_VOLATILE (t) = volatile_p;
4299 *from_p = t;
4300 ret = GS_OK;
4301 changed = true;
4303 break;
4306 case TARGET_EXPR:
4308 /* If we are initializing something from a TARGET_EXPR, strip the
4309 TARGET_EXPR and initialize it directly, if possible. This can't
4310 be done if the initializer is void, since that implies that the
4311 temporary is set in some non-trivial way.
4313 ??? What about code that pulls out the temp and uses it
4314 elsewhere? I think that such code never uses the TARGET_EXPR as
4315 an initializer. If I'm wrong, we'll die because the temp won't
4316 have any RTL. In that case, I guess we'll need to replace
4317 references somehow. */
4318 tree init = TARGET_EXPR_INITIAL (*from_p);
4320 if (init
4321 && !VOID_TYPE_P (TREE_TYPE (init)))
4323 *from_p = init;
4324 ret = GS_OK;
4325 changed = true;
4328 break;
4330 case COMPOUND_EXPR:
4331 /* Remove any COMPOUND_EXPR in the RHS so the following cases will be
4332 caught. */
4333 gimplify_compound_expr (from_p, pre_p, true);
4334 ret = GS_OK;
4335 changed = true;
4336 break;
4338 case CONSTRUCTOR:
4339 /* If we already made some changes, let the front end have a
4340 crack at this before we break it down. */
4341 if (ret != GS_UNHANDLED)
4342 break;
4343 /* If we're initializing from a CONSTRUCTOR, break this into
4344 individual MODIFY_EXPRs. */
4345 return gimplify_init_constructor (expr_p, pre_p, post_p, want_value,
4346 false);
4348 case COND_EXPR:
4349 /* If we're assigning to a non-register type, push the assignment
4350 down into the branches. This is mandatory for ADDRESSABLE types,
4351 since we cannot generate temporaries for such, but it saves a
4352 copy in other cases as well. */
4353 if (!is_gimple_reg_type (TREE_TYPE (*from_p)))
4355 /* This code should mirror the code in gimplify_cond_expr. */
4356 enum tree_code code = TREE_CODE (*expr_p);
4357 tree cond = *from_p;
4358 tree result = *to_p;
4360 ret = gimplify_expr (&result, pre_p, post_p,
4361 is_gimple_lvalue, fb_lvalue);
4362 if (ret != GS_ERROR)
4363 ret = GS_OK;
4365 if (TREE_TYPE (TREE_OPERAND (cond, 1)) != void_type_node)
4366 TREE_OPERAND (cond, 1)
4367 = build2 (code, void_type_node, result,
4368 TREE_OPERAND (cond, 1));
4369 if (TREE_TYPE (TREE_OPERAND (cond, 2)) != void_type_node)
4370 TREE_OPERAND (cond, 2)
4371 = build2 (code, void_type_node, unshare_expr (result),
4372 TREE_OPERAND (cond, 2));
4374 TREE_TYPE (cond) = void_type_node;
4375 recalculate_side_effects (cond);
4377 if (want_value)
4379 gimplify_and_add (cond, pre_p);
4380 *expr_p = unshare_expr (result);
4382 else
4383 *expr_p = cond;
4384 return ret;
4386 break;
4388 case CALL_EXPR:
4389 /* For calls that return in memory, give *to_p as the CALL_EXPR's
4390 return slot so that we don't generate a temporary. */
4391 if (!CALL_EXPR_RETURN_SLOT_OPT (*from_p)
4392 && aggregate_value_p (*from_p, *from_p))
4394 bool use_target;
4396 if (!(rhs_predicate_for (*to_p))(*from_p))
4397 /* If we need a temporary, *to_p isn't accurate. */
4398 use_target = false;
4399 /* It's OK to use the return slot directly unless it's an NRV. */
4400 else if (TREE_CODE (*to_p) == RESULT_DECL
4401 && DECL_NAME (*to_p) == NULL_TREE
4402 && needs_to_live_in_memory (*to_p))
4403 use_target = true;
4404 else if (is_gimple_reg_type (TREE_TYPE (*to_p))
4405 || (DECL_P (*to_p) && DECL_REGISTER (*to_p)))
4406 /* Don't force regs into memory. */
4407 use_target = false;
4408 else if (TREE_CODE (*expr_p) == INIT_EXPR)
4409 /* It's OK to use the target directly if it's being
4410 initialized. */
4411 use_target = true;
4412 else if (TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (*to_p)))
4413 != INTEGER_CST)
4414 /* Always use the target and thus RSO for variable-sized types.
4415 GIMPLE cannot deal with a variable-sized assignment
4416 embedded in a call statement. */
4417 use_target = true;
4418 else if (TREE_CODE (*to_p) != SSA_NAME
4419 && (!is_gimple_variable (*to_p)
4420 || needs_to_live_in_memory (*to_p)))
4421 /* Don't use the original target if it's already addressable;
4422 if its address escapes, and the called function uses the
4423 NRV optimization, a conforming program could see *to_p
4424 change before the called function returns; see c++/19317.
4425 When optimizing, the return_slot pass marks more functions
4426 as safe after we have escape info. */
4427 use_target = false;
4428 else
4429 use_target = true;
4431 if (use_target)
4433 CALL_EXPR_RETURN_SLOT_OPT (*from_p) = 1;
4434 mark_addressable (*to_p);
4437 break;
4439 case WITH_SIZE_EXPR:
4440 /* Likewise for calls that return an aggregate of non-constant size,
4441 since we would not be able to generate a temporary at all. */
4442 if (TREE_CODE (TREE_OPERAND (*from_p, 0)) == CALL_EXPR)
4444 *from_p = TREE_OPERAND (*from_p, 0);
4445 /* We don't change ret in this case because the
4446 WITH_SIZE_EXPR might have been added in
4447 gimplify_modify_expr, so returning GS_OK would lead to an
4448 infinite loop. */
4449 changed = true;
4451 break;
4453 /* If we're initializing from a container, push the initialization
4454 inside it. */
4455 case CLEANUP_POINT_EXPR:
4456 case BIND_EXPR:
4457 case STATEMENT_LIST:
4459 tree wrap = *from_p;
4460 tree t;
4462 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_min_lval,
4463 fb_lvalue);
4464 if (ret != GS_ERROR)
4465 ret = GS_OK;
4467 t = voidify_wrapper_expr (wrap, *expr_p);
4468 gcc_assert (t == *expr_p);
4470 if (want_value)
4472 gimplify_and_add (wrap, pre_p);
4473 *expr_p = unshare_expr (*to_p);
4475 else
4476 *expr_p = wrap;
4477 return GS_OK;
4480 case COMPOUND_LITERAL_EXPR:
4482 tree complit = TREE_OPERAND (*expr_p, 1);
4483 tree decl_s = COMPOUND_LITERAL_EXPR_DECL_EXPR (complit);
4484 tree decl = DECL_EXPR_DECL (decl_s);
4485 tree init = DECL_INITIAL (decl);
4487 /* struct T x = (struct T) { 0, 1, 2 } can be optimized
4488 into struct T x = { 0, 1, 2 } if the address of the
4489 compound literal has never been taken. */
4490 if (!TREE_ADDRESSABLE (complit)
4491 && !TREE_ADDRESSABLE (decl)
4492 && init)
4494 *expr_p = copy_node (*expr_p);
4495 TREE_OPERAND (*expr_p, 1) = init;
4496 return GS_OK;
4500 default:
4501 break;
4504 while (changed);
4506 return ret;
4510 /* Return true if T looks like a valid GIMPLE statement. */
4512 static bool
4513 is_gimple_stmt (tree t)
4515 const enum tree_code code = TREE_CODE (t);
4517 switch (code)
4519 case NOP_EXPR:
4520 /* The only valid NOP_EXPR is the empty statement. */
4521 return IS_EMPTY_STMT (t);
4523 case BIND_EXPR:
4524 case COND_EXPR:
4525 /* These are only valid if they're void. */
4526 return TREE_TYPE (t) == NULL || VOID_TYPE_P (TREE_TYPE (t));
4528 case SWITCH_EXPR:
4529 case GOTO_EXPR:
4530 case RETURN_EXPR:
4531 case LABEL_EXPR:
4532 case CASE_LABEL_EXPR:
4533 case TRY_CATCH_EXPR:
4534 case TRY_FINALLY_EXPR:
4535 case EH_FILTER_EXPR:
4536 case CATCH_EXPR:
4537 case ASM_EXPR:
4538 case STATEMENT_LIST:
4539 case OACC_PARALLEL:
4540 case OACC_KERNELS:
4541 case OACC_DATA:
4542 case OACC_HOST_DATA:
4543 case OACC_DECLARE:
4544 case OACC_UPDATE:
4545 case OACC_ENTER_DATA:
4546 case OACC_EXIT_DATA:
4547 case OACC_CACHE:
4548 case OMP_PARALLEL:
4549 case OMP_FOR:
4550 case OMP_SIMD:
4551 case CILK_SIMD:
4552 case OMP_DISTRIBUTE:
4553 case OACC_LOOP:
4554 case OMP_SECTIONS:
4555 case OMP_SECTION:
4556 case OMP_SINGLE:
4557 case OMP_MASTER:
4558 case OMP_TASKGROUP:
4559 case OMP_ORDERED:
4560 case OMP_CRITICAL:
4561 case OMP_TASK:
4562 case OMP_TARGET:
4563 case OMP_TARGET_DATA:
4564 case OMP_TARGET_UPDATE:
4565 case OMP_TARGET_ENTER_DATA:
4566 case OMP_TARGET_EXIT_DATA:
4567 case OMP_TASKLOOP:
4568 case OMP_TEAMS:
4569 /* These are always void. */
4570 return true;
4572 case CALL_EXPR:
4573 case MODIFY_EXPR:
4574 case PREDICT_EXPR:
4575 /* These are valid regardless of their type. */
4576 return true;
4578 default:
4579 return false;
4584 /* Promote partial stores to COMPLEX variables to total stores. *EXPR_P is
4585 a MODIFY_EXPR with a lhs of a REAL/IMAGPART_EXPR of a variable with
4586 DECL_GIMPLE_REG_P set.
4588 IMPORTANT NOTE: This promotion is performed by introducing a load of the
4589 other, unmodified part of the complex object just before the total store.
4590 As a consequence, if the object is still uninitialized, an undefined value
4591 will be loaded into a register, which may result in a spurious exception
4592 if the register is floating-point and the value happens to be a signaling
4593 NaN for example. Then the fully-fledged complex operations lowering pass
4594 followed by a DCE pass are necessary in order to fix things up. */
4596 static enum gimplify_status
4597 gimplify_modify_expr_complex_part (tree *expr_p, gimple_seq *pre_p,
4598 bool want_value)
4600 enum tree_code code, ocode;
4601 tree lhs, rhs, new_rhs, other, realpart, imagpart;
4603 lhs = TREE_OPERAND (*expr_p, 0);
4604 rhs = TREE_OPERAND (*expr_p, 1);
4605 code = TREE_CODE (lhs);
4606 lhs = TREE_OPERAND (lhs, 0);
4608 ocode = code == REALPART_EXPR ? IMAGPART_EXPR : REALPART_EXPR;
4609 other = build1 (ocode, TREE_TYPE (rhs), lhs);
4610 TREE_NO_WARNING (other) = 1;
4611 other = get_formal_tmp_var (other, pre_p);
4613 realpart = code == REALPART_EXPR ? rhs : other;
4614 imagpart = code == REALPART_EXPR ? other : rhs;
4616 if (TREE_CONSTANT (realpart) && TREE_CONSTANT (imagpart))
4617 new_rhs = build_complex (TREE_TYPE (lhs), realpart, imagpart);
4618 else
4619 new_rhs = build2 (COMPLEX_EXPR, TREE_TYPE (lhs), realpart, imagpart);
4621 gimplify_seq_add_stmt (pre_p, gimple_build_assign (lhs, new_rhs));
4622 *expr_p = (want_value) ? rhs : NULL_TREE;
4624 return GS_ALL_DONE;
4627 /* Gimplify the MODIFY_EXPR node pointed to by EXPR_P.
4629 modify_expr
4630 : varname '=' rhs
4631 | '*' ID '=' rhs
4633 PRE_P points to the list where side effects that must happen before
4634 *EXPR_P should be stored.
4636 POST_P points to the list where side effects that must happen after
4637 *EXPR_P should be stored.
4639 WANT_VALUE is nonzero iff we want to use the value of this expression
4640 in another expression. */
4642 static enum gimplify_status
4643 gimplify_modify_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
4644 bool want_value)
4646 tree *from_p = &TREE_OPERAND (*expr_p, 1);
4647 tree *to_p = &TREE_OPERAND (*expr_p, 0);
4648 enum gimplify_status ret = GS_UNHANDLED;
4649 gimple *assign;
4650 location_t loc = EXPR_LOCATION (*expr_p);
4651 gimple_stmt_iterator gsi;
4653 gcc_assert (TREE_CODE (*expr_p) == MODIFY_EXPR
4654 || TREE_CODE (*expr_p) == INIT_EXPR);
4656 /* Trying to simplify a clobber using normal logic doesn't work,
4657 so handle it here. */
4658 if (TREE_CLOBBER_P (*from_p))
4660 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
4661 if (ret == GS_ERROR)
4662 return ret;
4663 gcc_assert (!want_value
4664 && (TREE_CODE (*to_p) == VAR_DECL
4665 || TREE_CODE (*to_p) == MEM_REF));
4666 gimplify_seq_add_stmt (pre_p, gimple_build_assign (*to_p, *from_p));
4667 *expr_p = NULL;
4668 return GS_ALL_DONE;
4671 /* Insert pointer conversions required by the middle-end that are not
4672 required by the frontend. This fixes middle-end type checking for
4673 for example gcc.dg/redecl-6.c. */
4674 if (POINTER_TYPE_P (TREE_TYPE (*to_p)))
4676 STRIP_USELESS_TYPE_CONVERSION (*from_p);
4677 if (!useless_type_conversion_p (TREE_TYPE (*to_p), TREE_TYPE (*from_p)))
4678 *from_p = fold_convert_loc (loc, TREE_TYPE (*to_p), *from_p);
4681 /* See if any simplifications can be done based on what the RHS is. */
4682 ret = gimplify_modify_expr_rhs (expr_p, from_p, to_p, pre_p, post_p,
4683 want_value);
4684 if (ret != GS_UNHANDLED)
4685 return ret;
4687 /* For zero sized types only gimplify the left hand side and right hand
4688 side as statements and throw away the assignment. Do this after
4689 gimplify_modify_expr_rhs so we handle TARGET_EXPRs of addressable
4690 types properly. */
4691 if (zero_sized_type (TREE_TYPE (*from_p)) && !want_value)
4693 gimplify_stmt (from_p, pre_p);
4694 gimplify_stmt (to_p, pre_p);
4695 *expr_p = NULL_TREE;
4696 return GS_ALL_DONE;
4699 /* If the value being copied is of variable width, compute the length
4700 of the copy into a WITH_SIZE_EXPR. Note that we need to do this
4701 before gimplifying any of the operands so that we can resolve any
4702 PLACEHOLDER_EXPRs in the size. Also note that the RTL expander uses
4703 the size of the expression to be copied, not of the destination, so
4704 that is what we must do here. */
4705 maybe_with_size_expr (from_p);
4707 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
4708 if (ret == GS_ERROR)
4709 return ret;
4711 /* As a special case, we have to temporarily allow for assignments
4712 with a CALL_EXPR on the RHS. Since in GIMPLE a function call is
4713 a toplevel statement, when gimplifying the GENERIC expression
4714 MODIFY_EXPR <a, CALL_EXPR <foo>>, we cannot create the tuple
4715 GIMPLE_ASSIGN <a, GIMPLE_CALL <foo>>.
4717 Instead, we need to create the tuple GIMPLE_CALL <a, foo>. To
4718 prevent gimplify_expr from trying to create a new temporary for
4719 foo's LHS, we tell it that it should only gimplify until it
4720 reaches the CALL_EXPR. On return from gimplify_expr, the newly
4721 created GIMPLE_CALL <foo> will be the last statement in *PRE_P
4722 and all we need to do here is set 'a' to be its LHS. */
4723 ret = gimplify_expr (from_p, pre_p, post_p, rhs_predicate_for (*to_p),
4724 fb_rvalue);
4725 if (ret == GS_ERROR)
4726 return ret;
4728 /* In case of va_arg internal fn wrappped in a WITH_SIZE_EXPR, add the type
4729 size as argument to the call. */
4730 if (TREE_CODE (*from_p) == WITH_SIZE_EXPR)
4732 tree call = TREE_OPERAND (*from_p, 0);
4733 tree vlasize = TREE_OPERAND (*from_p, 1);
4735 if (TREE_CODE (call) == CALL_EXPR
4736 && CALL_EXPR_IFN (call) == IFN_VA_ARG)
4738 int nargs = call_expr_nargs (call);
4739 tree type = TREE_TYPE (call);
4740 tree ap = CALL_EXPR_ARG (call, 0);
4741 tree tag = CALL_EXPR_ARG (call, 1);
4742 tree aptag = CALL_EXPR_ARG (call, 2);
4743 tree newcall = build_call_expr_internal_loc (EXPR_LOCATION (call),
4744 IFN_VA_ARG, type,
4745 nargs + 1, ap, tag,
4746 aptag, vlasize);
4747 TREE_OPERAND (*from_p, 0) = newcall;
4751 /* Now see if the above changed *from_p to something we handle specially. */
4752 ret = gimplify_modify_expr_rhs (expr_p, from_p, to_p, pre_p, post_p,
4753 want_value);
4754 if (ret != GS_UNHANDLED)
4755 return ret;
4757 /* If we've got a variable sized assignment between two lvalues (i.e. does
4758 not involve a call), then we can make things a bit more straightforward
4759 by converting the assignment to memcpy or memset. */
4760 if (TREE_CODE (*from_p) == WITH_SIZE_EXPR)
4762 tree from = TREE_OPERAND (*from_p, 0);
4763 tree size = TREE_OPERAND (*from_p, 1);
4765 if (TREE_CODE (from) == CONSTRUCTOR)
4766 return gimplify_modify_expr_to_memset (expr_p, size, want_value, pre_p);
4768 if (is_gimple_addressable (from))
4770 *from_p = from;
4771 return gimplify_modify_expr_to_memcpy (expr_p, size, want_value,
4772 pre_p);
4776 /* Transform partial stores to non-addressable complex variables into
4777 total stores. This allows us to use real instead of virtual operands
4778 for these variables, which improves optimization. */
4779 if ((TREE_CODE (*to_p) == REALPART_EXPR
4780 || TREE_CODE (*to_p) == IMAGPART_EXPR)
4781 && is_gimple_reg (TREE_OPERAND (*to_p, 0)))
4782 return gimplify_modify_expr_complex_part (expr_p, pre_p, want_value);
4784 /* Try to alleviate the effects of the gimplification creating artificial
4785 temporaries (see for example is_gimple_reg_rhs) on the debug info, but
4786 make sure not to create DECL_DEBUG_EXPR links across functions. */
4787 if (!gimplify_ctxp->into_ssa
4788 && TREE_CODE (*from_p) == VAR_DECL
4789 && DECL_IGNORED_P (*from_p)
4790 && DECL_P (*to_p)
4791 && !DECL_IGNORED_P (*to_p)
4792 && decl_function_context (*to_p) == current_function_decl)
4794 if (!DECL_NAME (*from_p) && DECL_NAME (*to_p))
4795 DECL_NAME (*from_p)
4796 = create_tmp_var_name (IDENTIFIER_POINTER (DECL_NAME (*to_p)));
4797 DECL_HAS_DEBUG_EXPR_P (*from_p) = 1;
4798 SET_DECL_DEBUG_EXPR (*from_p, *to_p);
4801 if (want_value && TREE_THIS_VOLATILE (*to_p))
4802 *from_p = get_initialized_tmp_var (*from_p, pre_p, post_p);
4804 if (TREE_CODE (*from_p) == CALL_EXPR)
4806 /* Since the RHS is a CALL_EXPR, we need to create a GIMPLE_CALL
4807 instead of a GIMPLE_ASSIGN. */
4808 gcall *call_stmt;
4809 if (CALL_EXPR_FN (*from_p) == NULL_TREE)
4811 /* Gimplify internal functions created in the FEs. */
4812 int nargs = call_expr_nargs (*from_p), i;
4813 enum internal_fn ifn = CALL_EXPR_IFN (*from_p);
4814 auto_vec<tree> vargs (nargs);
4816 for (i = 0; i < nargs; i++)
4818 gimplify_arg (&CALL_EXPR_ARG (*from_p, i), pre_p,
4819 EXPR_LOCATION (*from_p));
4820 vargs.quick_push (CALL_EXPR_ARG (*from_p, i));
4822 call_stmt = gimple_build_call_internal_vec (ifn, vargs);
4823 gimple_set_location (call_stmt, EXPR_LOCATION (*expr_p));
4825 else
4827 tree fnptrtype = TREE_TYPE (CALL_EXPR_FN (*from_p));
4828 CALL_EXPR_FN (*from_p) = TREE_OPERAND (CALL_EXPR_FN (*from_p), 0);
4829 STRIP_USELESS_TYPE_CONVERSION (CALL_EXPR_FN (*from_p));
4830 tree fndecl = get_callee_fndecl (*from_p);
4831 if (fndecl
4832 && DECL_BUILT_IN_CLASS (fndecl) == BUILT_IN_NORMAL
4833 && DECL_FUNCTION_CODE (fndecl) == BUILT_IN_EXPECT
4834 && call_expr_nargs (*from_p) == 3)
4835 call_stmt = gimple_build_call_internal (IFN_BUILTIN_EXPECT, 3,
4836 CALL_EXPR_ARG (*from_p, 0),
4837 CALL_EXPR_ARG (*from_p, 1),
4838 CALL_EXPR_ARG (*from_p, 2));
4839 else
4841 call_stmt = gimple_build_call_from_tree (*from_p);
4842 gimple_call_set_fntype (call_stmt, TREE_TYPE (fnptrtype));
4845 notice_special_calls (call_stmt);
4846 if (!gimple_call_noreturn_p (call_stmt)
4847 || TREE_ADDRESSABLE (TREE_TYPE (*to_p))
4848 || TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (*to_p))) != INTEGER_CST)
4849 gimple_call_set_lhs (call_stmt, *to_p);
4850 assign = call_stmt;
4852 else
4854 assign = gimple_build_assign (*to_p, *from_p);
4855 gimple_set_location (assign, EXPR_LOCATION (*expr_p));
4856 if (COMPARISON_CLASS_P (*from_p))
4857 gimple_set_no_warning (assign, TREE_NO_WARNING (*from_p));
4860 if (gimplify_ctxp->into_ssa && is_gimple_reg (*to_p))
4862 /* We should have got an SSA name from the start. */
4863 gcc_assert (TREE_CODE (*to_p) == SSA_NAME);
4866 gimplify_seq_add_stmt (pre_p, assign);
4867 gsi = gsi_last (*pre_p);
4868 maybe_fold_stmt (&gsi);
4870 if (want_value)
4872 *expr_p = TREE_THIS_VOLATILE (*to_p) ? *from_p : unshare_expr (*to_p);
4873 return GS_OK;
4875 else
4876 *expr_p = NULL;
4878 return GS_ALL_DONE;
4881 /* Gimplify a comparison between two variable-sized objects. Do this
4882 with a call to BUILT_IN_MEMCMP. */
4884 static enum gimplify_status
4885 gimplify_variable_sized_compare (tree *expr_p)
4887 location_t loc = EXPR_LOCATION (*expr_p);
4888 tree op0 = TREE_OPERAND (*expr_p, 0);
4889 tree op1 = TREE_OPERAND (*expr_p, 1);
4890 tree t, arg, dest, src, expr;
4892 arg = TYPE_SIZE_UNIT (TREE_TYPE (op0));
4893 arg = unshare_expr (arg);
4894 arg = SUBSTITUTE_PLACEHOLDER_IN_EXPR (arg, op0);
4895 src = build_fold_addr_expr_loc (loc, op1);
4896 dest = build_fold_addr_expr_loc (loc, op0);
4897 t = builtin_decl_implicit (BUILT_IN_MEMCMP);
4898 t = build_call_expr_loc (loc, t, 3, dest, src, arg);
4900 expr
4901 = build2 (TREE_CODE (*expr_p), TREE_TYPE (*expr_p), t, integer_zero_node);
4902 SET_EXPR_LOCATION (expr, loc);
4903 *expr_p = expr;
4905 return GS_OK;
4908 /* Gimplify a comparison between two aggregate objects of integral scalar
4909 mode as a comparison between the bitwise equivalent scalar values. */
4911 static enum gimplify_status
4912 gimplify_scalar_mode_aggregate_compare (tree *expr_p)
4914 location_t loc = EXPR_LOCATION (*expr_p);
4915 tree op0 = TREE_OPERAND (*expr_p, 0);
4916 tree op1 = TREE_OPERAND (*expr_p, 1);
4918 tree type = TREE_TYPE (op0);
4919 tree scalar_type = lang_hooks.types.type_for_mode (TYPE_MODE (type), 1);
4921 op0 = fold_build1_loc (loc, VIEW_CONVERT_EXPR, scalar_type, op0);
4922 op1 = fold_build1_loc (loc, VIEW_CONVERT_EXPR, scalar_type, op1);
4924 *expr_p
4925 = fold_build2_loc (loc, TREE_CODE (*expr_p), TREE_TYPE (*expr_p), op0, op1);
4927 return GS_OK;
4930 /* Gimplify an expression sequence. This function gimplifies each
4931 expression and rewrites the original expression with the last
4932 expression of the sequence in GIMPLE form.
4934 PRE_P points to the list where the side effects for all the
4935 expressions in the sequence will be emitted.
4937 WANT_VALUE is true when the result of the last COMPOUND_EXPR is used. */
4939 static enum gimplify_status
4940 gimplify_compound_expr (tree *expr_p, gimple_seq *pre_p, bool want_value)
4942 tree t = *expr_p;
4946 tree *sub_p = &TREE_OPERAND (t, 0);
4948 if (TREE_CODE (*sub_p) == COMPOUND_EXPR)
4949 gimplify_compound_expr (sub_p, pre_p, false);
4950 else
4951 gimplify_stmt (sub_p, pre_p);
4953 t = TREE_OPERAND (t, 1);
4955 while (TREE_CODE (t) == COMPOUND_EXPR);
4957 *expr_p = t;
4958 if (want_value)
4959 return GS_OK;
4960 else
4962 gimplify_stmt (expr_p, pre_p);
4963 return GS_ALL_DONE;
4967 /* Gimplify a SAVE_EXPR node. EXPR_P points to the expression to
4968 gimplify. After gimplification, EXPR_P will point to a new temporary
4969 that holds the original value of the SAVE_EXPR node.
4971 PRE_P points to the list where side effects that must happen before
4972 *EXPR_P should be stored. */
4974 static enum gimplify_status
4975 gimplify_save_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
4977 enum gimplify_status ret = GS_ALL_DONE;
4978 tree val;
4980 gcc_assert (TREE_CODE (*expr_p) == SAVE_EXPR);
4981 val = TREE_OPERAND (*expr_p, 0);
4983 /* If the SAVE_EXPR has not been resolved, then evaluate it once. */
4984 if (!SAVE_EXPR_RESOLVED_P (*expr_p))
4986 /* The operand may be a void-valued expression such as SAVE_EXPRs
4987 generated by the Java frontend for class initialization. It is
4988 being executed only for its side-effects. */
4989 if (TREE_TYPE (val) == void_type_node)
4991 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
4992 is_gimple_stmt, fb_none);
4993 val = NULL;
4995 else
4996 val = get_initialized_tmp_var (val, pre_p, post_p);
4998 TREE_OPERAND (*expr_p, 0) = val;
4999 SAVE_EXPR_RESOLVED_P (*expr_p) = 1;
5002 *expr_p = val;
5004 return ret;
5007 /* Rewrite the ADDR_EXPR node pointed to by EXPR_P
5009 unary_expr
5010 : ...
5011 | '&' varname
5014 PRE_P points to the list where side effects that must happen before
5015 *EXPR_P should be stored.
5017 POST_P points to the list where side effects that must happen after
5018 *EXPR_P should be stored. */
5020 static enum gimplify_status
5021 gimplify_addr_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
5023 tree expr = *expr_p;
5024 tree op0 = TREE_OPERAND (expr, 0);
5025 enum gimplify_status ret;
5026 location_t loc = EXPR_LOCATION (*expr_p);
5028 switch (TREE_CODE (op0))
5030 case INDIRECT_REF:
5031 do_indirect_ref:
5032 /* Check if we are dealing with an expression of the form '&*ptr'.
5033 While the front end folds away '&*ptr' into 'ptr', these
5034 expressions may be generated internally by the compiler (e.g.,
5035 builtins like __builtin_va_end). */
5036 /* Caution: the silent array decomposition semantics we allow for
5037 ADDR_EXPR means we can't always discard the pair. */
5038 /* Gimplification of the ADDR_EXPR operand may drop
5039 cv-qualification conversions, so make sure we add them if
5040 needed. */
5042 tree op00 = TREE_OPERAND (op0, 0);
5043 tree t_expr = TREE_TYPE (expr);
5044 tree t_op00 = TREE_TYPE (op00);
5046 if (!useless_type_conversion_p (t_expr, t_op00))
5047 op00 = fold_convert_loc (loc, TREE_TYPE (expr), op00);
5048 *expr_p = op00;
5049 ret = GS_OK;
5051 break;
5053 case VIEW_CONVERT_EXPR:
5054 /* Take the address of our operand and then convert it to the type of
5055 this ADDR_EXPR.
5057 ??? The interactions of VIEW_CONVERT_EXPR and aliasing is not at
5058 all clear. The impact of this transformation is even less clear. */
5060 /* If the operand is a useless conversion, look through it. Doing so
5061 guarantees that the ADDR_EXPR and its operand will remain of the
5062 same type. */
5063 if (tree_ssa_useless_type_conversion (TREE_OPERAND (op0, 0)))
5064 op0 = TREE_OPERAND (op0, 0);
5066 *expr_p = fold_convert_loc (loc, TREE_TYPE (expr),
5067 build_fold_addr_expr_loc (loc,
5068 TREE_OPERAND (op0, 0)));
5069 ret = GS_OK;
5070 break;
5072 case MEM_REF:
5073 if (integer_zerop (TREE_OPERAND (op0, 1)))
5074 goto do_indirect_ref;
5076 /* ... fall through ... */
5078 default:
5079 /* If we see a call to a declared builtin or see its address
5080 being taken (we can unify those cases here) then we can mark
5081 the builtin for implicit generation by GCC. */
5082 if (TREE_CODE (op0) == FUNCTION_DECL
5083 && DECL_BUILT_IN_CLASS (op0) == BUILT_IN_NORMAL
5084 && builtin_decl_declared_p (DECL_FUNCTION_CODE (op0)))
5085 set_builtin_decl_implicit_p (DECL_FUNCTION_CODE (op0), true);
5087 /* We use fb_either here because the C frontend sometimes takes
5088 the address of a call that returns a struct; see
5089 gcc.dg/c99-array-lval-1.c. The gimplifier will correctly make
5090 the implied temporary explicit. */
5092 /* Make the operand addressable. */
5093 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, post_p,
5094 is_gimple_addressable, fb_either);
5095 if (ret == GS_ERROR)
5096 break;
5098 /* Then mark it. Beware that it may not be possible to do so directly
5099 if a temporary has been created by the gimplification. */
5100 prepare_gimple_addressable (&TREE_OPERAND (expr, 0), pre_p);
5102 op0 = TREE_OPERAND (expr, 0);
5104 /* For various reasons, the gimplification of the expression
5105 may have made a new INDIRECT_REF. */
5106 if (TREE_CODE (op0) == INDIRECT_REF)
5107 goto do_indirect_ref;
5109 mark_addressable (TREE_OPERAND (expr, 0));
5111 /* The FEs may end up building ADDR_EXPRs early on a decl with
5112 an incomplete type. Re-build ADDR_EXPRs in canonical form
5113 here. */
5114 if (!types_compatible_p (TREE_TYPE (op0), TREE_TYPE (TREE_TYPE (expr))))
5115 *expr_p = build_fold_addr_expr (op0);
5117 /* Make sure TREE_CONSTANT and TREE_SIDE_EFFECTS are set properly. */
5118 recompute_tree_invariant_for_addr_expr (*expr_p);
5120 /* If we re-built the ADDR_EXPR add a conversion to the original type
5121 if required. */
5122 if (!useless_type_conversion_p (TREE_TYPE (expr), TREE_TYPE (*expr_p)))
5123 *expr_p = fold_convert (TREE_TYPE (expr), *expr_p);
5125 break;
5128 return ret;
5131 /* Gimplify the operands of an ASM_EXPR. Input operands should be a gimple
5132 value; output operands should be a gimple lvalue. */
5134 static enum gimplify_status
5135 gimplify_asm_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
5137 tree expr;
5138 int noutputs;
5139 const char **oconstraints;
5140 int i;
5141 tree link;
5142 const char *constraint;
5143 bool allows_mem, allows_reg, is_inout;
5144 enum gimplify_status ret, tret;
5145 gasm *stmt;
5146 vec<tree, va_gc> *inputs;
5147 vec<tree, va_gc> *outputs;
5148 vec<tree, va_gc> *clobbers;
5149 vec<tree, va_gc> *labels;
5150 tree link_next;
5152 expr = *expr_p;
5153 noutputs = list_length (ASM_OUTPUTS (expr));
5154 oconstraints = (const char **) alloca ((noutputs) * sizeof (const char *));
5156 inputs = NULL;
5157 outputs = NULL;
5158 clobbers = NULL;
5159 labels = NULL;
5161 ret = GS_ALL_DONE;
5162 link_next = NULL_TREE;
5163 for (i = 0, link = ASM_OUTPUTS (expr); link; ++i, link = link_next)
5165 bool ok;
5166 size_t constraint_len;
5168 link_next = TREE_CHAIN (link);
5170 oconstraints[i]
5171 = constraint
5172 = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link)));
5173 constraint_len = strlen (constraint);
5174 if (constraint_len == 0)
5175 continue;
5177 ok = parse_output_constraint (&constraint, i, 0, 0,
5178 &allows_mem, &allows_reg, &is_inout);
5179 if (!ok)
5181 ret = GS_ERROR;
5182 is_inout = false;
5185 if (!allows_reg && allows_mem)
5186 mark_addressable (TREE_VALUE (link));
5188 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
5189 is_inout ? is_gimple_min_lval : is_gimple_lvalue,
5190 fb_lvalue | fb_mayfail);
5191 if (tret == GS_ERROR)
5193 error ("invalid lvalue in asm output %d", i);
5194 ret = tret;
5197 /* If the constraint does not allow memory make sure we gimplify
5198 it to a register if it is not already but its base is. This
5199 happens for complex and vector components. */
5200 if (!allows_mem)
5202 tree op = TREE_VALUE (link);
5203 if (! is_gimple_val (op)
5204 && is_gimple_reg_type (TREE_TYPE (op))
5205 && is_gimple_reg (get_base_address (op)))
5207 tree tem = create_tmp_reg (TREE_TYPE (op));
5208 tree ass;
5209 if (is_inout)
5211 ass = build2 (MODIFY_EXPR, TREE_TYPE (tem),
5212 tem, unshare_expr (op));
5213 gimplify_and_add (ass, pre_p);
5215 ass = build2 (MODIFY_EXPR, TREE_TYPE (tem), op, tem);
5216 gimplify_and_add (ass, post_p);
5218 TREE_VALUE (link) = tem;
5219 tret = GS_OK;
5223 vec_safe_push (outputs, link);
5224 TREE_CHAIN (link) = NULL_TREE;
5226 if (is_inout)
5228 /* An input/output operand. To give the optimizers more
5229 flexibility, split it into separate input and output
5230 operands. */
5231 tree input;
5232 char buf[10];
5234 /* Turn the in/out constraint into an output constraint. */
5235 char *p = xstrdup (constraint);
5236 p[0] = '=';
5237 TREE_VALUE (TREE_PURPOSE (link)) = build_string (constraint_len, p);
5239 /* And add a matching input constraint. */
5240 if (allows_reg)
5242 sprintf (buf, "%d", i);
5244 /* If there are multiple alternatives in the constraint,
5245 handle each of them individually. Those that allow register
5246 will be replaced with operand number, the others will stay
5247 unchanged. */
5248 if (strchr (p, ',') != NULL)
5250 size_t len = 0, buflen = strlen (buf);
5251 char *beg, *end, *str, *dst;
5253 for (beg = p + 1;;)
5255 end = strchr (beg, ',');
5256 if (end == NULL)
5257 end = strchr (beg, '\0');
5258 if ((size_t) (end - beg) < buflen)
5259 len += buflen + 1;
5260 else
5261 len += end - beg + 1;
5262 if (*end)
5263 beg = end + 1;
5264 else
5265 break;
5268 str = (char *) alloca (len);
5269 for (beg = p + 1, dst = str;;)
5271 const char *tem;
5272 bool mem_p, reg_p, inout_p;
5274 end = strchr (beg, ',');
5275 if (end)
5276 *end = '\0';
5277 beg[-1] = '=';
5278 tem = beg - 1;
5279 parse_output_constraint (&tem, i, 0, 0,
5280 &mem_p, &reg_p, &inout_p);
5281 if (dst != str)
5282 *dst++ = ',';
5283 if (reg_p)
5285 memcpy (dst, buf, buflen);
5286 dst += buflen;
5288 else
5290 if (end)
5291 len = end - beg;
5292 else
5293 len = strlen (beg);
5294 memcpy (dst, beg, len);
5295 dst += len;
5297 if (end)
5298 beg = end + 1;
5299 else
5300 break;
5302 *dst = '\0';
5303 input = build_string (dst - str, str);
5305 else
5306 input = build_string (strlen (buf), buf);
5308 else
5309 input = build_string (constraint_len - 1, constraint + 1);
5311 free (p);
5313 input = build_tree_list (build_tree_list (NULL_TREE, input),
5314 unshare_expr (TREE_VALUE (link)));
5315 ASM_INPUTS (expr) = chainon (ASM_INPUTS (expr), input);
5319 link_next = NULL_TREE;
5320 for (link = ASM_INPUTS (expr); link; ++i, link = link_next)
5322 link_next = TREE_CHAIN (link);
5323 constraint = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link)));
5324 parse_input_constraint (&constraint, 0, 0, noutputs, 0,
5325 oconstraints, &allows_mem, &allows_reg);
5327 /* If we can't make copies, we can only accept memory. */
5328 if (TREE_ADDRESSABLE (TREE_TYPE (TREE_VALUE (link))))
5330 if (allows_mem)
5331 allows_reg = 0;
5332 else
5334 error ("impossible constraint in %<asm%>");
5335 error ("non-memory input %d must stay in memory", i);
5336 return GS_ERROR;
5340 /* If the operand is a memory input, it should be an lvalue. */
5341 if (!allows_reg && allows_mem)
5343 tree inputv = TREE_VALUE (link);
5344 STRIP_NOPS (inputv);
5345 if (TREE_CODE (inputv) == PREDECREMENT_EXPR
5346 || TREE_CODE (inputv) == PREINCREMENT_EXPR
5347 || TREE_CODE (inputv) == POSTDECREMENT_EXPR
5348 || TREE_CODE (inputv) == POSTINCREMENT_EXPR
5349 || TREE_CODE (inputv) == MODIFY_EXPR)
5350 TREE_VALUE (link) = error_mark_node;
5351 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
5352 is_gimple_lvalue, fb_lvalue | fb_mayfail);
5353 if (tret != GS_ERROR)
5355 /* Unlike output operands, memory inputs are not guaranteed
5356 to be lvalues by the FE, and while the expressions are
5357 marked addressable there, if it is e.g. a statement
5358 expression, temporaries in it might not end up being
5359 addressable. They might be already used in the IL and thus
5360 it is too late to make them addressable now though. */
5361 tree x = TREE_VALUE (link);
5362 while (handled_component_p (x))
5363 x = TREE_OPERAND (x, 0);
5364 if (TREE_CODE (x) == MEM_REF
5365 && TREE_CODE (TREE_OPERAND (x, 0)) == ADDR_EXPR)
5366 x = TREE_OPERAND (TREE_OPERAND (x, 0), 0);
5367 if ((TREE_CODE (x) == VAR_DECL
5368 || TREE_CODE (x) == PARM_DECL
5369 || TREE_CODE (x) == RESULT_DECL)
5370 && !TREE_ADDRESSABLE (x)
5371 && is_gimple_reg (x))
5373 warning_at (EXPR_LOC_OR_LOC (TREE_VALUE (link),
5374 input_location), 0,
5375 "memory input %d is not directly addressable",
5377 prepare_gimple_addressable (&TREE_VALUE (link), pre_p);
5380 mark_addressable (TREE_VALUE (link));
5381 if (tret == GS_ERROR)
5383 error_at (EXPR_LOC_OR_LOC (TREE_VALUE (link), input_location),
5384 "memory input %d is not directly addressable", i);
5385 ret = tret;
5388 else
5390 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
5391 is_gimple_asm_val, fb_rvalue);
5392 if (tret == GS_ERROR)
5393 ret = tret;
5396 TREE_CHAIN (link) = NULL_TREE;
5397 vec_safe_push (inputs, link);
5400 link_next = NULL_TREE;
5401 for (link = ASM_CLOBBERS (expr); link; ++i, link = link_next)
5403 link_next = TREE_CHAIN (link);
5404 TREE_CHAIN (link) = NULL_TREE;
5405 vec_safe_push (clobbers, link);
5408 link_next = NULL_TREE;
5409 for (link = ASM_LABELS (expr); link; ++i, link = link_next)
5411 link_next = TREE_CHAIN (link);
5412 TREE_CHAIN (link) = NULL_TREE;
5413 vec_safe_push (labels, link);
5416 /* Do not add ASMs with errors to the gimple IL stream. */
5417 if (ret != GS_ERROR)
5419 stmt = gimple_build_asm_vec (TREE_STRING_POINTER (ASM_STRING (expr)),
5420 inputs, outputs, clobbers, labels);
5422 gimple_asm_set_volatile (stmt, ASM_VOLATILE_P (expr) || noutputs == 0);
5423 gimple_asm_set_input (stmt, ASM_INPUT_P (expr));
5425 gimplify_seq_add_stmt (pre_p, stmt);
5428 return ret;
5431 /* Gimplify a CLEANUP_POINT_EXPR. Currently this works by adding
5432 GIMPLE_WITH_CLEANUP_EXPRs to the prequeue as we encounter cleanups while
5433 gimplifying the body, and converting them to TRY_FINALLY_EXPRs when we
5434 return to this function.
5436 FIXME should we complexify the prequeue handling instead? Or use flags
5437 for all the cleanups and let the optimizer tighten them up? The current
5438 code seems pretty fragile; it will break on a cleanup within any
5439 non-conditional nesting. But any such nesting would be broken, anyway;
5440 we can't write a TRY_FINALLY_EXPR that starts inside a nesting construct
5441 and continues out of it. We can do that at the RTL level, though, so
5442 having an optimizer to tighten up try/finally regions would be a Good
5443 Thing. */
5445 static enum gimplify_status
5446 gimplify_cleanup_point_expr (tree *expr_p, gimple_seq *pre_p)
5448 gimple_stmt_iterator iter;
5449 gimple_seq body_sequence = NULL;
5451 tree temp = voidify_wrapper_expr (*expr_p, NULL);
5453 /* We only care about the number of conditions between the innermost
5454 CLEANUP_POINT_EXPR and the cleanup. So save and reset the count and
5455 any cleanups collected outside the CLEANUP_POINT_EXPR. */
5456 int old_conds = gimplify_ctxp->conditions;
5457 gimple_seq old_cleanups = gimplify_ctxp->conditional_cleanups;
5458 bool old_in_cleanup_point_expr = gimplify_ctxp->in_cleanup_point_expr;
5459 gimplify_ctxp->conditions = 0;
5460 gimplify_ctxp->conditional_cleanups = NULL;
5461 gimplify_ctxp->in_cleanup_point_expr = true;
5463 gimplify_stmt (&TREE_OPERAND (*expr_p, 0), &body_sequence);
5465 gimplify_ctxp->conditions = old_conds;
5466 gimplify_ctxp->conditional_cleanups = old_cleanups;
5467 gimplify_ctxp->in_cleanup_point_expr = old_in_cleanup_point_expr;
5469 for (iter = gsi_start (body_sequence); !gsi_end_p (iter); )
5471 gimple *wce = gsi_stmt (iter);
5473 if (gimple_code (wce) == GIMPLE_WITH_CLEANUP_EXPR)
5475 if (gsi_one_before_end_p (iter))
5477 /* Note that gsi_insert_seq_before and gsi_remove do not
5478 scan operands, unlike some other sequence mutators. */
5479 if (!gimple_wce_cleanup_eh_only (wce))
5480 gsi_insert_seq_before_without_update (&iter,
5481 gimple_wce_cleanup (wce),
5482 GSI_SAME_STMT);
5483 gsi_remove (&iter, true);
5484 break;
5486 else
5488 gtry *gtry;
5489 gimple_seq seq;
5490 enum gimple_try_flags kind;
5492 if (gimple_wce_cleanup_eh_only (wce))
5493 kind = GIMPLE_TRY_CATCH;
5494 else
5495 kind = GIMPLE_TRY_FINALLY;
5496 seq = gsi_split_seq_after (iter);
5498 gtry = gimple_build_try (seq, gimple_wce_cleanup (wce), kind);
5499 /* Do not use gsi_replace here, as it may scan operands.
5500 We want to do a simple structural modification only. */
5501 gsi_set_stmt (&iter, gtry);
5502 iter = gsi_start (gtry->eval);
5505 else
5506 gsi_next (&iter);
5509 gimplify_seq_add_seq (pre_p, body_sequence);
5510 if (temp)
5512 *expr_p = temp;
5513 return GS_OK;
5515 else
5517 *expr_p = NULL;
5518 return GS_ALL_DONE;
5522 /* Insert a cleanup marker for gimplify_cleanup_point_expr. CLEANUP
5523 is the cleanup action required. EH_ONLY is true if the cleanup should
5524 only be executed if an exception is thrown, not on normal exit. */
5526 static void
5527 gimple_push_cleanup (tree var, tree cleanup, bool eh_only, gimple_seq *pre_p)
5529 gimple *wce;
5530 gimple_seq cleanup_stmts = NULL;
5532 /* Errors can result in improperly nested cleanups. Which results in
5533 confusion when trying to resolve the GIMPLE_WITH_CLEANUP_EXPR. */
5534 if (seen_error ())
5535 return;
5537 if (gimple_conditional_context ())
5539 /* If we're in a conditional context, this is more complex. We only
5540 want to run the cleanup if we actually ran the initialization that
5541 necessitates it, but we want to run it after the end of the
5542 conditional context. So we wrap the try/finally around the
5543 condition and use a flag to determine whether or not to actually
5544 run the destructor. Thus
5546 test ? f(A()) : 0
5548 becomes (approximately)
5550 flag = 0;
5551 try {
5552 if (test) { A::A(temp); flag = 1; val = f(temp); }
5553 else { val = 0; }
5554 } finally {
5555 if (flag) A::~A(temp);
5559 tree flag = create_tmp_var (boolean_type_node, "cleanup");
5560 gassign *ffalse = gimple_build_assign (flag, boolean_false_node);
5561 gassign *ftrue = gimple_build_assign (flag, boolean_true_node);
5563 cleanup = build3 (COND_EXPR, void_type_node, flag, cleanup, NULL);
5564 gimplify_stmt (&cleanup, &cleanup_stmts);
5565 wce = gimple_build_wce (cleanup_stmts);
5567 gimplify_seq_add_stmt (&gimplify_ctxp->conditional_cleanups, ffalse);
5568 gimplify_seq_add_stmt (&gimplify_ctxp->conditional_cleanups, wce);
5569 gimplify_seq_add_stmt (pre_p, ftrue);
5571 /* Because of this manipulation, and the EH edges that jump
5572 threading cannot redirect, the temporary (VAR) will appear
5573 to be used uninitialized. Don't warn. */
5574 TREE_NO_WARNING (var) = 1;
5576 else
5578 gimplify_stmt (&cleanup, &cleanup_stmts);
5579 wce = gimple_build_wce (cleanup_stmts);
5580 gimple_wce_set_cleanup_eh_only (wce, eh_only);
5581 gimplify_seq_add_stmt (pre_p, wce);
5585 /* Gimplify a TARGET_EXPR which doesn't appear on the rhs of an INIT_EXPR. */
5587 static enum gimplify_status
5588 gimplify_target_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
5590 tree targ = *expr_p;
5591 tree temp = TARGET_EXPR_SLOT (targ);
5592 tree init = TARGET_EXPR_INITIAL (targ);
5593 enum gimplify_status ret;
5595 if (init)
5597 tree cleanup = NULL_TREE;
5599 /* TARGET_EXPR temps aren't part of the enclosing block, so add it
5600 to the temps list. Handle also variable length TARGET_EXPRs. */
5601 if (TREE_CODE (DECL_SIZE (temp)) != INTEGER_CST)
5603 if (!TYPE_SIZES_GIMPLIFIED (TREE_TYPE (temp)))
5604 gimplify_type_sizes (TREE_TYPE (temp), pre_p);
5605 gimplify_vla_decl (temp, pre_p);
5607 else
5608 gimple_add_tmp_var (temp);
5610 /* If TARGET_EXPR_INITIAL is void, then the mere evaluation of the
5611 expression is supposed to initialize the slot. */
5612 if (VOID_TYPE_P (TREE_TYPE (init)))
5613 ret = gimplify_expr (&init, pre_p, post_p, is_gimple_stmt, fb_none);
5614 else
5616 tree init_expr = build2 (INIT_EXPR, void_type_node, temp, init);
5617 init = init_expr;
5618 ret = gimplify_expr (&init, pre_p, post_p, is_gimple_stmt, fb_none);
5619 init = NULL;
5620 ggc_free (init_expr);
5622 if (ret == GS_ERROR)
5624 /* PR c++/28266 Make sure this is expanded only once. */
5625 TARGET_EXPR_INITIAL (targ) = NULL_TREE;
5626 return GS_ERROR;
5628 if (init)
5629 gimplify_and_add (init, pre_p);
5631 /* If needed, push the cleanup for the temp. */
5632 if (TARGET_EXPR_CLEANUP (targ))
5634 if (CLEANUP_EH_ONLY (targ))
5635 gimple_push_cleanup (temp, TARGET_EXPR_CLEANUP (targ),
5636 CLEANUP_EH_ONLY (targ), pre_p);
5637 else
5638 cleanup = TARGET_EXPR_CLEANUP (targ);
5641 /* Add a clobber for the temporary going out of scope, like
5642 gimplify_bind_expr. */
5643 if (gimplify_ctxp->in_cleanup_point_expr
5644 && needs_to_live_in_memory (temp)
5645 && flag_stack_reuse == SR_ALL)
5647 tree clobber = build_constructor (TREE_TYPE (temp),
5648 NULL);
5649 TREE_THIS_VOLATILE (clobber) = true;
5650 clobber = build2 (MODIFY_EXPR, TREE_TYPE (temp), temp, clobber);
5651 if (cleanup)
5652 cleanup = build2 (COMPOUND_EXPR, void_type_node, cleanup,
5653 clobber);
5654 else
5655 cleanup = clobber;
5658 if (cleanup)
5659 gimple_push_cleanup (temp, cleanup, false, pre_p);
5661 /* Only expand this once. */
5662 TREE_OPERAND (targ, 3) = init;
5663 TARGET_EXPR_INITIAL (targ) = NULL_TREE;
5665 else
5666 /* We should have expanded this before. */
5667 gcc_assert (DECL_SEEN_IN_BIND_EXPR_P (temp));
5669 *expr_p = temp;
5670 return GS_OK;
5673 /* Gimplification of expression trees. */
5675 /* Gimplify an expression which appears at statement context. The
5676 corresponding GIMPLE statements are added to *SEQ_P. If *SEQ_P is
5677 NULL, a new sequence is allocated.
5679 Return true if we actually added a statement to the queue. */
5681 bool
5682 gimplify_stmt (tree *stmt_p, gimple_seq *seq_p)
5684 gimple_seq_node last;
5686 last = gimple_seq_last (*seq_p);
5687 gimplify_expr (stmt_p, seq_p, NULL, is_gimple_stmt, fb_none);
5688 return last != gimple_seq_last (*seq_p);
5691 /* Add FIRSTPRIVATE entries for DECL in the OpenMP the surrounding parallels
5692 to CTX. If entries already exist, force them to be some flavor of private.
5693 If there is no enclosing parallel, do nothing. */
5695 void
5696 omp_firstprivatize_variable (struct gimplify_omp_ctx *ctx, tree decl)
5698 splay_tree_node n;
5700 if (decl == NULL || !DECL_P (decl) || ctx->region_type == ORT_NONE)
5701 return;
5705 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5706 if (n != NULL)
5708 if (n->value & GOVD_SHARED)
5709 n->value = GOVD_FIRSTPRIVATE | (n->value & GOVD_SEEN);
5710 else if (n->value & GOVD_MAP)
5711 n->value |= GOVD_MAP_TO_ONLY;
5712 else
5713 return;
5715 else if ((ctx->region_type & ORT_TARGET) != 0)
5717 if (ctx->target_map_scalars_firstprivate)
5718 omp_add_variable (ctx, decl, GOVD_FIRSTPRIVATE);
5719 else
5720 omp_add_variable (ctx, decl, GOVD_MAP | GOVD_MAP_TO_ONLY);
5722 else if (ctx->region_type != ORT_WORKSHARE
5723 && ctx->region_type != ORT_SIMD
5724 && ctx->region_type != ORT_ACC
5725 && !(ctx->region_type & ORT_TARGET_DATA))
5726 omp_add_variable (ctx, decl, GOVD_FIRSTPRIVATE);
5728 ctx = ctx->outer_context;
5730 while (ctx);
5733 /* Similarly for each of the type sizes of TYPE. */
5735 static void
5736 omp_firstprivatize_type_sizes (struct gimplify_omp_ctx *ctx, tree type)
5738 if (type == NULL || type == error_mark_node)
5739 return;
5740 type = TYPE_MAIN_VARIANT (type);
5742 if (ctx->privatized_types->add (type))
5743 return;
5745 switch (TREE_CODE (type))
5747 case INTEGER_TYPE:
5748 case ENUMERAL_TYPE:
5749 case BOOLEAN_TYPE:
5750 case REAL_TYPE:
5751 case FIXED_POINT_TYPE:
5752 omp_firstprivatize_variable (ctx, TYPE_MIN_VALUE (type));
5753 omp_firstprivatize_variable (ctx, TYPE_MAX_VALUE (type));
5754 break;
5756 case ARRAY_TYPE:
5757 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (type));
5758 omp_firstprivatize_type_sizes (ctx, TYPE_DOMAIN (type));
5759 break;
5761 case RECORD_TYPE:
5762 case UNION_TYPE:
5763 case QUAL_UNION_TYPE:
5765 tree field;
5766 for (field = TYPE_FIELDS (type); field; field = DECL_CHAIN (field))
5767 if (TREE_CODE (field) == FIELD_DECL)
5769 omp_firstprivatize_variable (ctx, DECL_FIELD_OFFSET (field));
5770 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (field));
5773 break;
5775 case POINTER_TYPE:
5776 case REFERENCE_TYPE:
5777 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (type));
5778 break;
5780 default:
5781 break;
5784 omp_firstprivatize_variable (ctx, TYPE_SIZE (type));
5785 omp_firstprivatize_variable (ctx, TYPE_SIZE_UNIT (type));
5786 lang_hooks.types.omp_firstprivatize_type_sizes (ctx, type);
5789 /* Add an entry for DECL in the OMP context CTX with FLAGS. */
5791 static void
5792 omp_add_variable (struct gimplify_omp_ctx *ctx, tree decl, unsigned int flags)
5794 splay_tree_node n;
5795 unsigned int nflags;
5796 tree t;
5798 if (error_operand_p (decl) || ctx->region_type == ORT_NONE)
5799 return;
5801 /* Never elide decls whose type has TREE_ADDRESSABLE set. This means
5802 there are constructors involved somewhere. */
5803 if (TREE_ADDRESSABLE (TREE_TYPE (decl))
5804 || TYPE_NEEDS_CONSTRUCTING (TREE_TYPE (decl)))
5805 flags |= GOVD_SEEN;
5807 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5808 if (n != NULL && (n->value & GOVD_DATA_SHARE_CLASS) != 0)
5810 /* We shouldn't be re-adding the decl with the same data
5811 sharing class. */
5812 gcc_assert ((n->value & GOVD_DATA_SHARE_CLASS & flags) == 0);
5813 nflags = n->value | flags;
5814 /* The only combination of data sharing classes we should see is
5815 FIRSTPRIVATE and LASTPRIVATE. However, OpenACC permits
5816 reduction variables to be used in data sharing clauses. */
5817 gcc_assert ((ctx->region_type & ORT_ACC) != 0
5818 || ((nflags & GOVD_DATA_SHARE_CLASS)
5819 == (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE))
5820 || (flags & GOVD_DATA_SHARE_CLASS) == 0);
5821 n->value = nflags;
5822 return;
5825 /* When adding a variable-sized variable, we have to handle all sorts
5826 of additional bits of data: the pointer replacement variable, and
5827 the parameters of the type. */
5828 if (DECL_SIZE (decl) && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
5830 /* Add the pointer replacement variable as PRIVATE if the variable
5831 replacement is private, else FIRSTPRIVATE since we'll need the
5832 address of the original variable either for SHARED, or for the
5833 copy into or out of the context. */
5834 if (!(flags & GOVD_LOCAL))
5836 if (flags & GOVD_MAP)
5837 nflags = GOVD_MAP | GOVD_MAP_TO_ONLY | GOVD_EXPLICIT;
5838 else if (flags & GOVD_PRIVATE)
5839 nflags = GOVD_PRIVATE;
5840 else if ((ctx->region_type & (ORT_TARGET | ORT_TARGET_DATA)) != 0
5841 && (flags & GOVD_FIRSTPRIVATE))
5842 nflags = GOVD_PRIVATE | GOVD_EXPLICIT;
5843 else
5844 nflags = GOVD_FIRSTPRIVATE;
5845 nflags |= flags & GOVD_SEEN;
5846 t = DECL_VALUE_EXPR (decl);
5847 gcc_assert (TREE_CODE (t) == INDIRECT_REF);
5848 t = TREE_OPERAND (t, 0);
5849 gcc_assert (DECL_P (t));
5850 omp_add_variable (ctx, t, nflags);
5853 /* Add all of the variable and type parameters (which should have
5854 been gimplified to a formal temporary) as FIRSTPRIVATE. */
5855 omp_firstprivatize_variable (ctx, DECL_SIZE_UNIT (decl));
5856 omp_firstprivatize_variable (ctx, DECL_SIZE (decl));
5857 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (decl));
5859 /* The variable-sized variable itself is never SHARED, only some form
5860 of PRIVATE. The sharing would take place via the pointer variable
5861 which we remapped above. */
5862 if (flags & GOVD_SHARED)
5863 flags = GOVD_PRIVATE | GOVD_DEBUG_PRIVATE
5864 | (flags & (GOVD_SEEN | GOVD_EXPLICIT));
5866 /* We're going to make use of the TYPE_SIZE_UNIT at least in the
5867 alloca statement we generate for the variable, so make sure it
5868 is available. This isn't automatically needed for the SHARED
5869 case, since we won't be allocating local storage then.
5870 For local variables TYPE_SIZE_UNIT might not be gimplified yet,
5871 in this case omp_notice_variable will be called later
5872 on when it is gimplified. */
5873 else if (! (flags & (GOVD_LOCAL | GOVD_MAP))
5874 && DECL_P (TYPE_SIZE_UNIT (TREE_TYPE (decl))))
5875 omp_notice_variable (ctx, TYPE_SIZE_UNIT (TREE_TYPE (decl)), true);
5877 else if ((flags & (GOVD_MAP | GOVD_LOCAL)) == 0
5878 && lang_hooks.decls.omp_privatize_by_reference (decl))
5880 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (decl));
5882 /* Similar to the direct variable sized case above, we'll need the
5883 size of references being privatized. */
5884 if ((flags & GOVD_SHARED) == 0)
5886 t = TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl)));
5887 if (DECL_P (t))
5888 omp_notice_variable (ctx, t, true);
5892 if (n != NULL)
5893 n->value |= flags;
5894 else
5895 splay_tree_insert (ctx->variables, (splay_tree_key)decl, flags);
5897 /* For reductions clauses in OpenACC loop directives, by default create a
5898 copy clause on the enclosing parallel construct for carrying back the
5899 results. */
5900 if (ctx->region_type == ORT_ACC && (flags & GOVD_REDUCTION))
5902 struct gimplify_omp_ctx *outer_ctx = ctx->outer_context;
5903 while (outer_ctx)
5905 n = splay_tree_lookup (outer_ctx->variables, (splay_tree_key)decl);
5906 if (n != NULL)
5908 /* Ignore local variables and explicitly declared clauses. */
5909 if (n->value & (GOVD_LOCAL | GOVD_EXPLICIT))
5910 break;
5911 else if (outer_ctx->region_type == ORT_ACC_KERNELS)
5913 /* According to the OpenACC spec, such a reduction variable
5914 should already have a copy map on a kernels construct,
5915 verify that here. */
5916 gcc_assert (!(n->value & GOVD_FIRSTPRIVATE)
5917 && (n->value & GOVD_MAP));
5919 else if (outer_ctx->region_type == ORT_ACC_PARALLEL)
5921 /* Remove firstprivate and make it a copy map. */
5922 n->value &= ~GOVD_FIRSTPRIVATE;
5923 n->value |= GOVD_MAP;
5926 else if (outer_ctx->region_type == ORT_ACC_PARALLEL)
5928 splay_tree_insert (outer_ctx->variables, (splay_tree_key)decl,
5929 GOVD_MAP | GOVD_SEEN);
5930 break;
5932 outer_ctx = outer_ctx->outer_context;
5937 /* Notice a threadprivate variable DECL used in OMP context CTX.
5938 This just prints out diagnostics about threadprivate variable uses
5939 in untied tasks. If DECL2 is non-NULL, prevent this warning
5940 on that variable. */
5942 static bool
5943 omp_notice_threadprivate_variable (struct gimplify_omp_ctx *ctx, tree decl,
5944 tree decl2)
5946 splay_tree_node n;
5947 struct gimplify_omp_ctx *octx;
5949 for (octx = ctx; octx; octx = octx->outer_context)
5950 if ((octx->region_type & ORT_TARGET) != 0)
5952 n = splay_tree_lookup (octx->variables, (splay_tree_key)decl);
5953 if (n == NULL)
5955 error ("threadprivate variable %qE used in target region",
5956 DECL_NAME (decl));
5957 error_at (octx->location, "enclosing target region");
5958 splay_tree_insert (octx->variables, (splay_tree_key)decl, 0);
5960 if (decl2)
5961 splay_tree_insert (octx->variables, (splay_tree_key)decl2, 0);
5964 if (ctx->region_type != ORT_UNTIED_TASK)
5965 return false;
5966 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5967 if (n == NULL)
5969 error ("threadprivate variable %qE used in untied task",
5970 DECL_NAME (decl));
5971 error_at (ctx->location, "enclosing task");
5972 splay_tree_insert (ctx->variables, (splay_tree_key)decl, 0);
5974 if (decl2)
5975 splay_tree_insert (ctx->variables, (splay_tree_key)decl2, 0);
5976 return false;
5979 /* Return true if global var DECL is device resident. */
5981 static bool
5982 device_resident_p (tree decl)
5984 tree attr = lookup_attribute ("oacc declare target", DECL_ATTRIBUTES (decl));
5986 if (!attr)
5987 return false;
5989 for (tree t = TREE_VALUE (attr); t; t = TREE_PURPOSE (t))
5991 tree c = TREE_VALUE (t);
5992 if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_DEVICE_RESIDENT)
5993 return true;
5996 return false;
5999 /* Determine outer default flags for DECL mentioned in an OMP region
6000 but not declared in an enclosing clause.
6002 ??? Some compiler-generated variables (like SAVE_EXPRs) could be
6003 remapped firstprivate instead of shared. To some extent this is
6004 addressed in omp_firstprivatize_type_sizes, but not
6005 effectively. */
6007 static unsigned
6008 omp_default_clause (struct gimplify_omp_ctx *ctx, tree decl,
6009 bool in_code, unsigned flags)
6011 enum omp_clause_default_kind default_kind = ctx->default_kind;
6012 enum omp_clause_default_kind kind;
6014 kind = lang_hooks.decls.omp_predetermined_sharing (decl);
6015 if (kind != OMP_CLAUSE_DEFAULT_UNSPECIFIED)
6016 default_kind = kind;
6018 switch (default_kind)
6020 case OMP_CLAUSE_DEFAULT_NONE:
6022 const char *rtype;
6024 if (ctx->region_type & ORT_PARALLEL)
6025 rtype = "parallel";
6026 else if (ctx->region_type & ORT_TASK)
6027 rtype = "task";
6028 else if (ctx->region_type & ORT_TEAMS)
6029 rtype = "teams";
6030 else
6031 gcc_unreachable ();
6033 error ("%qE not specified in enclosing %s",
6034 DECL_NAME (lang_hooks.decls.omp_report_decl (decl)), rtype);
6035 error_at (ctx->location, "enclosing %s", rtype);
6037 /* FALLTHRU */
6038 case OMP_CLAUSE_DEFAULT_SHARED:
6039 flags |= GOVD_SHARED;
6040 break;
6041 case OMP_CLAUSE_DEFAULT_PRIVATE:
6042 flags |= GOVD_PRIVATE;
6043 break;
6044 case OMP_CLAUSE_DEFAULT_FIRSTPRIVATE:
6045 flags |= GOVD_FIRSTPRIVATE;
6046 break;
6047 case OMP_CLAUSE_DEFAULT_UNSPECIFIED:
6048 /* decl will be either GOVD_FIRSTPRIVATE or GOVD_SHARED. */
6049 gcc_assert ((ctx->region_type & ORT_TASK) != 0);
6050 if (struct gimplify_omp_ctx *octx = ctx->outer_context)
6052 omp_notice_variable (octx, decl, in_code);
6053 for (; octx; octx = octx->outer_context)
6055 splay_tree_node n2;
6057 n2 = splay_tree_lookup (octx->variables, (splay_tree_key) decl);
6058 if ((octx->region_type & (ORT_TARGET_DATA | ORT_TARGET)) != 0
6059 && (n2 == NULL || (n2->value & GOVD_DATA_SHARE_CLASS) == 0))
6060 continue;
6061 if (n2 && (n2->value & GOVD_DATA_SHARE_CLASS) != GOVD_SHARED)
6063 flags |= GOVD_FIRSTPRIVATE;
6064 goto found_outer;
6066 if ((octx->region_type & (ORT_PARALLEL | ORT_TEAMS)) != 0)
6068 flags |= GOVD_SHARED;
6069 goto found_outer;
6074 if (TREE_CODE (decl) == PARM_DECL
6075 || (!is_global_var (decl)
6076 && DECL_CONTEXT (decl) == current_function_decl))
6077 flags |= GOVD_FIRSTPRIVATE;
6078 else
6079 flags |= GOVD_SHARED;
6080 found_outer:
6081 break;
6083 default:
6084 gcc_unreachable ();
6087 return flags;
6091 /* Determine outer default flags for DECL mentioned in an OACC region
6092 but not declared in an enclosing clause. */
6094 static unsigned
6095 oacc_default_clause (struct gimplify_omp_ctx *ctx, tree decl, unsigned flags)
6097 const char *rkind;
6098 bool on_device = false;
6099 tree type = TREE_TYPE (decl);
6101 if (lang_hooks.decls.omp_privatize_by_reference (decl))
6102 type = TREE_TYPE (type);
6104 if ((ctx->region_type & (ORT_ACC_PARALLEL | ORT_ACC_KERNELS)) != 0
6105 && is_global_var (decl)
6106 && device_resident_p (decl))
6108 on_device = true;
6109 flags |= GOVD_MAP_TO_ONLY;
6112 switch (ctx->region_type)
6114 default:
6115 gcc_unreachable ();
6117 case ORT_ACC_KERNELS:
6118 /* Scalars are default 'copy' under kernels, non-scalars are default
6119 'present_or_copy'. */
6120 flags |= GOVD_MAP;
6121 if (!AGGREGATE_TYPE_P (type))
6122 flags |= GOVD_MAP_FORCE;
6124 rkind = "kernels";
6125 break;
6127 case ORT_ACC_PARALLEL:
6129 if (on_device || AGGREGATE_TYPE_P (type))
6130 /* Aggregates default to 'present_or_copy'. */
6131 flags |= GOVD_MAP;
6132 else
6133 /* Scalars default to 'firstprivate'. */
6134 flags |= GOVD_FIRSTPRIVATE;
6135 rkind = "parallel";
6137 break;
6140 if (DECL_ARTIFICIAL (decl))
6141 ; /* We can get compiler-generated decls, and should not complain
6142 about them. */
6143 else if (ctx->default_kind == OMP_CLAUSE_DEFAULT_NONE)
6145 error ("%qE not specified in enclosing OpenACC %qs construct",
6146 DECL_NAME (lang_hooks.decls.omp_report_decl (decl)), rkind);
6147 inform (ctx->location, "enclosing OpenACC %qs construct", rkind);
6149 else
6150 gcc_checking_assert (ctx->default_kind == OMP_CLAUSE_DEFAULT_SHARED);
6152 return flags;
6155 /* Record the fact that DECL was used within the OMP context CTX.
6156 IN_CODE is true when real code uses DECL, and false when we should
6157 merely emit default(none) errors. Return true if DECL is going to
6158 be remapped and thus DECL shouldn't be gimplified into its
6159 DECL_VALUE_EXPR (if any). */
6161 static bool
6162 omp_notice_variable (struct gimplify_omp_ctx *ctx, tree decl, bool in_code)
6164 splay_tree_node n;
6165 unsigned flags = in_code ? GOVD_SEEN : 0;
6166 bool ret = false, shared;
6168 if (error_operand_p (decl))
6169 return false;
6171 if (ctx->region_type == ORT_NONE)
6172 return lang_hooks.decls.omp_disregard_value_expr (decl, false);
6174 if (is_global_var (decl))
6176 /* Threadprivate variables are predetermined. */
6177 if (DECL_THREAD_LOCAL_P (decl))
6178 return omp_notice_threadprivate_variable (ctx, decl, NULL_TREE);
6180 if (DECL_HAS_VALUE_EXPR_P (decl))
6182 tree value = get_base_address (DECL_VALUE_EXPR (decl));
6184 if (value && DECL_P (value) && DECL_THREAD_LOCAL_P (value))
6185 return omp_notice_threadprivate_variable (ctx, decl, value);
6188 if (gimplify_omp_ctxp->outer_context == NULL
6189 && VAR_P (decl)
6190 && get_oacc_fn_attrib (current_function_decl))
6192 location_t loc = DECL_SOURCE_LOCATION (decl);
6194 if (lookup_attribute ("omp declare target link",
6195 DECL_ATTRIBUTES (decl)))
6197 error_at (loc,
6198 "%qE with %<link%> clause used in %<routine%> function",
6199 DECL_NAME (decl));
6200 return false;
6202 else if (!lookup_attribute ("omp declare target",
6203 DECL_ATTRIBUTES (decl)))
6205 error_at (loc,
6206 "%qE requires a %<declare%> directive for use "
6207 "in a %<routine%> function", DECL_NAME (decl));
6208 return false;
6213 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
6214 if ((ctx->region_type & ORT_TARGET) != 0)
6216 ret = lang_hooks.decls.omp_disregard_value_expr (decl, true);
6217 if (n == NULL)
6219 unsigned nflags = flags;
6220 if (ctx->target_map_pointers_as_0len_arrays
6221 || ctx->target_map_scalars_firstprivate)
6223 bool is_declare_target = false;
6224 bool is_scalar = false;
6225 if (is_global_var (decl)
6226 && varpool_node::get_create (decl)->offloadable)
6228 struct gimplify_omp_ctx *octx;
6229 for (octx = ctx->outer_context;
6230 octx; octx = octx->outer_context)
6232 n = splay_tree_lookup (octx->variables,
6233 (splay_tree_key)decl);
6234 if (n
6235 && (n->value & GOVD_DATA_SHARE_CLASS) != GOVD_SHARED
6236 && (n->value & GOVD_DATA_SHARE_CLASS) != 0)
6237 break;
6239 is_declare_target = octx == NULL;
6241 if (!is_declare_target && ctx->target_map_scalars_firstprivate)
6243 tree type = TREE_TYPE (decl);
6244 if (TREE_CODE (type) == REFERENCE_TYPE)
6245 type = TREE_TYPE (type);
6246 if (TREE_CODE (type) == COMPLEX_TYPE)
6247 type = TREE_TYPE (type);
6248 if (INTEGRAL_TYPE_P (type)
6249 || SCALAR_FLOAT_TYPE_P (type)
6250 || TREE_CODE (type) == POINTER_TYPE)
6251 is_scalar = true;
6253 if (is_declare_target)
6255 else if (ctx->target_map_pointers_as_0len_arrays
6256 && (TREE_CODE (TREE_TYPE (decl)) == POINTER_TYPE
6257 || (TREE_CODE (TREE_TYPE (decl)) == REFERENCE_TYPE
6258 && TREE_CODE (TREE_TYPE (TREE_TYPE (decl)))
6259 == POINTER_TYPE)))
6260 nflags |= GOVD_MAP | GOVD_MAP_0LEN_ARRAY;
6261 else if (is_scalar)
6262 nflags |= GOVD_FIRSTPRIVATE;
6265 struct gimplify_omp_ctx *octx = ctx->outer_context;
6266 if ((ctx->region_type & ORT_ACC) && octx)
6268 /* Look in outer OpenACC contexts, to see if there's a
6269 data attribute for this variable. */
6270 omp_notice_variable (octx, decl, in_code);
6272 for (; octx; octx = octx->outer_context)
6274 if (!(octx->region_type & (ORT_TARGET_DATA | ORT_TARGET)))
6275 break;
6276 splay_tree_node n2
6277 = splay_tree_lookup (octx->variables,
6278 (splay_tree_key) decl);
6279 if (n2)
6281 if (octx->region_type == ORT_ACC_HOST_DATA)
6282 error ("variable %qE declared in enclosing "
6283 "%<host_data%> region", DECL_NAME (decl));
6284 nflags |= GOVD_MAP;
6285 goto found_outer;
6291 tree type = TREE_TYPE (decl);
6293 if (nflags == flags
6294 && gimplify_omp_ctxp->target_firstprivatize_array_bases
6295 && lang_hooks.decls.omp_privatize_by_reference (decl))
6296 type = TREE_TYPE (type);
6297 if (nflags == flags
6298 && !lang_hooks.types.omp_mappable_type (type))
6300 error ("%qD referenced in target region does not have "
6301 "a mappable type", decl);
6302 nflags |= GOVD_MAP | GOVD_EXPLICIT;
6304 else if (nflags == flags)
6306 if ((ctx->region_type & ORT_ACC) != 0)
6307 nflags = oacc_default_clause (ctx, decl, flags);
6308 else
6309 nflags |= GOVD_MAP;
6312 found_outer:
6313 omp_add_variable (ctx, decl, nflags);
6315 else
6317 /* If nothing changed, there's nothing left to do. */
6318 if ((n->value & flags) == flags)
6319 return ret;
6320 flags |= n->value;
6321 n->value = flags;
6323 goto do_outer;
6326 if (n == NULL)
6328 if (ctx->region_type == ORT_WORKSHARE
6329 || ctx->region_type == ORT_SIMD
6330 || ctx->region_type == ORT_ACC
6331 || (ctx->region_type & ORT_TARGET_DATA) != 0)
6332 goto do_outer;
6334 flags = omp_default_clause (ctx, decl, in_code, flags);
6336 if ((flags & GOVD_PRIVATE)
6337 && lang_hooks.decls.omp_private_outer_ref (decl))
6338 flags |= GOVD_PRIVATE_OUTER_REF;
6340 omp_add_variable (ctx, decl, flags);
6342 shared = (flags & GOVD_SHARED) != 0;
6343 ret = lang_hooks.decls.omp_disregard_value_expr (decl, shared);
6344 goto do_outer;
6347 if ((n->value & (GOVD_SEEN | GOVD_LOCAL)) == 0
6348 && (flags & (GOVD_SEEN | GOVD_LOCAL)) == GOVD_SEEN
6349 && DECL_SIZE (decl))
6351 if (TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
6353 splay_tree_node n2;
6354 tree t = DECL_VALUE_EXPR (decl);
6355 gcc_assert (TREE_CODE (t) == INDIRECT_REF);
6356 t = TREE_OPERAND (t, 0);
6357 gcc_assert (DECL_P (t));
6358 n2 = splay_tree_lookup (ctx->variables, (splay_tree_key) t);
6359 n2->value |= GOVD_SEEN;
6361 else if (lang_hooks.decls.omp_privatize_by_reference (decl)
6362 && TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl)))
6363 && (TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl))))
6364 != INTEGER_CST))
6366 splay_tree_node n2;
6367 tree t = TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl)));
6368 gcc_assert (DECL_P (t));
6369 n2 = splay_tree_lookup (ctx->variables, (splay_tree_key) t);
6370 if (n2)
6371 n2->value |= GOVD_SEEN;
6375 shared = ((flags | n->value) & GOVD_SHARED) != 0;
6376 ret = lang_hooks.decls.omp_disregard_value_expr (decl, shared);
6378 /* If nothing changed, there's nothing left to do. */
6379 if ((n->value & flags) == flags)
6380 return ret;
6381 flags |= n->value;
6382 n->value = flags;
6384 do_outer:
6385 /* If the variable is private in the current context, then we don't
6386 need to propagate anything to an outer context. */
6387 if ((flags & GOVD_PRIVATE) && !(flags & GOVD_PRIVATE_OUTER_REF))
6388 return ret;
6389 if ((flags & (GOVD_LINEAR | GOVD_LINEAR_LASTPRIVATE_NO_OUTER))
6390 == (GOVD_LINEAR | GOVD_LINEAR_LASTPRIVATE_NO_OUTER))
6391 return ret;
6392 if ((flags & (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE
6393 | GOVD_LINEAR_LASTPRIVATE_NO_OUTER))
6394 == (GOVD_LASTPRIVATE | GOVD_LINEAR_LASTPRIVATE_NO_OUTER))
6395 return ret;
6396 if (ctx->outer_context
6397 && omp_notice_variable (ctx->outer_context, decl, in_code))
6398 return true;
6399 return ret;
6402 /* Verify that DECL is private within CTX. If there's specific information
6403 to the contrary in the innermost scope, generate an error. */
6405 static bool
6406 omp_is_private (struct gimplify_omp_ctx *ctx, tree decl, int simd)
6408 splay_tree_node n;
6410 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
6411 if (n != NULL)
6413 if (n->value & GOVD_SHARED)
6415 if (ctx == gimplify_omp_ctxp)
6417 if (simd)
6418 error ("iteration variable %qE is predetermined linear",
6419 DECL_NAME (decl));
6420 else
6421 error ("iteration variable %qE should be private",
6422 DECL_NAME (decl));
6423 n->value = GOVD_PRIVATE;
6424 return true;
6426 else
6427 return false;
6429 else if ((n->value & GOVD_EXPLICIT) != 0
6430 && (ctx == gimplify_omp_ctxp
6431 || (ctx->region_type == ORT_COMBINED_PARALLEL
6432 && gimplify_omp_ctxp->outer_context == ctx)))
6434 if ((n->value & GOVD_FIRSTPRIVATE) != 0)
6435 error ("iteration variable %qE should not be firstprivate",
6436 DECL_NAME (decl));
6437 else if ((n->value & GOVD_REDUCTION) != 0)
6438 error ("iteration variable %qE should not be reduction",
6439 DECL_NAME (decl));
6440 else if (simd == 0 && (n->value & GOVD_LINEAR) != 0)
6441 error ("iteration variable %qE should not be linear",
6442 DECL_NAME (decl));
6443 else if (simd == 1 && (n->value & GOVD_LASTPRIVATE) != 0)
6444 error ("iteration variable %qE should not be lastprivate",
6445 DECL_NAME (decl));
6446 else if (simd && (n->value & GOVD_PRIVATE) != 0)
6447 error ("iteration variable %qE should not be private",
6448 DECL_NAME (decl));
6449 else if (simd == 2 && (n->value & GOVD_LINEAR) != 0)
6450 error ("iteration variable %qE is predetermined linear",
6451 DECL_NAME (decl));
6453 return (ctx == gimplify_omp_ctxp
6454 || (ctx->region_type == ORT_COMBINED_PARALLEL
6455 && gimplify_omp_ctxp->outer_context == ctx));
6458 if (ctx->region_type != ORT_WORKSHARE
6459 && ctx->region_type != ORT_SIMD
6460 && ctx->region_type != ORT_ACC)
6461 return false;
6462 else if (ctx->outer_context)
6463 return omp_is_private (ctx->outer_context, decl, simd);
6464 return false;
6467 /* Return true if DECL is private within a parallel region
6468 that binds to the current construct's context or in parallel
6469 region's REDUCTION clause. */
6471 static bool
6472 omp_check_private (struct gimplify_omp_ctx *ctx, tree decl, bool copyprivate)
6474 splay_tree_node n;
6478 ctx = ctx->outer_context;
6479 if (ctx == NULL)
6481 if (is_global_var (decl))
6482 return false;
6484 /* References might be private, but might be shared too,
6485 when checking for copyprivate, assume they might be
6486 private, otherwise assume they might be shared. */
6487 if (copyprivate)
6488 return true;
6490 if (lang_hooks.decls.omp_privatize_by_reference (decl))
6491 return false;
6493 /* Treat C++ privatized non-static data members outside
6494 of the privatization the same. */
6495 if (omp_member_access_dummy_var (decl))
6496 return false;
6498 return true;
6501 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
6503 if ((ctx->region_type & (ORT_TARGET | ORT_TARGET_DATA)) != 0
6504 && (n == NULL || (n->value & GOVD_DATA_SHARE_CLASS) == 0))
6505 continue;
6507 if (n != NULL)
6509 if ((n->value & GOVD_LOCAL) != 0
6510 && omp_member_access_dummy_var (decl))
6511 return false;
6512 return (n->value & GOVD_SHARED) == 0;
6515 while (ctx->region_type == ORT_WORKSHARE
6516 || ctx->region_type == ORT_SIMD
6517 || ctx->region_type == ORT_ACC);
6518 return false;
6521 /* Return true if the CTX is combined with distribute and thus
6522 lastprivate can't be supported. */
6524 static bool
6525 omp_no_lastprivate (struct gimplify_omp_ctx *ctx)
6529 if (ctx->outer_context == NULL)
6530 return false;
6531 ctx = ctx->outer_context;
6532 switch (ctx->region_type)
6534 case ORT_WORKSHARE:
6535 if (!ctx->combined_loop)
6536 return false;
6537 if (ctx->distribute)
6538 return lang_GNU_Fortran ();
6539 break;
6540 case ORT_COMBINED_PARALLEL:
6541 break;
6542 case ORT_COMBINED_TEAMS:
6543 return lang_GNU_Fortran ();
6544 default:
6545 return false;
6548 while (1);
6551 /* Callback for walk_tree to find a DECL_EXPR for the given DECL. */
6553 static tree
6554 find_decl_expr (tree *tp, int *walk_subtrees, void *data)
6556 tree t = *tp;
6558 /* If this node has been visited, unmark it and keep looking. */
6559 if (TREE_CODE (t) == DECL_EXPR && DECL_EXPR_DECL (t) == (tree) data)
6560 return t;
6562 if (IS_TYPE_OR_DECL_P (t))
6563 *walk_subtrees = 0;
6564 return NULL_TREE;
6567 /* Scan the OMP clauses in *LIST_P, installing mappings into a new
6568 and previous omp contexts. */
6570 static void
6571 gimplify_scan_omp_clauses (tree *list_p, gimple_seq *pre_p,
6572 enum omp_region_type region_type,
6573 enum tree_code code)
6575 struct gimplify_omp_ctx *ctx, *outer_ctx;
6576 tree c;
6577 hash_map<tree, tree> *struct_map_to_clause = NULL;
6578 tree *prev_list_p = NULL;
6580 ctx = new_omp_context (region_type);
6581 outer_ctx = ctx->outer_context;
6582 if (code == OMP_TARGET && !lang_GNU_Fortran ())
6584 ctx->target_map_pointers_as_0len_arrays = true;
6585 /* FIXME: For Fortran we want to set this too, when
6586 the Fortran FE is updated to OpenMP 4.5. */
6587 ctx->target_map_scalars_firstprivate = true;
6589 if (!lang_GNU_Fortran ())
6590 switch (code)
6592 case OMP_TARGET:
6593 case OMP_TARGET_DATA:
6594 case OMP_TARGET_ENTER_DATA:
6595 case OMP_TARGET_EXIT_DATA:
6596 case OACC_HOST_DATA:
6597 ctx->target_firstprivatize_array_bases = true;
6598 default:
6599 break;
6602 while ((c = *list_p) != NULL)
6604 bool remove = false;
6605 bool notice_outer = true;
6606 const char *check_non_private = NULL;
6607 unsigned int flags;
6608 tree decl;
6610 switch (OMP_CLAUSE_CODE (c))
6612 case OMP_CLAUSE_PRIVATE:
6613 flags = GOVD_PRIVATE | GOVD_EXPLICIT;
6614 if (lang_hooks.decls.omp_private_outer_ref (OMP_CLAUSE_DECL (c)))
6616 flags |= GOVD_PRIVATE_OUTER_REF;
6617 OMP_CLAUSE_PRIVATE_OUTER_REF (c) = 1;
6619 else
6620 notice_outer = false;
6621 goto do_add;
6622 case OMP_CLAUSE_SHARED:
6623 flags = GOVD_SHARED | GOVD_EXPLICIT;
6624 goto do_add;
6625 case OMP_CLAUSE_FIRSTPRIVATE:
6626 flags = GOVD_FIRSTPRIVATE | GOVD_EXPLICIT;
6627 check_non_private = "firstprivate";
6628 goto do_add;
6629 case OMP_CLAUSE_LASTPRIVATE:
6630 flags = GOVD_LASTPRIVATE | GOVD_SEEN | GOVD_EXPLICIT;
6631 check_non_private = "lastprivate";
6632 decl = OMP_CLAUSE_DECL (c);
6633 if (omp_no_lastprivate (ctx))
6635 notice_outer = false;
6636 flags |= GOVD_LINEAR_LASTPRIVATE_NO_OUTER;
6638 else if (error_operand_p (decl))
6639 goto do_add;
6640 else if (outer_ctx
6641 && (outer_ctx->region_type == ORT_COMBINED_PARALLEL
6642 || outer_ctx->region_type == ORT_COMBINED_TEAMS)
6643 && splay_tree_lookup (outer_ctx->variables,
6644 (splay_tree_key) decl) == NULL)
6646 omp_add_variable (outer_ctx, decl, GOVD_SHARED | GOVD_SEEN);
6647 if (outer_ctx->outer_context)
6648 omp_notice_variable (outer_ctx->outer_context, decl, true);
6650 else if (outer_ctx
6651 && (outer_ctx->region_type & ORT_TASK) != 0
6652 && outer_ctx->combined_loop
6653 && splay_tree_lookup (outer_ctx->variables,
6654 (splay_tree_key) decl) == NULL)
6656 omp_add_variable (outer_ctx, decl, GOVD_LASTPRIVATE | GOVD_SEEN);
6657 if (outer_ctx->outer_context)
6658 omp_notice_variable (outer_ctx->outer_context, decl, true);
6660 else if (outer_ctx
6661 && (outer_ctx->region_type == ORT_WORKSHARE
6662 || outer_ctx->region_type == ORT_ACC)
6663 && outer_ctx->combined_loop
6664 && splay_tree_lookup (outer_ctx->variables,
6665 (splay_tree_key) decl) == NULL
6666 && !omp_check_private (outer_ctx, decl, false))
6668 omp_add_variable (outer_ctx, decl, GOVD_LASTPRIVATE | GOVD_SEEN);
6669 if (outer_ctx->outer_context
6670 && (outer_ctx->outer_context->region_type
6671 == ORT_COMBINED_PARALLEL)
6672 && splay_tree_lookup (outer_ctx->outer_context->variables,
6673 (splay_tree_key) decl) == NULL)
6675 struct gimplify_omp_ctx *octx = outer_ctx->outer_context;
6676 omp_add_variable (octx, decl, GOVD_SHARED | GOVD_SEEN);
6677 if (octx->outer_context)
6678 omp_notice_variable (octx->outer_context, decl, true);
6680 else if (outer_ctx->outer_context)
6681 omp_notice_variable (outer_ctx->outer_context, decl, true);
6683 goto do_add;
6684 case OMP_CLAUSE_REDUCTION:
6685 flags = GOVD_REDUCTION | GOVD_SEEN | GOVD_EXPLICIT;
6686 /* OpenACC permits reductions on private variables. */
6687 if (!(region_type & ORT_ACC))
6688 check_non_private = "reduction";
6689 decl = OMP_CLAUSE_DECL (c);
6690 if (TREE_CODE (decl) == MEM_REF)
6692 tree type = TREE_TYPE (decl);
6693 if (gimplify_expr (&TYPE_MAX_VALUE (TYPE_DOMAIN (type)), pre_p,
6694 NULL, is_gimple_val, fb_rvalue) == GS_ERROR)
6696 remove = true;
6697 break;
6699 tree v = TYPE_MAX_VALUE (TYPE_DOMAIN (type));
6700 if (DECL_P (v))
6702 omp_firstprivatize_variable (ctx, v);
6703 omp_notice_variable (ctx, v, true);
6705 decl = TREE_OPERAND (decl, 0);
6706 if (TREE_CODE (decl) == POINTER_PLUS_EXPR)
6708 if (gimplify_expr (&TREE_OPERAND (decl, 1), pre_p,
6709 NULL, is_gimple_val, fb_rvalue)
6710 == GS_ERROR)
6712 remove = true;
6713 break;
6715 v = TREE_OPERAND (decl, 1);
6716 if (DECL_P (v))
6718 omp_firstprivatize_variable (ctx, v);
6719 omp_notice_variable (ctx, v, true);
6721 decl = TREE_OPERAND (decl, 0);
6723 if (TREE_CODE (decl) == ADDR_EXPR
6724 || TREE_CODE (decl) == INDIRECT_REF)
6725 decl = TREE_OPERAND (decl, 0);
6727 goto do_add_decl;
6728 case OMP_CLAUSE_LINEAR:
6729 if (gimplify_expr (&OMP_CLAUSE_LINEAR_STEP (c), pre_p, NULL,
6730 is_gimple_val, fb_rvalue) == GS_ERROR)
6732 remove = true;
6733 break;
6735 else
6737 if (code == OMP_SIMD
6738 && !OMP_CLAUSE_LINEAR_NO_COPYIN (c))
6740 struct gimplify_omp_ctx *octx = outer_ctx;
6741 if (octx
6742 && octx->region_type == ORT_WORKSHARE
6743 && octx->combined_loop
6744 && !octx->distribute)
6746 if (octx->outer_context
6747 && (octx->outer_context->region_type
6748 == ORT_COMBINED_PARALLEL))
6749 octx = octx->outer_context->outer_context;
6750 else
6751 octx = octx->outer_context;
6753 if (octx
6754 && octx->region_type == ORT_WORKSHARE
6755 && octx->combined_loop
6756 && octx->distribute
6757 && !lang_GNU_Fortran ())
6759 error_at (OMP_CLAUSE_LOCATION (c),
6760 "%<linear%> clause for variable other than "
6761 "loop iterator specified on construct "
6762 "combined with %<distribute%>");
6763 remove = true;
6764 break;
6767 /* For combined #pragma omp parallel for simd, need to put
6768 lastprivate and perhaps firstprivate too on the
6769 parallel. Similarly for #pragma omp for simd. */
6770 struct gimplify_omp_ctx *octx = outer_ctx;
6771 decl = NULL_TREE;
6772 if (omp_no_lastprivate (ctx))
6773 OMP_CLAUSE_LINEAR_NO_COPYOUT (c) = 1;
6776 if (OMP_CLAUSE_LINEAR_NO_COPYIN (c)
6777 && OMP_CLAUSE_LINEAR_NO_COPYOUT (c))
6778 break;
6779 decl = OMP_CLAUSE_DECL (c);
6780 if (error_operand_p (decl))
6782 decl = NULL_TREE;
6783 break;
6785 flags = GOVD_SEEN;
6786 if (!OMP_CLAUSE_LINEAR_NO_COPYIN (c))
6787 flags |= GOVD_FIRSTPRIVATE;
6788 if (!OMP_CLAUSE_LINEAR_NO_COPYOUT (c))
6789 flags |= GOVD_LASTPRIVATE;
6790 if (octx
6791 && octx->region_type == ORT_WORKSHARE
6792 && octx->combined_loop)
6794 if (octx->outer_context
6795 && (octx->outer_context->region_type
6796 == ORT_COMBINED_PARALLEL))
6797 octx = octx->outer_context;
6798 else if (omp_check_private (octx, decl, false))
6799 break;
6801 else if (octx
6802 && (octx->region_type & ORT_TASK) != 0
6803 && octx->combined_loop)
6805 else if (octx
6806 && octx->region_type == ORT_COMBINED_PARALLEL
6807 && ctx->region_type == ORT_WORKSHARE
6808 && octx == outer_ctx)
6809 flags = GOVD_SEEN | GOVD_SHARED;
6810 else if (octx
6811 && octx->region_type == ORT_COMBINED_TEAMS)
6812 flags = GOVD_SEEN | GOVD_SHARED;
6813 else if (octx
6814 && octx->region_type == ORT_COMBINED_TARGET)
6816 flags &= ~GOVD_LASTPRIVATE;
6817 if (flags == GOVD_SEEN)
6818 break;
6820 else
6821 break;
6822 splay_tree_node on
6823 = splay_tree_lookup (octx->variables,
6824 (splay_tree_key) decl);
6825 if (on && (on->value & GOVD_DATA_SHARE_CLASS) != 0)
6827 octx = NULL;
6828 break;
6830 omp_add_variable (octx, decl, flags);
6831 if (octx->outer_context == NULL)
6832 break;
6833 octx = octx->outer_context;
6835 while (1);
6836 if (octx
6837 && decl
6838 && (!OMP_CLAUSE_LINEAR_NO_COPYIN (c)
6839 || !OMP_CLAUSE_LINEAR_NO_COPYOUT (c)))
6840 omp_notice_variable (octx, decl, true);
6842 flags = GOVD_LINEAR | GOVD_EXPLICIT;
6843 if (OMP_CLAUSE_LINEAR_NO_COPYIN (c)
6844 && OMP_CLAUSE_LINEAR_NO_COPYOUT (c))
6846 notice_outer = false;
6847 flags |= GOVD_LINEAR_LASTPRIVATE_NO_OUTER;
6849 goto do_add;
6851 case OMP_CLAUSE_MAP:
6852 decl = OMP_CLAUSE_DECL (c);
6853 if (error_operand_p (decl))
6854 remove = true;
6855 switch (code)
6857 case OMP_TARGET:
6858 break;
6859 case OMP_TARGET_DATA:
6860 case OMP_TARGET_ENTER_DATA:
6861 case OMP_TARGET_EXIT_DATA:
6862 case OACC_HOST_DATA:
6863 if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_FIRSTPRIVATE_POINTER
6864 || (OMP_CLAUSE_MAP_KIND (c)
6865 == GOMP_MAP_FIRSTPRIVATE_REFERENCE))
6866 /* For target {,enter ,exit }data only the array slice is
6867 mapped, but not the pointer to it. */
6868 remove = true;
6869 break;
6870 default:
6871 break;
6873 if (remove)
6874 break;
6875 if (DECL_P (decl) && outer_ctx && (region_type & ORT_ACC))
6877 struct gimplify_omp_ctx *octx;
6878 for (octx = outer_ctx; octx; octx = octx->outer_context)
6880 if (octx->region_type != ORT_ACC_HOST_DATA)
6881 break;
6882 splay_tree_node n2
6883 = splay_tree_lookup (octx->variables,
6884 (splay_tree_key) decl);
6885 if (n2)
6886 error_at (OMP_CLAUSE_LOCATION (c), "variable %qE "
6887 "declared in enclosing %<host_data%> region",
6888 DECL_NAME (decl));
6891 if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
6892 OMP_CLAUSE_SIZE (c) = DECL_P (decl) ? DECL_SIZE_UNIT (decl)
6893 : TYPE_SIZE_UNIT (TREE_TYPE (decl));
6894 if (gimplify_expr (&OMP_CLAUSE_SIZE (c), pre_p,
6895 NULL, is_gimple_val, fb_rvalue) == GS_ERROR)
6897 remove = true;
6898 break;
6900 else if ((OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_FIRSTPRIVATE_POINTER
6901 || (OMP_CLAUSE_MAP_KIND (c)
6902 == GOMP_MAP_FIRSTPRIVATE_REFERENCE))
6903 && TREE_CODE (OMP_CLAUSE_SIZE (c)) != INTEGER_CST)
6905 OMP_CLAUSE_SIZE (c)
6906 = get_initialized_tmp_var (OMP_CLAUSE_SIZE (c), pre_p, NULL);
6907 omp_add_variable (ctx, OMP_CLAUSE_SIZE (c),
6908 GOVD_FIRSTPRIVATE | GOVD_SEEN);
6910 if (!DECL_P (decl))
6912 tree d = decl, *pd;
6913 if (TREE_CODE (d) == ARRAY_REF)
6915 while (TREE_CODE (d) == ARRAY_REF)
6916 d = TREE_OPERAND (d, 0);
6917 if (TREE_CODE (d) == COMPONENT_REF
6918 && TREE_CODE (TREE_TYPE (d)) == ARRAY_TYPE)
6919 decl = d;
6921 pd = &OMP_CLAUSE_DECL (c);
6922 if (d == decl
6923 && TREE_CODE (decl) == INDIRECT_REF
6924 && TREE_CODE (TREE_OPERAND (decl, 0)) == COMPONENT_REF
6925 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (decl, 0)))
6926 == REFERENCE_TYPE))
6928 pd = &TREE_OPERAND (decl, 0);
6929 decl = TREE_OPERAND (decl, 0);
6931 if (TREE_CODE (decl) == COMPONENT_REF)
6933 while (TREE_CODE (decl) == COMPONENT_REF)
6934 decl = TREE_OPERAND (decl, 0);
6935 if (TREE_CODE (decl) == INDIRECT_REF
6936 && DECL_P (TREE_OPERAND (decl, 0))
6937 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (decl, 0)))
6938 == REFERENCE_TYPE))
6939 decl = TREE_OPERAND (decl, 0);
6941 if (gimplify_expr (pd, pre_p, NULL, is_gimple_lvalue, fb_lvalue)
6942 == GS_ERROR)
6944 remove = true;
6945 break;
6947 if (DECL_P (decl))
6949 if (error_operand_p (decl))
6951 remove = true;
6952 break;
6955 tree stype = TREE_TYPE (decl);
6956 if (TREE_CODE (stype) == REFERENCE_TYPE)
6957 stype = TREE_TYPE (stype);
6958 if (TYPE_SIZE_UNIT (stype) == NULL
6959 || TREE_CODE (TYPE_SIZE_UNIT (stype)) != INTEGER_CST)
6961 error_at (OMP_CLAUSE_LOCATION (c),
6962 "mapping field %qE of variable length "
6963 "structure", OMP_CLAUSE_DECL (c));
6964 remove = true;
6965 break;
6968 if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_ALWAYS_POINTER)
6970 /* Error recovery. */
6971 if (prev_list_p == NULL)
6973 remove = true;
6974 break;
6976 if (OMP_CLAUSE_CHAIN (*prev_list_p) != c)
6978 tree ch = OMP_CLAUSE_CHAIN (*prev_list_p);
6979 if (ch == NULL_TREE || OMP_CLAUSE_CHAIN (ch) != c)
6981 remove = true;
6982 break;
6987 tree offset;
6988 HOST_WIDE_INT bitsize, bitpos;
6989 machine_mode mode;
6990 int unsignedp, reversep, volatilep = 0;
6991 tree base = OMP_CLAUSE_DECL (c);
6992 while (TREE_CODE (base) == ARRAY_REF)
6993 base = TREE_OPERAND (base, 0);
6994 if (TREE_CODE (base) == INDIRECT_REF)
6995 base = TREE_OPERAND (base, 0);
6996 base = get_inner_reference (base, &bitsize, &bitpos, &offset,
6997 &mode, &unsignedp, &reversep,
6998 &volatilep, false);
6999 tree orig_base = base;
7000 if ((TREE_CODE (base) == INDIRECT_REF
7001 || (TREE_CODE (base) == MEM_REF
7002 && integer_zerop (TREE_OPERAND (base, 1))))
7003 && DECL_P (TREE_OPERAND (base, 0))
7004 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (base, 0)))
7005 == REFERENCE_TYPE))
7006 base = TREE_OPERAND (base, 0);
7007 gcc_assert (base == decl
7008 && (offset == NULL_TREE
7009 || TREE_CODE (offset) == INTEGER_CST));
7011 splay_tree_node n
7012 = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
7013 bool ptr = (OMP_CLAUSE_MAP_KIND (c)
7014 == GOMP_MAP_ALWAYS_POINTER);
7015 if (n == NULL || (n->value & GOVD_MAP) == 0)
7017 tree l = build_omp_clause (OMP_CLAUSE_LOCATION (c),
7018 OMP_CLAUSE_MAP);
7019 OMP_CLAUSE_SET_MAP_KIND (l, GOMP_MAP_STRUCT);
7020 if (orig_base != base)
7021 OMP_CLAUSE_DECL (l) = unshare_expr (orig_base);
7022 else
7023 OMP_CLAUSE_DECL (l) = decl;
7024 OMP_CLAUSE_SIZE (l) = size_int (1);
7025 if (struct_map_to_clause == NULL)
7026 struct_map_to_clause = new hash_map<tree, tree>;
7027 struct_map_to_clause->put (decl, l);
7028 if (ptr)
7030 enum gomp_map_kind mkind
7031 = code == OMP_TARGET_EXIT_DATA
7032 ? GOMP_MAP_RELEASE : GOMP_MAP_ALLOC;
7033 tree c2 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
7034 OMP_CLAUSE_MAP);
7035 OMP_CLAUSE_SET_MAP_KIND (c2, mkind);
7036 OMP_CLAUSE_DECL (c2)
7037 = unshare_expr (OMP_CLAUSE_DECL (c));
7038 OMP_CLAUSE_CHAIN (c2) = *prev_list_p;
7039 OMP_CLAUSE_SIZE (c2)
7040 = TYPE_SIZE_UNIT (ptr_type_node);
7041 OMP_CLAUSE_CHAIN (l) = c2;
7042 if (OMP_CLAUSE_CHAIN (*prev_list_p) != c)
7044 tree c4 = OMP_CLAUSE_CHAIN (*prev_list_p);
7045 tree c3
7046 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
7047 OMP_CLAUSE_MAP);
7048 OMP_CLAUSE_SET_MAP_KIND (c3, mkind);
7049 OMP_CLAUSE_DECL (c3)
7050 = unshare_expr (OMP_CLAUSE_DECL (c4));
7051 OMP_CLAUSE_SIZE (c3)
7052 = TYPE_SIZE_UNIT (ptr_type_node);
7053 OMP_CLAUSE_CHAIN (c3) = *prev_list_p;
7054 OMP_CLAUSE_CHAIN (c2) = c3;
7056 *prev_list_p = l;
7057 prev_list_p = NULL;
7059 else
7061 OMP_CLAUSE_CHAIN (l) = c;
7062 *list_p = l;
7063 list_p = &OMP_CLAUSE_CHAIN (l);
7065 if (orig_base != base && code == OMP_TARGET)
7067 tree c2 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
7068 OMP_CLAUSE_MAP);
7069 enum gomp_map_kind mkind
7070 = GOMP_MAP_FIRSTPRIVATE_REFERENCE;
7071 OMP_CLAUSE_SET_MAP_KIND (c2, mkind);
7072 OMP_CLAUSE_DECL (c2) = decl;
7073 OMP_CLAUSE_SIZE (c2) = size_zero_node;
7074 OMP_CLAUSE_CHAIN (c2) = OMP_CLAUSE_CHAIN (l);
7075 OMP_CLAUSE_CHAIN (l) = c2;
7077 flags = GOVD_MAP | GOVD_EXPLICIT;
7078 if (GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c)) || ptr)
7079 flags |= GOVD_SEEN;
7080 goto do_add_decl;
7082 else
7084 tree *osc = struct_map_to_clause->get (decl);
7085 tree *sc = NULL, *scp = NULL;
7086 if (GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c)) || ptr)
7087 n->value |= GOVD_SEEN;
7088 offset_int o1, o2;
7089 if (offset)
7090 o1 = wi::to_offset (offset);
7091 else
7092 o1 = 0;
7093 if (bitpos)
7094 o1 = o1 + bitpos / BITS_PER_UNIT;
7095 sc = &OMP_CLAUSE_CHAIN (*osc);
7096 if (*sc != c
7097 && (OMP_CLAUSE_MAP_KIND (*sc)
7098 == GOMP_MAP_FIRSTPRIVATE_REFERENCE))
7099 sc = &OMP_CLAUSE_CHAIN (*sc);
7100 for (; *sc != c; sc = &OMP_CLAUSE_CHAIN (*sc))
7101 if (ptr && sc == prev_list_p)
7102 break;
7103 else if (TREE_CODE (OMP_CLAUSE_DECL (*sc))
7104 != COMPONENT_REF
7105 && (TREE_CODE (OMP_CLAUSE_DECL (*sc))
7106 != INDIRECT_REF)
7107 && (TREE_CODE (OMP_CLAUSE_DECL (*sc))
7108 != ARRAY_REF))
7109 break;
7110 else
7112 tree offset2;
7113 HOST_WIDE_INT bitsize2, bitpos2;
7114 base = OMP_CLAUSE_DECL (*sc);
7115 if (TREE_CODE (base) == ARRAY_REF)
7117 while (TREE_CODE (base) == ARRAY_REF)
7118 base = TREE_OPERAND (base, 0);
7119 if (TREE_CODE (base) != COMPONENT_REF
7120 || (TREE_CODE (TREE_TYPE (base))
7121 != ARRAY_TYPE))
7122 break;
7124 else if (TREE_CODE (base) == INDIRECT_REF
7125 && (TREE_CODE (TREE_OPERAND (base, 0))
7126 == COMPONENT_REF)
7127 && (TREE_CODE (TREE_TYPE
7128 (TREE_OPERAND (base, 0)))
7129 == REFERENCE_TYPE))
7130 base = TREE_OPERAND (base, 0);
7131 base = get_inner_reference (base, &bitsize2,
7132 &bitpos2, &offset2,
7133 &mode, &unsignedp,
7134 &reversep, &volatilep,
7135 false);
7136 if ((TREE_CODE (base) == INDIRECT_REF
7137 || (TREE_CODE (base) == MEM_REF
7138 && integer_zerop (TREE_OPERAND (base,
7139 1))))
7140 && DECL_P (TREE_OPERAND (base, 0))
7141 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (base,
7142 0)))
7143 == REFERENCE_TYPE))
7144 base = TREE_OPERAND (base, 0);
7145 if (base != decl)
7146 break;
7147 if (scp)
7148 continue;
7149 gcc_assert (offset == NULL_TREE
7150 || TREE_CODE (offset) == INTEGER_CST);
7151 tree d1 = OMP_CLAUSE_DECL (*sc);
7152 tree d2 = OMP_CLAUSE_DECL (c);
7153 while (TREE_CODE (d1) == ARRAY_REF)
7154 d1 = TREE_OPERAND (d1, 0);
7155 while (TREE_CODE (d2) == ARRAY_REF)
7156 d2 = TREE_OPERAND (d2, 0);
7157 if (TREE_CODE (d1) == INDIRECT_REF)
7158 d1 = TREE_OPERAND (d1, 0);
7159 if (TREE_CODE (d2) == INDIRECT_REF)
7160 d2 = TREE_OPERAND (d2, 0);
7161 while (TREE_CODE (d1) == COMPONENT_REF)
7162 if (TREE_CODE (d2) == COMPONENT_REF
7163 && TREE_OPERAND (d1, 1)
7164 == TREE_OPERAND (d2, 1))
7166 d1 = TREE_OPERAND (d1, 0);
7167 d2 = TREE_OPERAND (d2, 0);
7169 else
7170 break;
7171 if (d1 == d2)
7173 error_at (OMP_CLAUSE_LOCATION (c),
7174 "%qE appears more than once in map "
7175 "clauses", OMP_CLAUSE_DECL (c));
7176 remove = true;
7177 break;
7179 if (offset2)
7180 o2 = wi::to_offset (offset2);
7181 else
7182 o2 = 0;
7183 if (bitpos2)
7184 o2 = o2 + bitpos2 / BITS_PER_UNIT;
7185 if (wi::ltu_p (o1, o2)
7186 || (wi::eq_p (o1, o2) && bitpos < bitpos2))
7188 if (ptr)
7189 scp = sc;
7190 else
7191 break;
7194 if (remove)
7195 break;
7196 OMP_CLAUSE_SIZE (*osc)
7197 = size_binop (PLUS_EXPR, OMP_CLAUSE_SIZE (*osc),
7198 size_one_node);
7199 if (ptr)
7201 tree c2 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
7202 OMP_CLAUSE_MAP);
7203 tree cl = NULL_TREE;
7204 enum gomp_map_kind mkind
7205 = code == OMP_TARGET_EXIT_DATA
7206 ? GOMP_MAP_RELEASE : GOMP_MAP_ALLOC;
7207 OMP_CLAUSE_SET_MAP_KIND (c2, mkind);
7208 OMP_CLAUSE_DECL (c2)
7209 = unshare_expr (OMP_CLAUSE_DECL (c));
7210 OMP_CLAUSE_CHAIN (c2) = scp ? *scp : *prev_list_p;
7211 OMP_CLAUSE_SIZE (c2)
7212 = TYPE_SIZE_UNIT (ptr_type_node);
7213 cl = scp ? *prev_list_p : c2;
7214 if (OMP_CLAUSE_CHAIN (*prev_list_p) != c)
7216 tree c4 = OMP_CLAUSE_CHAIN (*prev_list_p);
7217 tree c3
7218 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
7219 OMP_CLAUSE_MAP);
7220 OMP_CLAUSE_SET_MAP_KIND (c3, mkind);
7221 OMP_CLAUSE_DECL (c3)
7222 = unshare_expr (OMP_CLAUSE_DECL (c4));
7223 OMP_CLAUSE_SIZE (c3)
7224 = TYPE_SIZE_UNIT (ptr_type_node);
7225 OMP_CLAUSE_CHAIN (c3) = *prev_list_p;
7226 if (!scp)
7227 OMP_CLAUSE_CHAIN (c2) = c3;
7228 else
7229 cl = c3;
7231 if (scp)
7232 *scp = c2;
7233 if (sc == prev_list_p)
7235 *sc = cl;
7236 prev_list_p = NULL;
7238 else
7240 *prev_list_p = OMP_CLAUSE_CHAIN (c);
7241 list_p = prev_list_p;
7242 prev_list_p = NULL;
7243 OMP_CLAUSE_CHAIN (c) = *sc;
7244 *sc = cl;
7245 continue;
7248 else if (*sc != c)
7250 *list_p = OMP_CLAUSE_CHAIN (c);
7251 OMP_CLAUSE_CHAIN (c) = *sc;
7252 *sc = c;
7253 continue;
7257 if (!remove
7258 && OMP_CLAUSE_MAP_KIND (c) != GOMP_MAP_ALWAYS_POINTER
7259 && OMP_CLAUSE_CHAIN (c)
7260 && OMP_CLAUSE_CODE (OMP_CLAUSE_CHAIN (c)) == OMP_CLAUSE_MAP
7261 && (OMP_CLAUSE_MAP_KIND (OMP_CLAUSE_CHAIN (c))
7262 == GOMP_MAP_ALWAYS_POINTER))
7263 prev_list_p = list_p;
7264 break;
7266 flags = GOVD_MAP | GOVD_EXPLICIT;
7267 if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_ALWAYS_TO
7268 || OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_ALWAYS_TOFROM)
7269 flags |= GOVD_MAP_ALWAYS_TO;
7270 goto do_add;
7272 case OMP_CLAUSE_DEPEND:
7273 if (OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SINK
7274 || OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SOURCE)
7276 /* Nothing to do. OMP_CLAUSE_DECL will be lowered in
7277 omp-low.c. */
7278 break;
7280 if (TREE_CODE (OMP_CLAUSE_DECL (c)) == COMPOUND_EXPR)
7282 gimplify_expr (&TREE_OPERAND (OMP_CLAUSE_DECL (c), 0), pre_p,
7283 NULL, is_gimple_val, fb_rvalue);
7284 OMP_CLAUSE_DECL (c) = TREE_OPERAND (OMP_CLAUSE_DECL (c), 1);
7286 if (error_operand_p (OMP_CLAUSE_DECL (c)))
7288 remove = true;
7289 break;
7291 OMP_CLAUSE_DECL (c) = build_fold_addr_expr (OMP_CLAUSE_DECL (c));
7292 if (gimplify_expr (&OMP_CLAUSE_DECL (c), pre_p, NULL,
7293 is_gimple_val, fb_rvalue) == GS_ERROR)
7295 remove = true;
7296 break;
7298 break;
7300 case OMP_CLAUSE_TO:
7301 case OMP_CLAUSE_FROM:
7302 case OMP_CLAUSE__CACHE_:
7303 decl = OMP_CLAUSE_DECL (c);
7304 if (error_operand_p (decl))
7306 remove = true;
7307 break;
7309 if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
7310 OMP_CLAUSE_SIZE (c) = DECL_P (decl) ? DECL_SIZE_UNIT (decl)
7311 : TYPE_SIZE_UNIT (TREE_TYPE (decl));
7312 if (gimplify_expr (&OMP_CLAUSE_SIZE (c), pre_p,
7313 NULL, is_gimple_val, fb_rvalue) == GS_ERROR)
7315 remove = true;
7316 break;
7318 if (!DECL_P (decl))
7320 if (gimplify_expr (&OMP_CLAUSE_DECL (c), pre_p,
7321 NULL, is_gimple_lvalue, fb_lvalue)
7322 == GS_ERROR)
7324 remove = true;
7325 break;
7327 break;
7329 goto do_notice;
7331 case OMP_CLAUSE_USE_DEVICE_PTR:
7332 flags = GOVD_FIRSTPRIVATE | GOVD_EXPLICIT;
7333 goto do_add;
7334 case OMP_CLAUSE_IS_DEVICE_PTR:
7335 flags = GOVD_FIRSTPRIVATE | GOVD_EXPLICIT;
7336 goto do_add;
7338 do_add:
7339 decl = OMP_CLAUSE_DECL (c);
7340 do_add_decl:
7341 if (error_operand_p (decl))
7343 remove = true;
7344 break;
7346 if (DECL_NAME (decl) == NULL_TREE && (flags & GOVD_SHARED) == 0)
7348 tree t = omp_member_access_dummy_var (decl);
7349 if (t)
7351 tree v = DECL_VALUE_EXPR (decl);
7352 DECL_NAME (decl) = DECL_NAME (TREE_OPERAND (v, 1));
7353 if (outer_ctx)
7354 omp_notice_variable (outer_ctx, t, true);
7357 omp_add_variable (ctx, decl, flags);
7358 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_REDUCTION
7359 && OMP_CLAUSE_REDUCTION_PLACEHOLDER (c))
7361 omp_add_variable (ctx, OMP_CLAUSE_REDUCTION_PLACEHOLDER (c),
7362 GOVD_LOCAL | GOVD_SEEN);
7363 if (OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c)
7364 && walk_tree (&OMP_CLAUSE_REDUCTION_INIT (c),
7365 find_decl_expr,
7366 OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c),
7367 NULL) == NULL_TREE)
7368 omp_add_variable (ctx,
7369 OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c),
7370 GOVD_LOCAL | GOVD_SEEN);
7371 gimplify_omp_ctxp = ctx;
7372 push_gimplify_context ();
7374 OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c) = NULL;
7375 OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c) = NULL;
7377 gimplify_and_add (OMP_CLAUSE_REDUCTION_INIT (c),
7378 &OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c));
7379 pop_gimplify_context
7380 (gimple_seq_first_stmt (OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c)));
7381 push_gimplify_context ();
7382 gimplify_and_add (OMP_CLAUSE_REDUCTION_MERGE (c),
7383 &OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c));
7384 pop_gimplify_context
7385 (gimple_seq_first_stmt (OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c)));
7386 OMP_CLAUSE_REDUCTION_INIT (c) = NULL_TREE;
7387 OMP_CLAUSE_REDUCTION_MERGE (c) = NULL_TREE;
7389 gimplify_omp_ctxp = outer_ctx;
7391 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE
7392 && OMP_CLAUSE_LASTPRIVATE_STMT (c))
7394 gimplify_omp_ctxp = ctx;
7395 push_gimplify_context ();
7396 if (TREE_CODE (OMP_CLAUSE_LASTPRIVATE_STMT (c)) != BIND_EXPR)
7398 tree bind = build3 (BIND_EXPR, void_type_node, NULL,
7399 NULL, NULL);
7400 TREE_SIDE_EFFECTS (bind) = 1;
7401 BIND_EXPR_BODY (bind) = OMP_CLAUSE_LASTPRIVATE_STMT (c);
7402 OMP_CLAUSE_LASTPRIVATE_STMT (c) = bind;
7404 gimplify_and_add (OMP_CLAUSE_LASTPRIVATE_STMT (c),
7405 &OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c));
7406 pop_gimplify_context
7407 (gimple_seq_first_stmt (OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c)));
7408 OMP_CLAUSE_LASTPRIVATE_STMT (c) = NULL_TREE;
7410 gimplify_omp_ctxp = outer_ctx;
7412 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
7413 && OMP_CLAUSE_LINEAR_STMT (c))
7415 gimplify_omp_ctxp = ctx;
7416 push_gimplify_context ();
7417 if (TREE_CODE (OMP_CLAUSE_LINEAR_STMT (c)) != BIND_EXPR)
7419 tree bind = build3 (BIND_EXPR, void_type_node, NULL,
7420 NULL, NULL);
7421 TREE_SIDE_EFFECTS (bind) = 1;
7422 BIND_EXPR_BODY (bind) = OMP_CLAUSE_LINEAR_STMT (c);
7423 OMP_CLAUSE_LINEAR_STMT (c) = bind;
7425 gimplify_and_add (OMP_CLAUSE_LINEAR_STMT (c),
7426 &OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c));
7427 pop_gimplify_context
7428 (gimple_seq_first_stmt (OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c)));
7429 OMP_CLAUSE_LINEAR_STMT (c) = NULL_TREE;
7431 gimplify_omp_ctxp = outer_ctx;
7433 if (notice_outer)
7434 goto do_notice;
7435 break;
7437 case OMP_CLAUSE_COPYIN:
7438 case OMP_CLAUSE_COPYPRIVATE:
7439 decl = OMP_CLAUSE_DECL (c);
7440 if (error_operand_p (decl))
7442 remove = true;
7443 break;
7445 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_COPYPRIVATE
7446 && !remove
7447 && !omp_check_private (ctx, decl, true))
7449 remove = true;
7450 if (is_global_var (decl))
7452 if (DECL_THREAD_LOCAL_P (decl))
7453 remove = false;
7454 else if (DECL_HAS_VALUE_EXPR_P (decl))
7456 tree value = get_base_address (DECL_VALUE_EXPR (decl));
7458 if (value
7459 && DECL_P (value)
7460 && DECL_THREAD_LOCAL_P (value))
7461 remove = false;
7464 if (remove)
7465 error_at (OMP_CLAUSE_LOCATION (c),
7466 "copyprivate variable %qE is not threadprivate"
7467 " or private in outer context", DECL_NAME (decl));
7469 do_notice:
7470 if (outer_ctx)
7471 omp_notice_variable (outer_ctx, decl, true);
7472 if (check_non_private
7473 && region_type == ORT_WORKSHARE
7474 && (OMP_CLAUSE_CODE (c) != OMP_CLAUSE_REDUCTION
7475 || decl == OMP_CLAUSE_DECL (c)
7476 || (TREE_CODE (OMP_CLAUSE_DECL (c)) == MEM_REF
7477 && (TREE_CODE (TREE_OPERAND (OMP_CLAUSE_DECL (c), 0))
7478 == ADDR_EXPR
7479 || (TREE_CODE (TREE_OPERAND (OMP_CLAUSE_DECL (c), 0))
7480 == POINTER_PLUS_EXPR
7481 && (TREE_CODE (TREE_OPERAND (TREE_OPERAND
7482 (OMP_CLAUSE_DECL (c), 0), 0))
7483 == ADDR_EXPR)))))
7484 && omp_check_private (ctx, decl, false))
7486 error ("%s variable %qE is private in outer context",
7487 check_non_private, DECL_NAME (decl));
7488 remove = true;
7490 break;
7492 case OMP_CLAUSE_IF:
7493 if (OMP_CLAUSE_IF_MODIFIER (c) != ERROR_MARK
7494 && OMP_CLAUSE_IF_MODIFIER (c) != code)
7496 const char *p[2];
7497 for (int i = 0; i < 2; i++)
7498 switch (i ? OMP_CLAUSE_IF_MODIFIER (c) : code)
7500 case OMP_PARALLEL: p[i] = "parallel"; break;
7501 case OMP_TASK: p[i] = "task"; break;
7502 case OMP_TASKLOOP: p[i] = "taskloop"; break;
7503 case OMP_TARGET_DATA: p[i] = "target data"; break;
7504 case OMP_TARGET: p[i] = "target"; break;
7505 case OMP_TARGET_UPDATE: p[i] = "target update"; break;
7506 case OMP_TARGET_ENTER_DATA:
7507 p[i] = "target enter data"; break;
7508 case OMP_TARGET_EXIT_DATA: p[i] = "target exit data"; break;
7509 default: gcc_unreachable ();
7511 error_at (OMP_CLAUSE_LOCATION (c),
7512 "expected %qs %<if%> clause modifier rather than %qs",
7513 p[0], p[1]);
7514 remove = true;
7516 /* Fall through. */
7518 case OMP_CLAUSE_FINAL:
7519 OMP_CLAUSE_OPERAND (c, 0)
7520 = gimple_boolify (OMP_CLAUSE_OPERAND (c, 0));
7521 /* Fall through. */
7523 case OMP_CLAUSE_SCHEDULE:
7524 case OMP_CLAUSE_NUM_THREADS:
7525 case OMP_CLAUSE_NUM_TEAMS:
7526 case OMP_CLAUSE_THREAD_LIMIT:
7527 case OMP_CLAUSE_DIST_SCHEDULE:
7528 case OMP_CLAUSE_DEVICE:
7529 case OMP_CLAUSE_PRIORITY:
7530 case OMP_CLAUSE_GRAINSIZE:
7531 case OMP_CLAUSE_NUM_TASKS:
7532 case OMP_CLAUSE_HINT:
7533 case OMP_CLAUSE__CILK_FOR_COUNT_:
7534 case OMP_CLAUSE_ASYNC:
7535 case OMP_CLAUSE_WAIT:
7536 case OMP_CLAUSE_NUM_GANGS:
7537 case OMP_CLAUSE_NUM_WORKERS:
7538 case OMP_CLAUSE_VECTOR_LENGTH:
7539 case OMP_CLAUSE_WORKER:
7540 case OMP_CLAUSE_VECTOR:
7541 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c, 0), pre_p, NULL,
7542 is_gimple_val, fb_rvalue) == GS_ERROR)
7543 remove = true;
7544 break;
7546 case OMP_CLAUSE_GANG:
7547 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c, 0), pre_p, NULL,
7548 is_gimple_val, fb_rvalue) == GS_ERROR)
7549 remove = true;
7550 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c, 1), pre_p, NULL,
7551 is_gimple_val, fb_rvalue) == GS_ERROR)
7552 remove = true;
7553 break;
7555 case OMP_CLAUSE_TILE:
7556 for (tree list = OMP_CLAUSE_TILE_LIST (c); !remove && list;
7557 list = TREE_CHAIN (list))
7559 if (gimplify_expr (&TREE_VALUE (list), pre_p, NULL,
7560 is_gimple_val, fb_rvalue) == GS_ERROR)
7561 remove = true;
7563 break;
7565 case OMP_CLAUSE_DEVICE_RESIDENT:
7566 remove = true;
7567 break;
7569 case OMP_CLAUSE_NOWAIT:
7570 case OMP_CLAUSE_ORDERED:
7571 case OMP_CLAUSE_UNTIED:
7572 case OMP_CLAUSE_COLLAPSE:
7573 case OMP_CLAUSE_AUTO:
7574 case OMP_CLAUSE_SEQ:
7575 case OMP_CLAUSE_INDEPENDENT:
7576 case OMP_CLAUSE_MERGEABLE:
7577 case OMP_CLAUSE_PROC_BIND:
7578 case OMP_CLAUSE_SAFELEN:
7579 case OMP_CLAUSE_SIMDLEN:
7580 case OMP_CLAUSE_NOGROUP:
7581 case OMP_CLAUSE_THREADS:
7582 case OMP_CLAUSE_SIMD:
7583 break;
7585 case OMP_CLAUSE_DEFAULTMAP:
7586 ctx->target_map_scalars_firstprivate = false;
7587 break;
7589 case OMP_CLAUSE_ALIGNED:
7590 decl = OMP_CLAUSE_DECL (c);
7591 if (error_operand_p (decl))
7593 remove = true;
7594 break;
7596 if (gimplify_expr (&OMP_CLAUSE_ALIGNED_ALIGNMENT (c), pre_p, NULL,
7597 is_gimple_val, fb_rvalue) == GS_ERROR)
7599 remove = true;
7600 break;
7602 if (!is_global_var (decl)
7603 && TREE_CODE (TREE_TYPE (decl)) == POINTER_TYPE)
7604 omp_add_variable (ctx, decl, GOVD_ALIGNED);
7605 break;
7607 case OMP_CLAUSE_DEFAULT:
7608 ctx->default_kind = OMP_CLAUSE_DEFAULT_KIND (c);
7609 break;
7611 default:
7612 gcc_unreachable ();
7615 if (remove)
7616 *list_p = OMP_CLAUSE_CHAIN (c);
7617 else
7618 list_p = &OMP_CLAUSE_CHAIN (c);
7621 gimplify_omp_ctxp = ctx;
7622 if (struct_map_to_clause)
7623 delete struct_map_to_clause;
7626 /* Return true if DECL is a candidate for shared to firstprivate
7627 optimization. We only consider non-addressable scalars, not
7628 too big, and not references. */
7630 static bool
7631 omp_shared_to_firstprivate_optimizable_decl_p (tree decl)
7633 if (TREE_ADDRESSABLE (decl))
7634 return false;
7635 tree type = TREE_TYPE (decl);
7636 if (!is_gimple_reg_type (type)
7637 || TREE_CODE (type) == REFERENCE_TYPE
7638 || TREE_ADDRESSABLE (type))
7639 return false;
7640 /* Don't optimize too large decls, as each thread/task will have
7641 its own. */
7642 HOST_WIDE_INT len = int_size_in_bytes (type);
7643 if (len == -1 || len > 4 * POINTER_SIZE / BITS_PER_UNIT)
7644 return false;
7645 if (lang_hooks.decls.omp_privatize_by_reference (decl))
7646 return false;
7647 return true;
7650 /* Helper function of omp_find_stores_op and gimplify_adjust_omp_clauses*.
7651 For omp_shared_to_firstprivate_optimizable_decl_p decl mark it as
7652 GOVD_WRITTEN in outer contexts. */
7654 static void
7655 omp_mark_stores (struct gimplify_omp_ctx *ctx, tree decl)
7657 for (; ctx; ctx = ctx->outer_context)
7659 splay_tree_node n = splay_tree_lookup (ctx->variables,
7660 (splay_tree_key) decl);
7661 if (n == NULL)
7662 continue;
7663 else if (n->value & GOVD_SHARED)
7665 n->value |= GOVD_WRITTEN;
7666 return;
7668 else if (n->value & GOVD_DATA_SHARE_CLASS)
7669 return;
7673 /* Helper callback for walk_gimple_seq to discover possible stores
7674 to omp_shared_to_firstprivate_optimizable_decl_p decls and set
7675 GOVD_WRITTEN if they are GOVD_SHARED in some outer context
7676 for those. */
7678 static tree
7679 omp_find_stores_op (tree *tp, int *walk_subtrees, void *data)
7681 struct walk_stmt_info *wi = (struct walk_stmt_info *) data;
7683 *walk_subtrees = 0;
7684 if (!wi->is_lhs)
7685 return NULL_TREE;
7687 tree op = *tp;
7690 if (handled_component_p (op))
7691 op = TREE_OPERAND (op, 0);
7692 else if ((TREE_CODE (op) == MEM_REF || TREE_CODE (op) == TARGET_MEM_REF)
7693 && TREE_CODE (TREE_OPERAND (op, 0)) == ADDR_EXPR)
7694 op = TREE_OPERAND (TREE_OPERAND (op, 0), 0);
7695 else
7696 break;
7698 while (1);
7699 if (!DECL_P (op) || !omp_shared_to_firstprivate_optimizable_decl_p (op))
7700 return NULL_TREE;
7702 omp_mark_stores (gimplify_omp_ctxp, op);
7703 return NULL_TREE;
7706 /* Helper callback for walk_gimple_seq to discover possible stores
7707 to omp_shared_to_firstprivate_optimizable_decl_p decls and set
7708 GOVD_WRITTEN if they are GOVD_SHARED in some outer context
7709 for those. */
7711 static tree
7712 omp_find_stores_stmt (gimple_stmt_iterator *gsi_p,
7713 bool *handled_ops_p,
7714 struct walk_stmt_info *wi)
7716 gimple *stmt = gsi_stmt (*gsi_p);
7717 switch (gimple_code (stmt))
7719 /* Don't recurse on OpenMP constructs for which
7720 gimplify_adjust_omp_clauses already handled the bodies,
7721 except handle gimple_omp_for_pre_body. */
7722 case GIMPLE_OMP_FOR:
7723 *handled_ops_p = true;
7724 if (gimple_omp_for_pre_body (stmt))
7725 walk_gimple_seq (gimple_omp_for_pre_body (stmt),
7726 omp_find_stores_stmt, omp_find_stores_op, wi);
7727 break;
7728 case GIMPLE_OMP_PARALLEL:
7729 case GIMPLE_OMP_TASK:
7730 case GIMPLE_OMP_SECTIONS:
7731 case GIMPLE_OMP_SINGLE:
7732 case GIMPLE_OMP_TARGET:
7733 case GIMPLE_OMP_TEAMS:
7734 case GIMPLE_OMP_CRITICAL:
7735 *handled_ops_p = true;
7736 break;
7737 default:
7738 break;
7740 return NULL_TREE;
7743 struct gimplify_adjust_omp_clauses_data
7745 tree *list_p;
7746 gimple_seq *pre_p;
7749 /* For all variables that were not actually used within the context,
7750 remove PRIVATE, SHARED, and FIRSTPRIVATE clauses. */
7752 static int
7753 gimplify_adjust_omp_clauses_1 (splay_tree_node n, void *data)
7755 tree *list_p = ((struct gimplify_adjust_omp_clauses_data *) data)->list_p;
7756 gimple_seq *pre_p
7757 = ((struct gimplify_adjust_omp_clauses_data *) data)->pre_p;
7758 tree decl = (tree) n->key;
7759 unsigned flags = n->value;
7760 enum omp_clause_code code;
7761 tree clause;
7762 bool private_debug;
7764 if (flags & (GOVD_EXPLICIT | GOVD_LOCAL))
7765 return 0;
7766 if ((flags & GOVD_SEEN) == 0)
7767 return 0;
7768 if (flags & GOVD_DEBUG_PRIVATE)
7770 gcc_assert ((flags & GOVD_DATA_SHARE_CLASS) == GOVD_PRIVATE);
7771 private_debug = true;
7773 else if (flags & GOVD_MAP)
7774 private_debug = false;
7775 else
7776 private_debug
7777 = lang_hooks.decls.omp_private_debug_clause (decl,
7778 !!(flags & GOVD_SHARED));
7779 if (private_debug)
7780 code = OMP_CLAUSE_PRIVATE;
7781 else if (flags & GOVD_MAP)
7782 code = OMP_CLAUSE_MAP;
7783 else if (flags & GOVD_SHARED)
7785 if (is_global_var (decl))
7787 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp->outer_context;
7788 while (ctx != NULL)
7790 splay_tree_node on
7791 = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
7792 if (on && (on->value & (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE
7793 | GOVD_PRIVATE | GOVD_REDUCTION
7794 | GOVD_LINEAR | GOVD_MAP)) != 0)
7795 break;
7796 ctx = ctx->outer_context;
7798 if (ctx == NULL)
7799 return 0;
7801 code = OMP_CLAUSE_SHARED;
7803 else if (flags & GOVD_PRIVATE)
7804 code = OMP_CLAUSE_PRIVATE;
7805 else if (flags & GOVD_FIRSTPRIVATE)
7806 code = OMP_CLAUSE_FIRSTPRIVATE;
7807 else if (flags & GOVD_LASTPRIVATE)
7808 code = OMP_CLAUSE_LASTPRIVATE;
7809 else if (flags & GOVD_ALIGNED)
7810 return 0;
7811 else
7812 gcc_unreachable ();
7814 if (((flags & GOVD_LASTPRIVATE)
7815 || (code == OMP_CLAUSE_SHARED && (flags & GOVD_WRITTEN)))
7816 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
7817 omp_mark_stores (gimplify_omp_ctxp->outer_context, decl);
7819 tree chain = *list_p;
7820 clause = build_omp_clause (input_location, code);
7821 OMP_CLAUSE_DECL (clause) = decl;
7822 OMP_CLAUSE_CHAIN (clause) = chain;
7823 if (private_debug)
7824 OMP_CLAUSE_PRIVATE_DEBUG (clause) = 1;
7825 else if (code == OMP_CLAUSE_PRIVATE && (flags & GOVD_PRIVATE_OUTER_REF))
7826 OMP_CLAUSE_PRIVATE_OUTER_REF (clause) = 1;
7827 else if (code == OMP_CLAUSE_SHARED
7828 && (flags & GOVD_WRITTEN) == 0
7829 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
7830 OMP_CLAUSE_SHARED_READONLY (clause) = 1;
7831 else if (code == OMP_CLAUSE_FIRSTPRIVATE && (flags & GOVD_EXPLICIT) == 0)
7832 OMP_CLAUSE_FIRSTPRIVATE_IMPLICIT (clause) = 1;
7833 else if (code == OMP_CLAUSE_MAP && (flags & GOVD_MAP_0LEN_ARRAY) != 0)
7835 tree nc = build_omp_clause (input_location, OMP_CLAUSE_MAP);
7836 OMP_CLAUSE_DECL (nc) = decl;
7837 if (TREE_CODE (TREE_TYPE (decl)) == REFERENCE_TYPE
7838 && TREE_CODE (TREE_TYPE (TREE_TYPE (decl))) == POINTER_TYPE)
7839 OMP_CLAUSE_DECL (clause)
7840 = build_simple_mem_ref_loc (input_location, decl);
7841 OMP_CLAUSE_DECL (clause)
7842 = build2 (MEM_REF, char_type_node, OMP_CLAUSE_DECL (clause),
7843 build_int_cst (build_pointer_type (char_type_node), 0));
7844 OMP_CLAUSE_SIZE (clause) = size_zero_node;
7845 OMP_CLAUSE_SIZE (nc) = size_zero_node;
7846 OMP_CLAUSE_SET_MAP_KIND (clause, GOMP_MAP_ALLOC);
7847 OMP_CLAUSE_MAP_MAYBE_ZERO_LENGTH_ARRAY_SECTION (clause) = 1;
7848 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_FIRSTPRIVATE_POINTER);
7849 OMP_CLAUSE_CHAIN (nc) = chain;
7850 OMP_CLAUSE_CHAIN (clause) = nc;
7851 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
7852 gimplify_omp_ctxp = ctx->outer_context;
7853 gimplify_expr (&TREE_OPERAND (OMP_CLAUSE_DECL (clause), 0),
7854 pre_p, NULL, is_gimple_val, fb_rvalue);
7855 gimplify_omp_ctxp = ctx;
7857 else if (code == OMP_CLAUSE_MAP)
7859 int kind = (flags & GOVD_MAP_TO_ONLY
7860 ? GOMP_MAP_TO
7861 : GOMP_MAP_TOFROM);
7862 if (flags & GOVD_MAP_FORCE)
7863 kind |= GOMP_MAP_FLAG_FORCE;
7864 OMP_CLAUSE_SET_MAP_KIND (clause, kind);
7865 if (DECL_SIZE (decl)
7866 && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
7868 tree decl2 = DECL_VALUE_EXPR (decl);
7869 gcc_assert (TREE_CODE (decl2) == INDIRECT_REF);
7870 decl2 = TREE_OPERAND (decl2, 0);
7871 gcc_assert (DECL_P (decl2));
7872 tree mem = build_simple_mem_ref (decl2);
7873 OMP_CLAUSE_DECL (clause) = mem;
7874 OMP_CLAUSE_SIZE (clause) = TYPE_SIZE_UNIT (TREE_TYPE (decl));
7875 if (gimplify_omp_ctxp->outer_context)
7877 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp->outer_context;
7878 omp_notice_variable (ctx, decl2, true);
7879 omp_notice_variable (ctx, OMP_CLAUSE_SIZE (clause), true);
7881 tree nc = build_omp_clause (OMP_CLAUSE_LOCATION (clause),
7882 OMP_CLAUSE_MAP);
7883 OMP_CLAUSE_DECL (nc) = decl;
7884 OMP_CLAUSE_SIZE (nc) = size_zero_node;
7885 if (gimplify_omp_ctxp->target_firstprivatize_array_bases)
7886 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_FIRSTPRIVATE_POINTER);
7887 else
7888 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_POINTER);
7889 OMP_CLAUSE_CHAIN (nc) = OMP_CLAUSE_CHAIN (clause);
7890 OMP_CLAUSE_CHAIN (clause) = nc;
7892 else if (gimplify_omp_ctxp->target_firstprivatize_array_bases
7893 && lang_hooks.decls.omp_privatize_by_reference (decl))
7895 OMP_CLAUSE_DECL (clause) = build_simple_mem_ref (decl);
7896 OMP_CLAUSE_SIZE (clause)
7897 = unshare_expr (TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl))));
7898 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
7899 gimplify_omp_ctxp = ctx->outer_context;
7900 gimplify_expr (&OMP_CLAUSE_SIZE (clause),
7901 pre_p, NULL, is_gimple_val, fb_rvalue);
7902 gimplify_omp_ctxp = ctx;
7903 tree nc = build_omp_clause (OMP_CLAUSE_LOCATION (clause),
7904 OMP_CLAUSE_MAP);
7905 OMP_CLAUSE_DECL (nc) = decl;
7906 OMP_CLAUSE_SIZE (nc) = size_zero_node;
7907 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_FIRSTPRIVATE_REFERENCE);
7908 OMP_CLAUSE_CHAIN (nc) = OMP_CLAUSE_CHAIN (clause);
7909 OMP_CLAUSE_CHAIN (clause) = nc;
7911 else
7912 OMP_CLAUSE_SIZE (clause) = DECL_SIZE_UNIT (decl);
7914 if (code == OMP_CLAUSE_FIRSTPRIVATE && (flags & GOVD_LASTPRIVATE) != 0)
7916 tree nc = build_omp_clause (input_location, OMP_CLAUSE_LASTPRIVATE);
7917 OMP_CLAUSE_DECL (nc) = decl;
7918 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (nc) = 1;
7919 OMP_CLAUSE_CHAIN (nc) = chain;
7920 OMP_CLAUSE_CHAIN (clause) = nc;
7921 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
7922 gimplify_omp_ctxp = ctx->outer_context;
7923 lang_hooks.decls.omp_finish_clause (nc, pre_p);
7924 gimplify_omp_ctxp = ctx;
7926 *list_p = clause;
7927 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
7928 gimplify_omp_ctxp = ctx->outer_context;
7929 lang_hooks.decls.omp_finish_clause (clause, pre_p);
7930 if (gimplify_omp_ctxp)
7931 for (; clause != chain; clause = OMP_CLAUSE_CHAIN (clause))
7932 if (OMP_CLAUSE_CODE (clause) == OMP_CLAUSE_MAP
7933 && DECL_P (OMP_CLAUSE_SIZE (clause)))
7934 omp_notice_variable (gimplify_omp_ctxp, OMP_CLAUSE_SIZE (clause),
7935 true);
7936 gimplify_omp_ctxp = ctx;
7937 return 0;
7940 static void
7941 gimplify_adjust_omp_clauses (gimple_seq *pre_p, gimple_seq body, tree *list_p,
7942 enum tree_code code)
7944 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
7945 tree c, decl;
7947 if (body)
7949 struct gimplify_omp_ctx *octx;
7950 for (octx = ctx; octx; octx = octx->outer_context)
7951 if ((octx->region_type & (ORT_PARALLEL | ORT_TASK | ORT_TEAMS)) != 0)
7952 break;
7953 if (octx)
7955 struct walk_stmt_info wi;
7956 memset (&wi, 0, sizeof (wi));
7957 walk_gimple_seq (body, omp_find_stores_stmt,
7958 omp_find_stores_op, &wi);
7961 while ((c = *list_p) != NULL)
7963 splay_tree_node n;
7964 bool remove = false;
7966 switch (OMP_CLAUSE_CODE (c))
7968 case OMP_CLAUSE_PRIVATE:
7969 case OMP_CLAUSE_SHARED:
7970 case OMP_CLAUSE_FIRSTPRIVATE:
7971 case OMP_CLAUSE_LINEAR:
7972 decl = OMP_CLAUSE_DECL (c);
7973 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
7974 remove = !(n->value & GOVD_SEEN);
7975 if (! remove)
7977 bool shared = OMP_CLAUSE_CODE (c) == OMP_CLAUSE_SHARED;
7978 if ((n->value & GOVD_DEBUG_PRIVATE)
7979 || lang_hooks.decls.omp_private_debug_clause (decl, shared))
7981 gcc_assert ((n->value & GOVD_DEBUG_PRIVATE) == 0
7982 || ((n->value & GOVD_DATA_SHARE_CLASS)
7983 == GOVD_PRIVATE));
7984 OMP_CLAUSE_SET_CODE (c, OMP_CLAUSE_PRIVATE);
7985 OMP_CLAUSE_PRIVATE_DEBUG (c) = 1;
7987 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_SHARED
7988 && (n->value & GOVD_WRITTEN) == 0
7989 && DECL_P (decl)
7990 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
7991 OMP_CLAUSE_SHARED_READONLY (c) = 1;
7992 else if (DECL_P (decl)
7993 && ((OMP_CLAUSE_CODE (c) == OMP_CLAUSE_SHARED
7994 && (n->value & GOVD_WRITTEN) != 1)
7995 || (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
7996 && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c)))
7997 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
7998 omp_mark_stores (gimplify_omp_ctxp->outer_context, decl);
8000 break;
8002 case OMP_CLAUSE_LASTPRIVATE:
8003 /* Make sure OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE is set to
8004 accurately reflect the presence of a FIRSTPRIVATE clause. */
8005 decl = OMP_CLAUSE_DECL (c);
8006 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
8007 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c)
8008 = (n->value & GOVD_FIRSTPRIVATE) != 0;
8009 if (omp_no_lastprivate (ctx))
8011 if (OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c))
8012 remove = true;
8013 else
8014 OMP_CLAUSE_CODE (c) = OMP_CLAUSE_PRIVATE;
8016 else if (code == OMP_DISTRIBUTE
8017 && OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c))
8019 remove = true;
8020 error_at (OMP_CLAUSE_LOCATION (c),
8021 "same variable used in %<firstprivate%> and "
8022 "%<lastprivate%> clauses on %<distribute%> "
8023 "construct");
8025 if (!remove
8026 && OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE
8027 && DECL_P (decl)
8028 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
8029 omp_mark_stores (gimplify_omp_ctxp->outer_context, decl);
8030 break;
8032 case OMP_CLAUSE_ALIGNED:
8033 decl = OMP_CLAUSE_DECL (c);
8034 if (!is_global_var (decl))
8036 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
8037 remove = n == NULL || !(n->value & GOVD_SEEN);
8038 if (!remove && TREE_CODE (TREE_TYPE (decl)) == POINTER_TYPE)
8040 struct gimplify_omp_ctx *octx;
8041 if (n != NULL
8042 && (n->value & (GOVD_DATA_SHARE_CLASS
8043 & ~GOVD_FIRSTPRIVATE)))
8044 remove = true;
8045 else
8046 for (octx = ctx->outer_context; octx;
8047 octx = octx->outer_context)
8049 n = splay_tree_lookup (octx->variables,
8050 (splay_tree_key) decl);
8051 if (n == NULL)
8052 continue;
8053 if (n->value & GOVD_LOCAL)
8054 break;
8055 /* We have to avoid assigning a shared variable
8056 to itself when trying to add
8057 __builtin_assume_aligned. */
8058 if (n->value & GOVD_SHARED)
8060 remove = true;
8061 break;
8066 else if (TREE_CODE (TREE_TYPE (decl)) == ARRAY_TYPE)
8068 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
8069 if (n != NULL && (n->value & GOVD_DATA_SHARE_CLASS) != 0)
8070 remove = true;
8072 break;
8074 case OMP_CLAUSE_MAP:
8075 if (code == OMP_TARGET_EXIT_DATA
8076 && OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_ALWAYS_POINTER)
8078 remove = true;
8079 break;
8081 decl = OMP_CLAUSE_DECL (c);
8082 /* Data clasues associated with acc parallel reductions must be
8083 compatible with present_or_copy. Warn and adjust the clause
8084 if that is not the case. */
8085 if (ctx->region_type == ORT_ACC_PARALLEL)
8087 tree t = DECL_P (decl) ? decl : TREE_OPERAND (decl, 0);
8088 n = NULL;
8090 if (DECL_P (t))
8091 n = splay_tree_lookup (ctx->variables, (splay_tree_key) t);
8093 if (n && (n->value & GOVD_REDUCTION))
8095 enum gomp_map_kind kind = OMP_CLAUSE_MAP_KIND (c);
8097 OMP_CLAUSE_MAP_IN_REDUCTION (c) = 1;
8098 if ((kind & GOMP_MAP_TOFROM) != GOMP_MAP_TOFROM
8099 && kind != GOMP_MAP_FORCE_PRESENT
8100 && kind != GOMP_MAP_POINTER)
8102 warning_at (OMP_CLAUSE_LOCATION (c), 0,
8103 "incompatible data clause with reduction "
8104 "on %qE; promoting to present_or_copy",
8105 DECL_NAME (t));
8106 OMP_CLAUSE_SET_MAP_KIND (c, GOMP_MAP_TOFROM);
8110 if (!DECL_P (decl))
8112 if ((ctx->region_type & ORT_TARGET) != 0
8113 && OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_FIRSTPRIVATE_POINTER)
8115 if (TREE_CODE (decl) == INDIRECT_REF
8116 && TREE_CODE (TREE_OPERAND (decl, 0)) == COMPONENT_REF
8117 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (decl, 0)))
8118 == REFERENCE_TYPE))
8119 decl = TREE_OPERAND (decl, 0);
8120 if (TREE_CODE (decl) == COMPONENT_REF)
8122 while (TREE_CODE (decl) == COMPONENT_REF)
8123 decl = TREE_OPERAND (decl, 0);
8124 if (DECL_P (decl))
8126 n = splay_tree_lookup (ctx->variables,
8127 (splay_tree_key) decl);
8128 if (!(n->value & GOVD_SEEN))
8129 remove = true;
8133 break;
8135 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
8136 if ((ctx->region_type & ORT_TARGET) != 0
8137 && !(n->value & GOVD_SEEN)
8138 && GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c)) == 0
8139 && !lookup_attribute ("omp declare target link",
8140 DECL_ATTRIBUTES (decl)))
8142 remove = true;
8143 /* For struct element mapping, if struct is never referenced
8144 in target block and none of the mapping has always modifier,
8145 remove all the struct element mappings, which immediately
8146 follow the GOMP_MAP_STRUCT map clause. */
8147 if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_STRUCT)
8149 HOST_WIDE_INT cnt = tree_to_shwi (OMP_CLAUSE_SIZE (c));
8150 while (cnt--)
8151 OMP_CLAUSE_CHAIN (c)
8152 = OMP_CLAUSE_CHAIN (OMP_CLAUSE_CHAIN (c));
8155 else if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_STRUCT
8156 && code == OMP_TARGET_EXIT_DATA)
8157 remove = true;
8158 else if (DECL_SIZE (decl)
8159 && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST
8160 && OMP_CLAUSE_MAP_KIND (c) != GOMP_MAP_POINTER
8161 && OMP_CLAUSE_MAP_KIND (c) != GOMP_MAP_FIRSTPRIVATE_POINTER
8162 && (OMP_CLAUSE_MAP_KIND (c)
8163 != GOMP_MAP_FIRSTPRIVATE_REFERENCE))
8165 /* For GOMP_MAP_FORCE_DEVICEPTR, we'll never enter here, because
8166 for these, TREE_CODE (DECL_SIZE (decl)) will always be
8167 INTEGER_CST. */
8168 gcc_assert (OMP_CLAUSE_MAP_KIND (c) != GOMP_MAP_FORCE_DEVICEPTR);
8170 tree decl2 = DECL_VALUE_EXPR (decl);
8171 gcc_assert (TREE_CODE (decl2) == INDIRECT_REF);
8172 decl2 = TREE_OPERAND (decl2, 0);
8173 gcc_assert (DECL_P (decl2));
8174 tree mem = build_simple_mem_ref (decl2);
8175 OMP_CLAUSE_DECL (c) = mem;
8176 OMP_CLAUSE_SIZE (c) = TYPE_SIZE_UNIT (TREE_TYPE (decl));
8177 if (ctx->outer_context)
8179 omp_notice_variable (ctx->outer_context, decl2, true);
8180 omp_notice_variable (ctx->outer_context,
8181 OMP_CLAUSE_SIZE (c), true);
8183 if (((ctx->region_type & ORT_TARGET) != 0
8184 || !ctx->target_firstprivatize_array_bases)
8185 && ((n->value & GOVD_SEEN) == 0
8186 || (n->value & (GOVD_PRIVATE | GOVD_FIRSTPRIVATE)) == 0))
8188 tree nc = build_omp_clause (OMP_CLAUSE_LOCATION (c),
8189 OMP_CLAUSE_MAP);
8190 OMP_CLAUSE_DECL (nc) = decl;
8191 OMP_CLAUSE_SIZE (nc) = size_zero_node;
8192 if (ctx->target_firstprivatize_array_bases)
8193 OMP_CLAUSE_SET_MAP_KIND (nc,
8194 GOMP_MAP_FIRSTPRIVATE_POINTER);
8195 else
8196 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_POINTER);
8197 OMP_CLAUSE_CHAIN (nc) = OMP_CLAUSE_CHAIN (c);
8198 OMP_CLAUSE_CHAIN (c) = nc;
8199 c = nc;
8202 else
8204 if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
8205 OMP_CLAUSE_SIZE (c) = DECL_SIZE_UNIT (decl);
8206 gcc_assert ((n->value & GOVD_SEEN) == 0
8207 || ((n->value & (GOVD_PRIVATE | GOVD_FIRSTPRIVATE))
8208 == 0));
8210 break;
8212 case OMP_CLAUSE_TO:
8213 case OMP_CLAUSE_FROM:
8214 case OMP_CLAUSE__CACHE_:
8215 decl = OMP_CLAUSE_DECL (c);
8216 if (!DECL_P (decl))
8217 break;
8218 if (DECL_SIZE (decl)
8219 && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
8221 tree decl2 = DECL_VALUE_EXPR (decl);
8222 gcc_assert (TREE_CODE (decl2) == INDIRECT_REF);
8223 decl2 = TREE_OPERAND (decl2, 0);
8224 gcc_assert (DECL_P (decl2));
8225 tree mem = build_simple_mem_ref (decl2);
8226 OMP_CLAUSE_DECL (c) = mem;
8227 OMP_CLAUSE_SIZE (c) = TYPE_SIZE_UNIT (TREE_TYPE (decl));
8228 if (ctx->outer_context)
8230 omp_notice_variable (ctx->outer_context, decl2, true);
8231 omp_notice_variable (ctx->outer_context,
8232 OMP_CLAUSE_SIZE (c), true);
8235 else if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
8236 OMP_CLAUSE_SIZE (c) = DECL_SIZE_UNIT (decl);
8237 break;
8239 case OMP_CLAUSE_REDUCTION:
8240 decl = OMP_CLAUSE_DECL (c);
8241 /* OpenACC reductions need a present_or_copy data clause.
8242 Add one if necessary. Error is the reduction is private. */
8243 if (ctx->region_type == ORT_ACC_PARALLEL)
8245 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
8246 if (n->value & (GOVD_PRIVATE | GOVD_FIRSTPRIVATE))
8247 error_at (OMP_CLAUSE_LOCATION (c), "invalid private "
8248 "reduction on %qE", DECL_NAME (decl));
8249 else if ((n->value & GOVD_MAP) == 0)
8251 tree next = OMP_CLAUSE_CHAIN (c);
8252 tree nc = build_omp_clause (UNKNOWN_LOCATION, OMP_CLAUSE_MAP);
8253 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_TOFROM);
8254 OMP_CLAUSE_DECL (nc) = decl;
8255 OMP_CLAUSE_CHAIN (c) = nc;
8256 lang_hooks.decls.omp_finish_clause (nc, pre_p);
8257 while (1)
8259 OMP_CLAUSE_MAP_IN_REDUCTION (nc) = 1;
8260 if (OMP_CLAUSE_CHAIN (nc) == NULL)
8261 break;
8262 nc = OMP_CLAUSE_CHAIN (nc);
8264 OMP_CLAUSE_CHAIN (nc) = next;
8265 n->value |= GOVD_MAP;
8268 if (DECL_P (decl)
8269 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
8270 omp_mark_stores (gimplify_omp_ctxp->outer_context, decl);
8271 break;
8272 case OMP_CLAUSE_COPYIN:
8273 case OMP_CLAUSE_COPYPRIVATE:
8274 case OMP_CLAUSE_IF:
8275 case OMP_CLAUSE_NUM_THREADS:
8276 case OMP_CLAUSE_NUM_TEAMS:
8277 case OMP_CLAUSE_THREAD_LIMIT:
8278 case OMP_CLAUSE_DIST_SCHEDULE:
8279 case OMP_CLAUSE_DEVICE:
8280 case OMP_CLAUSE_SCHEDULE:
8281 case OMP_CLAUSE_NOWAIT:
8282 case OMP_CLAUSE_ORDERED:
8283 case OMP_CLAUSE_DEFAULT:
8284 case OMP_CLAUSE_UNTIED:
8285 case OMP_CLAUSE_COLLAPSE:
8286 case OMP_CLAUSE_FINAL:
8287 case OMP_CLAUSE_MERGEABLE:
8288 case OMP_CLAUSE_PROC_BIND:
8289 case OMP_CLAUSE_SAFELEN:
8290 case OMP_CLAUSE_SIMDLEN:
8291 case OMP_CLAUSE_DEPEND:
8292 case OMP_CLAUSE_PRIORITY:
8293 case OMP_CLAUSE_GRAINSIZE:
8294 case OMP_CLAUSE_NUM_TASKS:
8295 case OMP_CLAUSE_NOGROUP:
8296 case OMP_CLAUSE_THREADS:
8297 case OMP_CLAUSE_SIMD:
8298 case OMP_CLAUSE_HINT:
8299 case OMP_CLAUSE_DEFAULTMAP:
8300 case OMP_CLAUSE_USE_DEVICE_PTR:
8301 case OMP_CLAUSE_IS_DEVICE_PTR:
8302 case OMP_CLAUSE__CILK_FOR_COUNT_:
8303 case OMP_CLAUSE_ASYNC:
8304 case OMP_CLAUSE_WAIT:
8305 case OMP_CLAUSE_DEVICE_RESIDENT:
8306 case OMP_CLAUSE_INDEPENDENT:
8307 case OMP_CLAUSE_NUM_GANGS:
8308 case OMP_CLAUSE_NUM_WORKERS:
8309 case OMP_CLAUSE_VECTOR_LENGTH:
8310 case OMP_CLAUSE_GANG:
8311 case OMP_CLAUSE_WORKER:
8312 case OMP_CLAUSE_VECTOR:
8313 case OMP_CLAUSE_AUTO:
8314 case OMP_CLAUSE_SEQ:
8315 break;
8317 case OMP_CLAUSE_TILE:
8318 /* We're not yet making use of the information provided by OpenACC
8319 tile clauses. Discard these here, to simplify later middle end
8320 processing. */
8321 remove = true;
8322 break;
8324 default:
8325 gcc_unreachable ();
8328 if (remove)
8329 *list_p = OMP_CLAUSE_CHAIN (c);
8330 else
8331 list_p = &OMP_CLAUSE_CHAIN (c);
8334 /* Add in any implicit data sharing. */
8335 struct gimplify_adjust_omp_clauses_data data;
8336 data.list_p = list_p;
8337 data.pre_p = pre_p;
8338 splay_tree_foreach (ctx->variables, gimplify_adjust_omp_clauses_1, &data);
8340 gimplify_omp_ctxp = ctx->outer_context;
8341 delete_omp_context (ctx);
8344 /* Gimplify OACC_CACHE. */
8346 static void
8347 gimplify_oacc_cache (tree *expr_p, gimple_seq *pre_p)
8349 tree expr = *expr_p;
8351 gimplify_scan_omp_clauses (&OACC_CACHE_CLAUSES (expr), pre_p, ORT_ACC,
8352 OACC_CACHE);
8353 gimplify_adjust_omp_clauses (pre_p, NULL, &OACC_CACHE_CLAUSES (expr),
8354 OACC_CACHE);
8356 /* TODO: Do something sensible with this information. */
8358 *expr_p = NULL_TREE;
8361 /* Helper function of gimplify_oacc_declare. The helper's purpose is to,
8362 if required, translate 'kind' in CLAUSE into an 'entry' kind and 'exit'
8363 kind. The entry kind will replace the one in CLAUSE, while the exit
8364 kind will be used in a new omp_clause and returned to the caller. */
8366 static tree
8367 gimplify_oacc_declare_1 (tree clause)
8369 HOST_WIDE_INT kind, new_op;
8370 bool ret = false;
8371 tree c = NULL;
8373 kind = OMP_CLAUSE_MAP_KIND (clause);
8375 switch (kind)
8377 case GOMP_MAP_ALLOC:
8378 case GOMP_MAP_FORCE_ALLOC:
8379 case GOMP_MAP_FORCE_TO:
8380 new_op = GOMP_MAP_DELETE;
8381 ret = true;
8382 break;
8384 case GOMP_MAP_FORCE_FROM:
8385 OMP_CLAUSE_SET_MAP_KIND (clause, GOMP_MAP_FORCE_ALLOC);
8386 new_op = GOMP_MAP_FORCE_FROM;
8387 ret = true;
8388 break;
8390 case GOMP_MAP_FORCE_TOFROM:
8391 OMP_CLAUSE_SET_MAP_KIND (clause, GOMP_MAP_FORCE_TO);
8392 new_op = GOMP_MAP_FORCE_FROM;
8393 ret = true;
8394 break;
8396 case GOMP_MAP_FROM:
8397 OMP_CLAUSE_SET_MAP_KIND (clause, GOMP_MAP_FORCE_ALLOC);
8398 new_op = GOMP_MAP_FROM;
8399 ret = true;
8400 break;
8402 case GOMP_MAP_TOFROM:
8403 OMP_CLAUSE_SET_MAP_KIND (clause, GOMP_MAP_TO);
8404 new_op = GOMP_MAP_FROM;
8405 ret = true;
8406 break;
8408 case GOMP_MAP_DEVICE_RESIDENT:
8409 case GOMP_MAP_FORCE_DEVICEPTR:
8410 case GOMP_MAP_FORCE_PRESENT:
8411 case GOMP_MAP_LINK:
8412 case GOMP_MAP_POINTER:
8413 case GOMP_MAP_TO:
8414 break;
8416 default:
8417 gcc_unreachable ();
8418 break;
8421 if (ret)
8423 c = build_omp_clause (OMP_CLAUSE_LOCATION (clause), OMP_CLAUSE_MAP);
8424 OMP_CLAUSE_SET_MAP_KIND (c, new_op);
8425 OMP_CLAUSE_DECL (c) = OMP_CLAUSE_DECL (clause);
8428 return c;
8431 /* Gimplify OACC_DECLARE. */
8433 static void
8434 gimplify_oacc_declare (tree *expr_p, gimple_seq *pre_p)
8436 tree expr = *expr_p;
8437 gomp_target *stmt;
8438 tree clauses, t;
8440 clauses = OACC_DECLARE_CLAUSES (expr);
8442 gimplify_scan_omp_clauses (&clauses, pre_p, ORT_TARGET_DATA, OACC_DECLARE);
8444 for (t = clauses; t; t = OMP_CLAUSE_CHAIN (t))
8446 tree decl = OMP_CLAUSE_DECL (t);
8448 if (TREE_CODE (decl) == MEM_REF)
8449 continue;
8451 if (TREE_CODE (decl) == VAR_DECL
8452 && !is_global_var (decl)
8453 && DECL_CONTEXT (decl) == current_function_decl)
8455 tree c = gimplify_oacc_declare_1 (t);
8456 if (c)
8458 if (oacc_declare_returns == NULL)
8459 oacc_declare_returns = new hash_map<tree, tree>;
8461 oacc_declare_returns->put (decl, c);
8465 omp_add_variable (gimplify_omp_ctxp, decl, GOVD_SEEN);
8468 stmt = gimple_build_omp_target (NULL, GF_OMP_TARGET_KIND_OACC_DECLARE,
8469 clauses);
8471 gimplify_seq_add_stmt (pre_p, stmt);
8473 *expr_p = NULL_TREE;
8476 /* Gimplify the contents of an OMP_PARALLEL statement. This involves
8477 gimplification of the body, as well as scanning the body for used
8478 variables. We need to do this scan now, because variable-sized
8479 decls will be decomposed during gimplification. */
8481 static void
8482 gimplify_omp_parallel (tree *expr_p, gimple_seq *pre_p)
8484 tree expr = *expr_p;
8485 gimple *g;
8486 gimple_seq body = NULL;
8488 gimplify_scan_omp_clauses (&OMP_PARALLEL_CLAUSES (expr), pre_p,
8489 OMP_PARALLEL_COMBINED (expr)
8490 ? ORT_COMBINED_PARALLEL
8491 : ORT_PARALLEL, OMP_PARALLEL);
8493 push_gimplify_context ();
8495 g = gimplify_and_return_first (OMP_PARALLEL_BODY (expr), &body);
8496 if (gimple_code (g) == GIMPLE_BIND)
8497 pop_gimplify_context (g);
8498 else
8499 pop_gimplify_context (NULL);
8501 gimplify_adjust_omp_clauses (pre_p, body, &OMP_PARALLEL_CLAUSES (expr),
8502 OMP_PARALLEL);
8504 g = gimple_build_omp_parallel (body,
8505 OMP_PARALLEL_CLAUSES (expr),
8506 NULL_TREE, NULL_TREE);
8507 if (OMP_PARALLEL_COMBINED (expr))
8508 gimple_omp_set_subcode (g, GF_OMP_PARALLEL_COMBINED);
8509 gimplify_seq_add_stmt (pre_p, g);
8510 *expr_p = NULL_TREE;
8513 /* Gimplify the contents of an OMP_TASK statement. This involves
8514 gimplification of the body, as well as scanning the body for used
8515 variables. We need to do this scan now, because variable-sized
8516 decls will be decomposed during gimplification. */
8518 static void
8519 gimplify_omp_task (tree *expr_p, gimple_seq *pre_p)
8521 tree expr = *expr_p;
8522 gimple *g;
8523 gimple_seq body = NULL;
8525 gimplify_scan_omp_clauses (&OMP_TASK_CLAUSES (expr), pre_p,
8526 find_omp_clause (OMP_TASK_CLAUSES (expr),
8527 OMP_CLAUSE_UNTIED)
8528 ? ORT_UNTIED_TASK : ORT_TASK, OMP_TASK);
8530 push_gimplify_context ();
8532 g = gimplify_and_return_first (OMP_TASK_BODY (expr), &body);
8533 if (gimple_code (g) == GIMPLE_BIND)
8534 pop_gimplify_context (g);
8535 else
8536 pop_gimplify_context (NULL);
8538 gimplify_adjust_omp_clauses (pre_p, body, &OMP_TASK_CLAUSES (expr),
8539 OMP_TASK);
8541 g = gimple_build_omp_task (body,
8542 OMP_TASK_CLAUSES (expr),
8543 NULL_TREE, NULL_TREE,
8544 NULL_TREE, NULL_TREE, NULL_TREE);
8545 gimplify_seq_add_stmt (pre_p, g);
8546 *expr_p = NULL_TREE;
8549 /* Helper function of gimplify_omp_for, find OMP_FOR resp. OMP_SIMD
8550 with non-NULL OMP_FOR_INIT. */
8552 static tree
8553 find_combined_omp_for (tree *tp, int *walk_subtrees, void *)
8555 *walk_subtrees = 0;
8556 switch (TREE_CODE (*tp))
8558 case OMP_FOR:
8559 *walk_subtrees = 1;
8560 /* FALLTHRU */
8561 case OMP_SIMD:
8562 if (OMP_FOR_INIT (*tp) != NULL_TREE)
8563 return *tp;
8564 break;
8565 case BIND_EXPR:
8566 case STATEMENT_LIST:
8567 case OMP_PARALLEL:
8568 *walk_subtrees = 1;
8569 break;
8570 default:
8571 break;
8573 return NULL_TREE;
8576 /* Gimplify the gross structure of an OMP_FOR statement. */
8578 static enum gimplify_status
8579 gimplify_omp_for (tree *expr_p, gimple_seq *pre_p)
8581 tree for_stmt, orig_for_stmt, inner_for_stmt = NULL_TREE, decl, var, t;
8582 enum gimplify_status ret = GS_ALL_DONE;
8583 enum gimplify_status tret;
8584 gomp_for *gfor;
8585 gimple_seq for_body, for_pre_body;
8586 int i;
8587 bitmap has_decl_expr = NULL;
8588 enum omp_region_type ort = ORT_WORKSHARE;
8590 orig_for_stmt = for_stmt = *expr_p;
8592 switch (TREE_CODE (for_stmt))
8594 case OMP_FOR:
8595 case CILK_FOR:
8596 case OMP_DISTRIBUTE:
8597 break;
8598 case OACC_LOOP:
8599 ort = ORT_ACC;
8600 break;
8601 case OMP_TASKLOOP:
8602 if (find_omp_clause (OMP_FOR_CLAUSES (for_stmt), OMP_CLAUSE_UNTIED))
8603 ort = ORT_UNTIED_TASK;
8604 else
8605 ort = ORT_TASK;
8606 break;
8607 case OMP_SIMD:
8608 case CILK_SIMD:
8609 ort = ORT_SIMD;
8610 break;
8611 default:
8612 gcc_unreachable ();
8615 /* Set OMP_CLAUSE_LINEAR_NO_COPYIN flag on explicit linear
8616 clause for the IV. */
8617 if (ort == ORT_SIMD && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) == 1)
8619 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), 0);
8620 gcc_assert (TREE_CODE (t) == MODIFY_EXPR);
8621 decl = TREE_OPERAND (t, 0);
8622 for (tree c = OMP_FOR_CLAUSES (for_stmt); c; c = OMP_CLAUSE_CHAIN (c))
8623 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
8624 && OMP_CLAUSE_DECL (c) == decl)
8626 OMP_CLAUSE_LINEAR_NO_COPYIN (c) = 1;
8627 break;
8631 if (OMP_FOR_INIT (for_stmt) == NULL_TREE)
8633 gcc_assert (TREE_CODE (for_stmt) != OACC_LOOP);
8634 inner_for_stmt = walk_tree (&OMP_FOR_BODY (for_stmt),
8635 find_combined_omp_for, NULL, NULL);
8636 if (inner_for_stmt == NULL_TREE)
8638 gcc_assert (seen_error ());
8639 *expr_p = NULL_TREE;
8640 return GS_ERROR;
8644 if (TREE_CODE (for_stmt) != OMP_TASKLOOP)
8645 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (for_stmt), pre_p, ort,
8646 TREE_CODE (for_stmt));
8648 if (TREE_CODE (for_stmt) == OMP_DISTRIBUTE)
8649 gimplify_omp_ctxp->distribute = true;
8651 /* Handle OMP_FOR_INIT. */
8652 for_pre_body = NULL;
8653 if (ort == ORT_SIMD && OMP_FOR_PRE_BODY (for_stmt))
8655 has_decl_expr = BITMAP_ALLOC (NULL);
8656 if (TREE_CODE (OMP_FOR_PRE_BODY (for_stmt)) == DECL_EXPR
8657 && TREE_CODE (DECL_EXPR_DECL (OMP_FOR_PRE_BODY (for_stmt)))
8658 == VAR_DECL)
8660 t = OMP_FOR_PRE_BODY (for_stmt);
8661 bitmap_set_bit (has_decl_expr, DECL_UID (DECL_EXPR_DECL (t)));
8663 else if (TREE_CODE (OMP_FOR_PRE_BODY (for_stmt)) == STATEMENT_LIST)
8665 tree_stmt_iterator si;
8666 for (si = tsi_start (OMP_FOR_PRE_BODY (for_stmt)); !tsi_end_p (si);
8667 tsi_next (&si))
8669 t = tsi_stmt (si);
8670 if (TREE_CODE (t) == DECL_EXPR
8671 && TREE_CODE (DECL_EXPR_DECL (t)) == VAR_DECL)
8672 bitmap_set_bit (has_decl_expr, DECL_UID (DECL_EXPR_DECL (t)));
8676 if (OMP_FOR_PRE_BODY (for_stmt))
8678 if (TREE_CODE (for_stmt) != OMP_TASKLOOP || gimplify_omp_ctxp)
8679 gimplify_and_add (OMP_FOR_PRE_BODY (for_stmt), &for_pre_body);
8680 else
8682 struct gimplify_omp_ctx ctx;
8683 memset (&ctx, 0, sizeof (ctx));
8684 ctx.region_type = ORT_NONE;
8685 gimplify_omp_ctxp = &ctx;
8686 gimplify_and_add (OMP_FOR_PRE_BODY (for_stmt), &for_pre_body);
8687 gimplify_omp_ctxp = NULL;
8690 OMP_FOR_PRE_BODY (for_stmt) = NULL_TREE;
8692 if (OMP_FOR_INIT (for_stmt) == NULL_TREE)
8693 for_stmt = inner_for_stmt;
8695 /* For taskloop, need to gimplify the start, end and step before the
8696 taskloop, outside of the taskloop omp context. */
8697 if (TREE_CODE (orig_for_stmt) == OMP_TASKLOOP)
8699 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
8701 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
8702 if (!is_gimple_constant (TREE_OPERAND (t, 1)))
8704 TREE_OPERAND (t, 1)
8705 = get_initialized_tmp_var (TREE_OPERAND (t, 1),
8706 pre_p, NULL);
8707 tree c = build_omp_clause (input_location,
8708 OMP_CLAUSE_FIRSTPRIVATE);
8709 OMP_CLAUSE_DECL (c) = TREE_OPERAND (t, 1);
8710 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (orig_for_stmt);
8711 OMP_FOR_CLAUSES (orig_for_stmt) = c;
8714 /* Handle OMP_FOR_COND. */
8715 t = TREE_VEC_ELT (OMP_FOR_COND (for_stmt), i);
8716 if (!is_gimple_constant (TREE_OPERAND (t, 1)))
8718 TREE_OPERAND (t, 1)
8719 = get_initialized_tmp_var (TREE_OPERAND (t, 1),
8720 gimple_seq_empty_p (for_pre_body)
8721 ? pre_p : &for_pre_body, NULL);
8722 tree c = build_omp_clause (input_location,
8723 OMP_CLAUSE_FIRSTPRIVATE);
8724 OMP_CLAUSE_DECL (c) = TREE_OPERAND (t, 1);
8725 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (orig_for_stmt);
8726 OMP_FOR_CLAUSES (orig_for_stmt) = c;
8729 /* Handle OMP_FOR_INCR. */
8730 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
8731 if (TREE_CODE (t) == MODIFY_EXPR)
8733 decl = TREE_OPERAND (t, 0);
8734 t = TREE_OPERAND (t, 1);
8735 tree *tp = &TREE_OPERAND (t, 1);
8736 if (TREE_CODE (t) == PLUS_EXPR && *tp == decl)
8737 tp = &TREE_OPERAND (t, 0);
8739 if (!is_gimple_constant (*tp))
8741 gimple_seq *seq = gimple_seq_empty_p (for_pre_body)
8742 ? pre_p : &for_pre_body;
8743 *tp = get_initialized_tmp_var (*tp, seq, NULL);
8744 tree c = build_omp_clause (input_location,
8745 OMP_CLAUSE_FIRSTPRIVATE);
8746 OMP_CLAUSE_DECL (c) = *tp;
8747 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (orig_for_stmt);
8748 OMP_FOR_CLAUSES (orig_for_stmt) = c;
8753 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (orig_for_stmt), pre_p, ort,
8754 OMP_TASKLOOP);
8757 if (orig_for_stmt != for_stmt)
8758 gimplify_omp_ctxp->combined_loop = true;
8760 for_body = NULL;
8761 gcc_assert (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt))
8762 == TREE_VEC_LENGTH (OMP_FOR_COND (for_stmt)));
8763 gcc_assert (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt))
8764 == TREE_VEC_LENGTH (OMP_FOR_INCR (for_stmt)));
8766 tree c = find_omp_clause (OMP_FOR_CLAUSES (for_stmt), OMP_CLAUSE_ORDERED);
8767 bool is_doacross = false;
8768 if (c && OMP_CLAUSE_ORDERED_EXPR (c))
8770 is_doacross = true;
8771 gimplify_omp_ctxp->loop_iter_var.create (TREE_VEC_LENGTH
8772 (OMP_FOR_INIT (for_stmt))
8773 * 2);
8775 int collapse = 1;
8776 c = find_omp_clause (OMP_FOR_CLAUSES (for_stmt), OMP_CLAUSE_COLLAPSE);
8777 if (c)
8778 collapse = tree_to_shwi (OMP_CLAUSE_COLLAPSE_EXPR (c));
8779 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
8781 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
8782 gcc_assert (TREE_CODE (t) == MODIFY_EXPR);
8783 decl = TREE_OPERAND (t, 0);
8784 gcc_assert (DECL_P (decl));
8785 gcc_assert (INTEGRAL_TYPE_P (TREE_TYPE (decl))
8786 || POINTER_TYPE_P (TREE_TYPE (decl)));
8787 if (is_doacross)
8789 if (TREE_CODE (for_stmt) == OMP_FOR && OMP_FOR_ORIG_DECLS (for_stmt))
8790 gimplify_omp_ctxp->loop_iter_var.quick_push
8791 (TREE_VEC_ELT (OMP_FOR_ORIG_DECLS (for_stmt), i));
8792 else
8793 gimplify_omp_ctxp->loop_iter_var.quick_push (decl);
8794 gimplify_omp_ctxp->loop_iter_var.quick_push (decl);
8797 /* Make sure the iteration variable is private. */
8798 tree c = NULL_TREE;
8799 tree c2 = NULL_TREE;
8800 if (orig_for_stmt != for_stmt)
8801 /* Do this only on innermost construct for combined ones. */;
8802 else if (ort == ORT_SIMD)
8804 splay_tree_node n = splay_tree_lookup (gimplify_omp_ctxp->variables,
8805 (splay_tree_key) decl);
8806 omp_is_private (gimplify_omp_ctxp, decl,
8807 1 + (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt))
8808 != 1));
8809 if (n != NULL && (n->value & GOVD_DATA_SHARE_CLASS) != 0)
8810 omp_notice_variable (gimplify_omp_ctxp, decl, true);
8811 else if (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) == 1)
8813 c = build_omp_clause (input_location, OMP_CLAUSE_LINEAR);
8814 OMP_CLAUSE_LINEAR_NO_COPYIN (c) = 1;
8815 unsigned int flags = GOVD_LINEAR | GOVD_EXPLICIT | GOVD_SEEN;
8816 if ((has_decl_expr
8817 && bitmap_bit_p (has_decl_expr, DECL_UID (decl)))
8818 || omp_no_lastprivate (gimplify_omp_ctxp))
8820 OMP_CLAUSE_LINEAR_NO_COPYOUT (c) = 1;
8821 flags |= GOVD_LINEAR_LASTPRIVATE_NO_OUTER;
8823 struct gimplify_omp_ctx *outer
8824 = gimplify_omp_ctxp->outer_context;
8825 if (outer && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c))
8827 if (outer->region_type == ORT_WORKSHARE
8828 && outer->combined_loop)
8830 n = splay_tree_lookup (outer->variables,
8831 (splay_tree_key)decl);
8832 if (n != NULL && (n->value & GOVD_LOCAL) != 0)
8834 OMP_CLAUSE_LINEAR_NO_COPYOUT (c) = 1;
8835 flags |= GOVD_LINEAR_LASTPRIVATE_NO_OUTER;
8837 else
8839 struct gimplify_omp_ctx *octx = outer->outer_context;
8840 if (octx
8841 && octx->region_type == ORT_COMBINED_PARALLEL
8842 && octx->outer_context
8843 && (octx->outer_context->region_type
8844 == ORT_WORKSHARE)
8845 && octx->outer_context->combined_loop)
8847 octx = octx->outer_context;
8848 n = splay_tree_lookup (octx->variables,
8849 (splay_tree_key)decl);
8850 if (n != NULL && (n->value & GOVD_LOCAL) != 0)
8852 OMP_CLAUSE_LINEAR_NO_COPYOUT (c) = 1;
8853 flags |= GOVD_LINEAR_LASTPRIVATE_NO_OUTER;
8860 OMP_CLAUSE_DECL (c) = decl;
8861 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (for_stmt);
8862 OMP_FOR_CLAUSES (for_stmt) = c;
8863 omp_add_variable (gimplify_omp_ctxp, decl, flags);
8864 if (outer && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c))
8866 if (outer->region_type == ORT_WORKSHARE
8867 && outer->combined_loop)
8869 if (outer->outer_context
8870 && (outer->outer_context->region_type
8871 == ORT_COMBINED_PARALLEL))
8872 outer = outer->outer_context;
8873 else if (omp_check_private (outer, decl, false))
8874 outer = NULL;
8876 else if (((outer->region_type & ORT_TASK) != 0)
8877 && outer->combined_loop
8878 && !omp_check_private (gimplify_omp_ctxp,
8879 decl, false))
8881 else if (outer->region_type != ORT_COMBINED_PARALLEL)
8883 omp_notice_variable (outer, decl, true);
8884 outer = NULL;
8886 if (outer)
8888 n = splay_tree_lookup (outer->variables,
8889 (splay_tree_key)decl);
8890 if (n == NULL || (n->value & GOVD_DATA_SHARE_CLASS) == 0)
8892 omp_add_variable (outer, decl,
8893 GOVD_LASTPRIVATE | GOVD_SEEN);
8894 if (outer->region_type == ORT_COMBINED_PARALLEL
8895 && outer->outer_context
8896 && (outer->outer_context->region_type
8897 == ORT_WORKSHARE)
8898 && outer->outer_context->combined_loop)
8900 outer = outer->outer_context;
8901 n = splay_tree_lookup (outer->variables,
8902 (splay_tree_key)decl);
8903 if (omp_check_private (outer, decl, false))
8904 outer = NULL;
8905 else if (n == NULL
8906 || ((n->value & GOVD_DATA_SHARE_CLASS)
8907 == 0))
8908 omp_add_variable (outer, decl,
8909 GOVD_LASTPRIVATE
8910 | GOVD_SEEN);
8911 else
8912 outer = NULL;
8914 if (outer && outer->outer_context
8915 && (outer->outer_context->region_type
8916 == ORT_COMBINED_TEAMS))
8918 outer = outer->outer_context;
8919 n = splay_tree_lookup (outer->variables,
8920 (splay_tree_key)decl);
8921 if (n == NULL
8922 || (n->value & GOVD_DATA_SHARE_CLASS) == 0)
8923 omp_add_variable (outer, decl,
8924 GOVD_SHARED | GOVD_SEEN);
8925 else
8926 outer = NULL;
8928 if (outer && outer->outer_context)
8929 omp_notice_variable (outer->outer_context, decl,
8930 true);
8935 else
8937 bool lastprivate
8938 = (!has_decl_expr
8939 || !bitmap_bit_p (has_decl_expr, DECL_UID (decl)))
8940 && !omp_no_lastprivate (gimplify_omp_ctxp);
8941 struct gimplify_omp_ctx *outer
8942 = gimplify_omp_ctxp->outer_context;
8943 if (outer && lastprivate)
8945 if (outer->region_type == ORT_WORKSHARE
8946 && outer->combined_loop)
8948 n = splay_tree_lookup (outer->variables,
8949 (splay_tree_key)decl);
8950 if (n != NULL && (n->value & GOVD_LOCAL) != 0)
8952 lastprivate = false;
8953 outer = NULL;
8955 else if (outer->outer_context
8956 && (outer->outer_context->region_type
8957 == ORT_COMBINED_PARALLEL))
8958 outer = outer->outer_context;
8959 else if (omp_check_private (outer, decl, false))
8960 outer = NULL;
8962 else if (((outer->region_type & ORT_TASK) != 0)
8963 && outer->combined_loop
8964 && !omp_check_private (gimplify_omp_ctxp,
8965 decl, false))
8967 else if (outer->region_type != ORT_COMBINED_PARALLEL)
8969 omp_notice_variable (outer, decl, true);
8970 outer = NULL;
8972 if (outer)
8974 n = splay_tree_lookup (outer->variables,
8975 (splay_tree_key)decl);
8976 if (n == NULL || (n->value & GOVD_DATA_SHARE_CLASS) == 0)
8978 omp_add_variable (outer, decl,
8979 GOVD_LASTPRIVATE | GOVD_SEEN);
8980 if (outer->region_type == ORT_COMBINED_PARALLEL
8981 && outer->outer_context
8982 && (outer->outer_context->region_type
8983 == ORT_WORKSHARE)
8984 && outer->outer_context->combined_loop)
8986 outer = outer->outer_context;
8987 n = splay_tree_lookup (outer->variables,
8988 (splay_tree_key)decl);
8989 if (omp_check_private (outer, decl, false))
8990 outer = NULL;
8991 else if (n == NULL
8992 || ((n->value & GOVD_DATA_SHARE_CLASS)
8993 == 0))
8994 omp_add_variable (outer, decl,
8995 GOVD_LASTPRIVATE
8996 | GOVD_SEEN);
8997 else
8998 outer = NULL;
9000 if (outer && outer->outer_context
9001 && (outer->outer_context->region_type
9002 == ORT_COMBINED_TEAMS))
9004 outer = outer->outer_context;
9005 n = splay_tree_lookup (outer->variables,
9006 (splay_tree_key)decl);
9007 if (n == NULL
9008 || (n->value & GOVD_DATA_SHARE_CLASS) == 0)
9009 omp_add_variable (outer, decl,
9010 GOVD_SHARED | GOVD_SEEN);
9011 else
9012 outer = NULL;
9014 if (outer && outer->outer_context)
9015 omp_notice_variable (outer->outer_context, decl,
9016 true);
9021 c = build_omp_clause (input_location,
9022 lastprivate ? OMP_CLAUSE_LASTPRIVATE
9023 : OMP_CLAUSE_PRIVATE);
9024 OMP_CLAUSE_DECL (c) = decl;
9025 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (for_stmt);
9026 OMP_FOR_CLAUSES (for_stmt) = c;
9027 omp_add_variable (gimplify_omp_ctxp, decl,
9028 (lastprivate ? GOVD_LASTPRIVATE : GOVD_PRIVATE)
9029 | GOVD_EXPLICIT | GOVD_SEEN);
9030 c = NULL_TREE;
9033 else if (omp_is_private (gimplify_omp_ctxp, decl, 0))
9034 omp_notice_variable (gimplify_omp_ctxp, decl, true);
9035 else
9036 omp_add_variable (gimplify_omp_ctxp, decl, GOVD_PRIVATE | GOVD_SEEN);
9038 /* If DECL is not a gimple register, create a temporary variable to act
9039 as an iteration counter. This is valid, since DECL cannot be
9040 modified in the body of the loop. Similarly for any iteration vars
9041 in simd with collapse > 1 where the iterator vars must be
9042 lastprivate. */
9043 if (orig_for_stmt != for_stmt)
9044 var = decl;
9045 else if (!is_gimple_reg (decl)
9046 || (ort == ORT_SIMD
9047 && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) > 1))
9049 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
9050 /* Make sure omp_add_variable is not called on it prematurely.
9051 We call it ourselves a few lines later. */
9052 gimplify_omp_ctxp = NULL;
9053 var = create_tmp_var (TREE_TYPE (decl), get_name (decl));
9054 gimplify_omp_ctxp = ctx;
9055 TREE_OPERAND (t, 0) = var;
9057 gimplify_seq_add_stmt (&for_body, gimple_build_assign (decl, var));
9059 if (ort == ORT_SIMD
9060 && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) == 1)
9062 c2 = build_omp_clause (input_location, OMP_CLAUSE_LINEAR);
9063 OMP_CLAUSE_LINEAR_NO_COPYIN (c2) = 1;
9064 OMP_CLAUSE_LINEAR_NO_COPYOUT (c2) = 1;
9065 OMP_CLAUSE_DECL (c2) = var;
9066 OMP_CLAUSE_CHAIN (c2) = OMP_FOR_CLAUSES (for_stmt);
9067 OMP_FOR_CLAUSES (for_stmt) = c2;
9068 omp_add_variable (gimplify_omp_ctxp, var,
9069 GOVD_LINEAR | GOVD_EXPLICIT | GOVD_SEEN);
9070 if (c == NULL_TREE)
9072 c = c2;
9073 c2 = NULL_TREE;
9076 else
9077 omp_add_variable (gimplify_omp_ctxp, var,
9078 GOVD_PRIVATE | GOVD_SEEN);
9080 else
9081 var = decl;
9083 tret = gimplify_expr (&TREE_OPERAND (t, 1), &for_pre_body, NULL,
9084 is_gimple_val, fb_rvalue);
9085 ret = MIN (ret, tret);
9086 if (ret == GS_ERROR)
9087 return ret;
9089 /* Handle OMP_FOR_COND. */
9090 t = TREE_VEC_ELT (OMP_FOR_COND (for_stmt), i);
9091 gcc_assert (COMPARISON_CLASS_P (t));
9092 gcc_assert (TREE_OPERAND (t, 0) == decl);
9094 tret = gimplify_expr (&TREE_OPERAND (t, 1), &for_pre_body, NULL,
9095 is_gimple_val, fb_rvalue);
9096 ret = MIN (ret, tret);
9098 /* Handle OMP_FOR_INCR. */
9099 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
9100 switch (TREE_CODE (t))
9102 case PREINCREMENT_EXPR:
9103 case POSTINCREMENT_EXPR:
9105 tree decl = TREE_OPERAND (t, 0);
9106 /* c_omp_for_incr_canonicalize_ptr() should have been
9107 called to massage things appropriately. */
9108 gcc_assert (!POINTER_TYPE_P (TREE_TYPE (decl)));
9110 if (orig_for_stmt != for_stmt)
9111 break;
9112 t = build_int_cst (TREE_TYPE (decl), 1);
9113 if (c)
9114 OMP_CLAUSE_LINEAR_STEP (c) = t;
9115 t = build2 (PLUS_EXPR, TREE_TYPE (decl), var, t);
9116 t = build2 (MODIFY_EXPR, TREE_TYPE (var), var, t);
9117 TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i) = t;
9118 break;
9121 case PREDECREMENT_EXPR:
9122 case POSTDECREMENT_EXPR:
9123 /* c_omp_for_incr_canonicalize_ptr() should have been
9124 called to massage things appropriately. */
9125 gcc_assert (!POINTER_TYPE_P (TREE_TYPE (decl)));
9126 if (orig_for_stmt != for_stmt)
9127 break;
9128 t = build_int_cst (TREE_TYPE (decl), -1);
9129 if (c)
9130 OMP_CLAUSE_LINEAR_STEP (c) = t;
9131 t = build2 (PLUS_EXPR, TREE_TYPE (decl), var, t);
9132 t = build2 (MODIFY_EXPR, TREE_TYPE (var), var, t);
9133 TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i) = t;
9134 break;
9136 case MODIFY_EXPR:
9137 gcc_assert (TREE_OPERAND (t, 0) == decl);
9138 TREE_OPERAND (t, 0) = var;
9140 t = TREE_OPERAND (t, 1);
9141 switch (TREE_CODE (t))
9143 case PLUS_EXPR:
9144 if (TREE_OPERAND (t, 1) == decl)
9146 TREE_OPERAND (t, 1) = TREE_OPERAND (t, 0);
9147 TREE_OPERAND (t, 0) = var;
9148 break;
9151 /* Fallthru. */
9152 case MINUS_EXPR:
9153 case POINTER_PLUS_EXPR:
9154 gcc_assert (TREE_OPERAND (t, 0) == decl);
9155 TREE_OPERAND (t, 0) = var;
9156 break;
9157 default:
9158 gcc_unreachable ();
9161 tret = gimplify_expr (&TREE_OPERAND (t, 1), &for_pre_body, NULL,
9162 is_gimple_val, fb_rvalue);
9163 ret = MIN (ret, tret);
9164 if (c)
9166 tree step = TREE_OPERAND (t, 1);
9167 tree stept = TREE_TYPE (decl);
9168 if (POINTER_TYPE_P (stept))
9169 stept = sizetype;
9170 step = fold_convert (stept, step);
9171 if (TREE_CODE (t) == MINUS_EXPR)
9172 step = fold_build1 (NEGATE_EXPR, stept, step);
9173 OMP_CLAUSE_LINEAR_STEP (c) = step;
9174 if (step != TREE_OPERAND (t, 1))
9176 tret = gimplify_expr (&OMP_CLAUSE_LINEAR_STEP (c),
9177 &for_pre_body, NULL,
9178 is_gimple_val, fb_rvalue);
9179 ret = MIN (ret, tret);
9182 break;
9184 default:
9185 gcc_unreachable ();
9188 if (c2)
9190 gcc_assert (c);
9191 OMP_CLAUSE_LINEAR_STEP (c2) = OMP_CLAUSE_LINEAR_STEP (c);
9194 if ((var != decl || collapse > 1) && orig_for_stmt == for_stmt)
9196 for (c = OMP_FOR_CLAUSES (for_stmt); c ; c = OMP_CLAUSE_CHAIN (c))
9197 if (((OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE
9198 && OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c) == NULL)
9199 || (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
9200 && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c)
9201 && OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c) == NULL))
9202 && OMP_CLAUSE_DECL (c) == decl)
9204 if (is_doacross && (collapse == 1 || i >= collapse))
9205 t = var;
9206 else
9208 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
9209 gcc_assert (TREE_CODE (t) == MODIFY_EXPR);
9210 gcc_assert (TREE_OPERAND (t, 0) == var);
9211 t = TREE_OPERAND (t, 1);
9212 gcc_assert (TREE_CODE (t) == PLUS_EXPR
9213 || TREE_CODE (t) == MINUS_EXPR
9214 || TREE_CODE (t) == POINTER_PLUS_EXPR);
9215 gcc_assert (TREE_OPERAND (t, 0) == var);
9216 t = build2 (TREE_CODE (t), TREE_TYPE (decl),
9217 is_doacross ? var : decl,
9218 TREE_OPERAND (t, 1));
9220 gimple_seq *seq;
9221 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE)
9222 seq = &OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c);
9223 else
9224 seq = &OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c);
9225 gimplify_assign (decl, t, seq);
9230 BITMAP_FREE (has_decl_expr);
9232 if (TREE_CODE (orig_for_stmt) == OMP_TASKLOOP)
9234 push_gimplify_context ();
9235 if (TREE_CODE (OMP_FOR_BODY (orig_for_stmt)) != BIND_EXPR)
9237 OMP_FOR_BODY (orig_for_stmt)
9238 = build3 (BIND_EXPR, void_type_node, NULL,
9239 OMP_FOR_BODY (orig_for_stmt), NULL);
9240 TREE_SIDE_EFFECTS (OMP_FOR_BODY (orig_for_stmt)) = 1;
9244 gimple *g = gimplify_and_return_first (OMP_FOR_BODY (orig_for_stmt),
9245 &for_body);
9247 if (TREE_CODE (orig_for_stmt) == OMP_TASKLOOP)
9249 if (gimple_code (g) == GIMPLE_BIND)
9250 pop_gimplify_context (g);
9251 else
9252 pop_gimplify_context (NULL);
9255 if (orig_for_stmt != for_stmt)
9256 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
9258 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
9259 decl = TREE_OPERAND (t, 0);
9260 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
9261 if (TREE_CODE (orig_for_stmt) == OMP_TASKLOOP)
9262 gimplify_omp_ctxp = ctx->outer_context;
9263 var = create_tmp_var (TREE_TYPE (decl), get_name (decl));
9264 gimplify_omp_ctxp = ctx;
9265 omp_add_variable (gimplify_omp_ctxp, var, GOVD_PRIVATE | GOVD_SEEN);
9266 TREE_OPERAND (t, 0) = var;
9267 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
9268 TREE_OPERAND (t, 1) = copy_node (TREE_OPERAND (t, 1));
9269 TREE_OPERAND (TREE_OPERAND (t, 1), 0) = var;
9272 gimplify_adjust_omp_clauses (pre_p, for_body,
9273 &OMP_FOR_CLAUSES (orig_for_stmt),
9274 TREE_CODE (orig_for_stmt));
9276 int kind;
9277 switch (TREE_CODE (orig_for_stmt))
9279 case OMP_FOR: kind = GF_OMP_FOR_KIND_FOR; break;
9280 case OMP_SIMD: kind = GF_OMP_FOR_KIND_SIMD; break;
9281 case CILK_SIMD: kind = GF_OMP_FOR_KIND_CILKSIMD; break;
9282 case CILK_FOR: kind = GF_OMP_FOR_KIND_CILKFOR; break;
9283 case OMP_DISTRIBUTE: kind = GF_OMP_FOR_KIND_DISTRIBUTE; break;
9284 case OMP_TASKLOOP: kind = GF_OMP_FOR_KIND_TASKLOOP; break;
9285 case OACC_LOOP: kind = GF_OMP_FOR_KIND_OACC_LOOP; break;
9286 default:
9287 gcc_unreachable ();
9289 gfor = gimple_build_omp_for (for_body, kind, OMP_FOR_CLAUSES (orig_for_stmt),
9290 TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)),
9291 for_pre_body);
9292 if (orig_for_stmt != for_stmt)
9293 gimple_omp_for_set_combined_p (gfor, true);
9294 if (gimplify_omp_ctxp
9295 && (gimplify_omp_ctxp->combined_loop
9296 || (gimplify_omp_ctxp->region_type == ORT_COMBINED_PARALLEL
9297 && gimplify_omp_ctxp->outer_context
9298 && gimplify_omp_ctxp->outer_context->combined_loop)))
9300 gimple_omp_for_set_combined_into_p (gfor, true);
9301 if (gimplify_omp_ctxp->combined_loop)
9302 gcc_assert (TREE_CODE (orig_for_stmt) == OMP_SIMD);
9303 else
9304 gcc_assert (TREE_CODE (orig_for_stmt) == OMP_FOR);
9307 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
9309 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
9310 gimple_omp_for_set_index (gfor, i, TREE_OPERAND (t, 0));
9311 gimple_omp_for_set_initial (gfor, i, TREE_OPERAND (t, 1));
9312 t = TREE_VEC_ELT (OMP_FOR_COND (for_stmt), i);
9313 gimple_omp_for_set_cond (gfor, i, TREE_CODE (t));
9314 gimple_omp_for_set_final (gfor, i, TREE_OPERAND (t, 1));
9315 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
9316 gimple_omp_for_set_incr (gfor, i, TREE_OPERAND (t, 1));
9319 /* OMP_TASKLOOP is gimplified as two GIMPLE_OMP_FOR taskloop
9320 constructs with GIMPLE_OMP_TASK sandwiched in between them.
9321 The outer taskloop stands for computing the number of iterations,
9322 counts for collapsed loops and holding taskloop specific clauses.
9323 The task construct stands for the effect of data sharing on the
9324 explicit task it creates and the inner taskloop stands for expansion
9325 of the static loop inside of the explicit task construct. */
9326 if (TREE_CODE (orig_for_stmt) == OMP_TASKLOOP)
9328 tree *gfor_clauses_ptr = gimple_omp_for_clauses_ptr (gfor);
9329 tree task_clauses = NULL_TREE;
9330 tree c = *gfor_clauses_ptr;
9331 tree *gtask_clauses_ptr = &task_clauses;
9332 tree outer_for_clauses = NULL_TREE;
9333 tree *gforo_clauses_ptr = &outer_for_clauses;
9334 for (; c; c = OMP_CLAUSE_CHAIN (c))
9335 switch (OMP_CLAUSE_CODE (c))
9337 /* These clauses are allowed on task, move them there. */
9338 case OMP_CLAUSE_SHARED:
9339 case OMP_CLAUSE_FIRSTPRIVATE:
9340 case OMP_CLAUSE_DEFAULT:
9341 case OMP_CLAUSE_IF:
9342 case OMP_CLAUSE_UNTIED:
9343 case OMP_CLAUSE_FINAL:
9344 case OMP_CLAUSE_MERGEABLE:
9345 case OMP_CLAUSE_PRIORITY:
9346 *gtask_clauses_ptr = c;
9347 gtask_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9348 break;
9349 case OMP_CLAUSE_PRIVATE:
9350 if (OMP_CLAUSE_PRIVATE_TASKLOOP_IV (c))
9352 /* We want private on outer for and firstprivate
9353 on task. */
9354 *gtask_clauses_ptr
9355 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
9356 OMP_CLAUSE_FIRSTPRIVATE);
9357 OMP_CLAUSE_DECL (*gtask_clauses_ptr) = OMP_CLAUSE_DECL (c);
9358 lang_hooks.decls.omp_finish_clause (*gtask_clauses_ptr, NULL);
9359 gtask_clauses_ptr = &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr);
9360 *gforo_clauses_ptr = c;
9361 gforo_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9363 else
9365 *gtask_clauses_ptr = c;
9366 gtask_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9368 break;
9369 /* These clauses go into outer taskloop clauses. */
9370 case OMP_CLAUSE_GRAINSIZE:
9371 case OMP_CLAUSE_NUM_TASKS:
9372 case OMP_CLAUSE_NOGROUP:
9373 *gforo_clauses_ptr = c;
9374 gforo_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9375 break;
9376 /* Taskloop clause we duplicate on both taskloops. */
9377 case OMP_CLAUSE_COLLAPSE:
9378 *gfor_clauses_ptr = c;
9379 gfor_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9380 *gforo_clauses_ptr = copy_node (c);
9381 gforo_clauses_ptr = &OMP_CLAUSE_CHAIN (*gforo_clauses_ptr);
9382 break;
9383 /* For lastprivate, keep the clause on inner taskloop, and add
9384 a shared clause on task. If the same decl is also firstprivate,
9385 add also firstprivate clause on the inner taskloop. */
9386 case OMP_CLAUSE_LASTPRIVATE:
9387 if (OMP_CLAUSE_LASTPRIVATE_TASKLOOP_IV (c))
9389 /* For taskloop C++ lastprivate IVs, we want:
9390 1) private on outer taskloop
9391 2) firstprivate and shared on task
9392 3) lastprivate on inner taskloop */
9393 *gtask_clauses_ptr
9394 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
9395 OMP_CLAUSE_FIRSTPRIVATE);
9396 OMP_CLAUSE_DECL (*gtask_clauses_ptr) = OMP_CLAUSE_DECL (c);
9397 lang_hooks.decls.omp_finish_clause (*gtask_clauses_ptr, NULL);
9398 gtask_clauses_ptr = &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr);
9399 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c) = 1;
9400 *gforo_clauses_ptr = build_omp_clause (OMP_CLAUSE_LOCATION (c),
9401 OMP_CLAUSE_PRIVATE);
9402 OMP_CLAUSE_DECL (*gforo_clauses_ptr) = OMP_CLAUSE_DECL (c);
9403 OMP_CLAUSE_PRIVATE_TASKLOOP_IV (*gforo_clauses_ptr) = 1;
9404 TREE_TYPE (*gforo_clauses_ptr) = TREE_TYPE (c);
9405 gforo_clauses_ptr = &OMP_CLAUSE_CHAIN (*gforo_clauses_ptr);
9407 *gfor_clauses_ptr = c;
9408 gfor_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9409 *gtask_clauses_ptr
9410 = build_omp_clause (OMP_CLAUSE_LOCATION (c), OMP_CLAUSE_SHARED);
9411 OMP_CLAUSE_DECL (*gtask_clauses_ptr) = OMP_CLAUSE_DECL (c);
9412 if (OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c))
9413 OMP_CLAUSE_SHARED_FIRSTPRIVATE (*gtask_clauses_ptr) = 1;
9414 gtask_clauses_ptr
9415 = &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr);
9416 break;
9417 default:
9418 gcc_unreachable ();
9420 *gfor_clauses_ptr = NULL_TREE;
9421 *gtask_clauses_ptr = NULL_TREE;
9422 *gforo_clauses_ptr = NULL_TREE;
9423 g = gimple_build_bind (NULL_TREE, gfor, NULL_TREE);
9424 g = gimple_build_omp_task (g, task_clauses, NULL_TREE, NULL_TREE,
9425 NULL_TREE, NULL_TREE, NULL_TREE);
9426 gimple_omp_task_set_taskloop_p (g, true);
9427 g = gimple_build_bind (NULL_TREE, g, NULL_TREE);
9428 gomp_for *gforo
9429 = gimple_build_omp_for (g, GF_OMP_FOR_KIND_TASKLOOP, outer_for_clauses,
9430 gimple_omp_for_collapse (gfor),
9431 gimple_omp_for_pre_body (gfor));
9432 gimple_omp_for_set_pre_body (gfor, NULL);
9433 gimple_omp_for_set_combined_p (gforo, true);
9434 gimple_omp_for_set_combined_into_p (gfor, true);
9435 for (i = 0; i < (int) gimple_omp_for_collapse (gfor); i++)
9437 t = unshare_expr (gimple_omp_for_index (gfor, i));
9438 gimple_omp_for_set_index (gforo, i, t);
9439 t = unshare_expr (gimple_omp_for_initial (gfor, i));
9440 gimple_omp_for_set_initial (gforo, i, t);
9441 gimple_omp_for_set_cond (gforo, i,
9442 gimple_omp_for_cond (gfor, i));
9443 t = unshare_expr (gimple_omp_for_final (gfor, i));
9444 gimple_omp_for_set_final (gforo, i, t);
9445 t = unshare_expr (gimple_omp_for_incr (gfor, i));
9446 gimple_omp_for_set_incr (gforo, i, t);
9448 gimplify_seq_add_stmt (pre_p, gforo);
9450 else
9451 gimplify_seq_add_stmt (pre_p, gfor);
9452 if (ret != GS_ALL_DONE)
9453 return GS_ERROR;
9454 *expr_p = NULL_TREE;
9455 return GS_ALL_DONE;
9458 /* Helper function of optimize_target_teams, find OMP_TEAMS inside
9459 of OMP_TARGET's body. */
9461 static tree
9462 find_omp_teams (tree *tp, int *walk_subtrees, void *)
9464 *walk_subtrees = 0;
9465 switch (TREE_CODE (*tp))
9467 case OMP_TEAMS:
9468 return *tp;
9469 case BIND_EXPR:
9470 case STATEMENT_LIST:
9471 *walk_subtrees = 1;
9472 break;
9473 default:
9474 break;
9476 return NULL_TREE;
9479 /* Helper function of optimize_target_teams, determine if the expression
9480 can be computed safely before the target construct on the host. */
9482 static tree
9483 computable_teams_clause (tree *tp, int *walk_subtrees, void *)
9485 splay_tree_node n;
9487 if (TYPE_P (*tp))
9489 *walk_subtrees = 0;
9490 return NULL_TREE;
9492 switch (TREE_CODE (*tp))
9494 case VAR_DECL:
9495 case PARM_DECL:
9496 case RESULT_DECL:
9497 *walk_subtrees = 0;
9498 if (error_operand_p (*tp)
9499 || !INTEGRAL_TYPE_P (TREE_TYPE (*tp))
9500 || DECL_HAS_VALUE_EXPR_P (*tp)
9501 || DECL_THREAD_LOCAL_P (*tp)
9502 || TREE_SIDE_EFFECTS (*tp)
9503 || TREE_THIS_VOLATILE (*tp))
9504 return *tp;
9505 if (is_global_var (*tp)
9506 && (lookup_attribute ("omp declare target", DECL_ATTRIBUTES (*tp))
9507 || lookup_attribute ("omp declare target link",
9508 DECL_ATTRIBUTES (*tp))))
9509 return *tp;
9510 n = splay_tree_lookup (gimplify_omp_ctxp->variables,
9511 (splay_tree_key) *tp);
9512 if (n == NULL)
9514 if (gimplify_omp_ctxp->target_map_scalars_firstprivate)
9515 return NULL_TREE;
9516 return *tp;
9518 else if (n->value & GOVD_LOCAL)
9519 return *tp;
9520 else if (n->value & GOVD_FIRSTPRIVATE)
9521 return NULL_TREE;
9522 else if ((n->value & (GOVD_MAP | GOVD_MAP_ALWAYS_TO))
9523 == (GOVD_MAP | GOVD_MAP_ALWAYS_TO))
9524 return NULL_TREE;
9525 return *tp;
9526 case INTEGER_CST:
9527 if (!INTEGRAL_TYPE_P (TREE_TYPE (*tp)))
9528 return *tp;
9529 return NULL_TREE;
9530 case TARGET_EXPR:
9531 if (TARGET_EXPR_INITIAL (*tp)
9532 || TREE_CODE (TARGET_EXPR_SLOT (*tp)) != VAR_DECL)
9533 return *tp;
9534 return computable_teams_clause (&TARGET_EXPR_SLOT (*tp),
9535 walk_subtrees, NULL);
9536 /* Allow some reasonable subset of integral arithmetics. */
9537 case PLUS_EXPR:
9538 case MINUS_EXPR:
9539 case MULT_EXPR:
9540 case TRUNC_DIV_EXPR:
9541 case CEIL_DIV_EXPR:
9542 case FLOOR_DIV_EXPR:
9543 case ROUND_DIV_EXPR:
9544 case TRUNC_MOD_EXPR:
9545 case CEIL_MOD_EXPR:
9546 case FLOOR_MOD_EXPR:
9547 case ROUND_MOD_EXPR:
9548 case RDIV_EXPR:
9549 case EXACT_DIV_EXPR:
9550 case MIN_EXPR:
9551 case MAX_EXPR:
9552 case LSHIFT_EXPR:
9553 case RSHIFT_EXPR:
9554 case BIT_IOR_EXPR:
9555 case BIT_XOR_EXPR:
9556 case BIT_AND_EXPR:
9557 case NEGATE_EXPR:
9558 case ABS_EXPR:
9559 case BIT_NOT_EXPR:
9560 case NON_LVALUE_EXPR:
9561 CASE_CONVERT:
9562 if (!INTEGRAL_TYPE_P (TREE_TYPE (*tp)))
9563 return *tp;
9564 return NULL_TREE;
9565 /* And disallow anything else, except for comparisons. */
9566 default:
9567 if (COMPARISON_CLASS_P (*tp))
9568 return NULL_TREE;
9569 return *tp;
9573 /* Try to determine if the num_teams and/or thread_limit expressions
9574 can have their values determined already before entering the
9575 target construct.
9576 INTEGER_CSTs trivially are,
9577 integral decls that are firstprivate (explicitly or implicitly)
9578 or explicitly map(always, to:) or map(always, tofrom:) on the target
9579 region too, and expressions involving simple arithmetics on those
9580 too, function calls are not ok, dereferencing something neither etc.
9581 Add NUM_TEAMS and THREAD_LIMIT clauses to the OMP_CLAUSES of
9582 EXPR based on what we find:
9583 0 stands for clause not specified at all, use implementation default
9584 -1 stands for value that can't be determined easily before entering
9585 the target construct.
9586 If teams construct is not present at all, use 1 for num_teams
9587 and 0 for thread_limit (only one team is involved, and the thread
9588 limit is implementation defined. */
9590 static void
9591 optimize_target_teams (tree target, gimple_seq *pre_p)
9593 tree body = OMP_BODY (target);
9594 tree teams = walk_tree (&body, find_omp_teams, NULL, NULL);
9595 tree num_teams = integer_zero_node;
9596 tree thread_limit = integer_zero_node;
9597 location_t num_teams_loc = EXPR_LOCATION (target);
9598 location_t thread_limit_loc = EXPR_LOCATION (target);
9599 tree c, *p, expr;
9600 struct gimplify_omp_ctx *target_ctx = gimplify_omp_ctxp;
9602 if (teams == NULL_TREE)
9603 num_teams = integer_one_node;
9604 else
9605 for (c = OMP_TEAMS_CLAUSES (teams); c; c = OMP_CLAUSE_CHAIN (c))
9607 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_NUM_TEAMS)
9609 p = &num_teams;
9610 num_teams_loc = OMP_CLAUSE_LOCATION (c);
9612 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_THREAD_LIMIT)
9614 p = &thread_limit;
9615 thread_limit_loc = OMP_CLAUSE_LOCATION (c);
9617 else
9618 continue;
9619 expr = OMP_CLAUSE_OPERAND (c, 0);
9620 if (TREE_CODE (expr) == INTEGER_CST)
9622 *p = expr;
9623 continue;
9625 if (walk_tree (&expr, computable_teams_clause, NULL, NULL))
9627 *p = integer_minus_one_node;
9628 continue;
9630 *p = expr;
9631 gimplify_omp_ctxp = gimplify_omp_ctxp->outer_context;
9632 if (gimplify_expr (p, pre_p, NULL, is_gimple_val, fb_rvalue)
9633 == GS_ERROR)
9635 gimplify_omp_ctxp = target_ctx;
9636 *p = integer_minus_one_node;
9637 continue;
9639 gimplify_omp_ctxp = target_ctx;
9640 if (!DECL_P (expr) && TREE_CODE (expr) != TARGET_EXPR)
9641 OMP_CLAUSE_OPERAND (c, 0) = *p;
9643 c = build_omp_clause (thread_limit_loc, OMP_CLAUSE_THREAD_LIMIT);
9644 OMP_CLAUSE_THREAD_LIMIT_EXPR (c) = thread_limit;
9645 OMP_CLAUSE_CHAIN (c) = OMP_TARGET_CLAUSES (target);
9646 OMP_TARGET_CLAUSES (target) = c;
9647 c = build_omp_clause (num_teams_loc, OMP_CLAUSE_NUM_TEAMS);
9648 OMP_CLAUSE_NUM_TEAMS_EXPR (c) = num_teams;
9649 OMP_CLAUSE_CHAIN (c) = OMP_TARGET_CLAUSES (target);
9650 OMP_TARGET_CLAUSES (target) = c;
9653 /* Gimplify the gross structure of several OMP constructs. */
9655 static void
9656 gimplify_omp_workshare (tree *expr_p, gimple_seq *pre_p)
9658 tree expr = *expr_p;
9659 gimple *stmt;
9660 gimple_seq body = NULL;
9661 enum omp_region_type ort;
9663 switch (TREE_CODE (expr))
9665 case OMP_SECTIONS:
9666 case OMP_SINGLE:
9667 ort = ORT_WORKSHARE;
9668 break;
9669 case OMP_TARGET:
9670 ort = OMP_TARGET_COMBINED (expr) ? ORT_COMBINED_TARGET : ORT_TARGET;
9671 break;
9672 case OACC_KERNELS:
9673 ort = ORT_ACC_KERNELS;
9674 break;
9675 case OACC_PARALLEL:
9676 ort = ORT_ACC_PARALLEL;
9677 break;
9678 case OACC_DATA:
9679 ort = ORT_ACC_DATA;
9680 break;
9681 case OMP_TARGET_DATA:
9682 ort = ORT_TARGET_DATA;
9683 break;
9684 case OMP_TEAMS:
9685 ort = OMP_TEAMS_COMBINED (expr) ? ORT_COMBINED_TEAMS : ORT_TEAMS;
9686 break;
9687 case OACC_HOST_DATA:
9688 ort = ORT_ACC_HOST_DATA;
9689 break;
9690 default:
9691 gcc_unreachable ();
9693 gimplify_scan_omp_clauses (&OMP_CLAUSES (expr), pre_p, ort,
9694 TREE_CODE (expr));
9695 if (TREE_CODE (expr) == OMP_TARGET)
9696 optimize_target_teams (expr, pre_p);
9697 if ((ort & (ORT_TARGET | ORT_TARGET_DATA)) != 0)
9699 push_gimplify_context ();
9700 gimple *g = gimplify_and_return_first (OMP_BODY (expr), &body);
9701 if (gimple_code (g) == GIMPLE_BIND)
9702 pop_gimplify_context (g);
9703 else
9704 pop_gimplify_context (NULL);
9705 if ((ort & ORT_TARGET_DATA) != 0)
9707 enum built_in_function end_ix;
9708 switch (TREE_CODE (expr))
9710 case OACC_DATA:
9711 case OACC_HOST_DATA:
9712 end_ix = BUILT_IN_GOACC_DATA_END;
9713 break;
9714 case OMP_TARGET_DATA:
9715 end_ix = BUILT_IN_GOMP_TARGET_END_DATA;
9716 break;
9717 default:
9718 gcc_unreachable ();
9720 tree fn = builtin_decl_explicit (end_ix);
9721 g = gimple_build_call (fn, 0);
9722 gimple_seq cleanup = NULL;
9723 gimple_seq_add_stmt (&cleanup, g);
9724 g = gimple_build_try (body, cleanup, GIMPLE_TRY_FINALLY);
9725 body = NULL;
9726 gimple_seq_add_stmt (&body, g);
9729 else
9730 gimplify_and_add (OMP_BODY (expr), &body);
9731 gimplify_adjust_omp_clauses (pre_p, body, &OMP_CLAUSES (expr),
9732 TREE_CODE (expr));
9734 switch (TREE_CODE (expr))
9736 case OACC_DATA:
9737 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_DATA,
9738 OMP_CLAUSES (expr));
9739 break;
9740 case OACC_KERNELS:
9741 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_KERNELS,
9742 OMP_CLAUSES (expr));
9743 break;
9744 case OACC_HOST_DATA:
9745 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_HOST_DATA,
9746 OMP_CLAUSES (expr));
9747 break;
9748 case OACC_PARALLEL:
9749 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_PARALLEL,
9750 OMP_CLAUSES (expr));
9751 break;
9752 case OMP_SECTIONS:
9753 stmt = gimple_build_omp_sections (body, OMP_CLAUSES (expr));
9754 break;
9755 case OMP_SINGLE:
9756 stmt = gimple_build_omp_single (body, OMP_CLAUSES (expr));
9757 break;
9758 case OMP_TARGET:
9759 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_REGION,
9760 OMP_CLAUSES (expr));
9761 break;
9762 case OMP_TARGET_DATA:
9763 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_DATA,
9764 OMP_CLAUSES (expr));
9765 break;
9766 case OMP_TEAMS:
9767 stmt = gimple_build_omp_teams (body, OMP_CLAUSES (expr));
9768 break;
9769 default:
9770 gcc_unreachable ();
9773 gimplify_seq_add_stmt (pre_p, stmt);
9774 *expr_p = NULL_TREE;
9777 /* Gimplify the gross structure of OpenACC enter/exit data, update, and OpenMP
9778 target update constructs. */
9780 static void
9781 gimplify_omp_target_update (tree *expr_p, gimple_seq *pre_p)
9783 tree expr = *expr_p;
9784 int kind;
9785 gomp_target *stmt;
9786 enum omp_region_type ort = ORT_WORKSHARE;
9788 switch (TREE_CODE (expr))
9790 case OACC_ENTER_DATA:
9791 case OACC_EXIT_DATA:
9792 kind = GF_OMP_TARGET_KIND_OACC_ENTER_EXIT_DATA;
9793 ort = ORT_ACC;
9794 break;
9795 case OACC_UPDATE:
9796 kind = GF_OMP_TARGET_KIND_OACC_UPDATE;
9797 ort = ORT_ACC;
9798 break;
9799 case OMP_TARGET_UPDATE:
9800 kind = GF_OMP_TARGET_KIND_UPDATE;
9801 break;
9802 case OMP_TARGET_ENTER_DATA:
9803 kind = GF_OMP_TARGET_KIND_ENTER_DATA;
9804 break;
9805 case OMP_TARGET_EXIT_DATA:
9806 kind = GF_OMP_TARGET_KIND_EXIT_DATA;
9807 break;
9808 default:
9809 gcc_unreachable ();
9811 gimplify_scan_omp_clauses (&OMP_STANDALONE_CLAUSES (expr), pre_p,
9812 ort, TREE_CODE (expr));
9813 gimplify_adjust_omp_clauses (pre_p, NULL, &OMP_STANDALONE_CLAUSES (expr),
9814 TREE_CODE (expr));
9815 stmt = gimple_build_omp_target (NULL, kind, OMP_STANDALONE_CLAUSES (expr));
9817 gimplify_seq_add_stmt (pre_p, stmt);
9818 *expr_p = NULL_TREE;
9821 /* A subroutine of gimplify_omp_atomic. The front end is supposed to have
9822 stabilized the lhs of the atomic operation as *ADDR. Return true if
9823 EXPR is this stabilized form. */
9825 static bool
9826 goa_lhs_expr_p (tree expr, tree addr)
9828 /* Also include casts to other type variants. The C front end is fond
9829 of adding these for e.g. volatile variables. This is like
9830 STRIP_TYPE_NOPS but includes the main variant lookup. */
9831 STRIP_USELESS_TYPE_CONVERSION (expr);
9833 if (TREE_CODE (expr) == INDIRECT_REF)
9835 expr = TREE_OPERAND (expr, 0);
9836 while (expr != addr
9837 && (CONVERT_EXPR_P (expr)
9838 || TREE_CODE (expr) == NON_LVALUE_EXPR)
9839 && TREE_CODE (expr) == TREE_CODE (addr)
9840 && types_compatible_p (TREE_TYPE (expr), TREE_TYPE (addr)))
9842 expr = TREE_OPERAND (expr, 0);
9843 addr = TREE_OPERAND (addr, 0);
9845 if (expr == addr)
9846 return true;
9847 return (TREE_CODE (addr) == ADDR_EXPR
9848 && TREE_CODE (expr) == ADDR_EXPR
9849 && TREE_OPERAND (addr, 0) == TREE_OPERAND (expr, 0));
9851 if (TREE_CODE (addr) == ADDR_EXPR && expr == TREE_OPERAND (addr, 0))
9852 return true;
9853 return false;
9856 /* Walk *EXPR_P and replace appearances of *LHS_ADDR with LHS_VAR. If an
9857 expression does not involve the lhs, evaluate it into a temporary.
9858 Return 1 if the lhs appeared as a subexpression, 0 if it did not,
9859 or -1 if an error was encountered. */
9861 static int
9862 goa_stabilize_expr (tree *expr_p, gimple_seq *pre_p, tree lhs_addr,
9863 tree lhs_var)
9865 tree expr = *expr_p;
9866 int saw_lhs;
9868 if (goa_lhs_expr_p (expr, lhs_addr))
9870 *expr_p = lhs_var;
9871 return 1;
9873 if (is_gimple_val (expr))
9874 return 0;
9876 saw_lhs = 0;
9877 switch (TREE_CODE_CLASS (TREE_CODE (expr)))
9879 case tcc_binary:
9880 case tcc_comparison:
9881 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 1), pre_p, lhs_addr,
9882 lhs_var);
9883 case tcc_unary:
9884 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 0), pre_p, lhs_addr,
9885 lhs_var);
9886 break;
9887 case tcc_expression:
9888 switch (TREE_CODE (expr))
9890 case TRUTH_ANDIF_EXPR:
9891 case TRUTH_ORIF_EXPR:
9892 case TRUTH_AND_EXPR:
9893 case TRUTH_OR_EXPR:
9894 case TRUTH_XOR_EXPR:
9895 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 1), pre_p,
9896 lhs_addr, lhs_var);
9897 case TRUTH_NOT_EXPR:
9898 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 0), pre_p,
9899 lhs_addr, lhs_var);
9900 break;
9901 case COMPOUND_EXPR:
9902 /* Break out any preevaluations from cp_build_modify_expr. */
9903 for (; TREE_CODE (expr) == COMPOUND_EXPR;
9904 expr = TREE_OPERAND (expr, 1))
9905 gimplify_stmt (&TREE_OPERAND (expr, 0), pre_p);
9906 *expr_p = expr;
9907 return goa_stabilize_expr (expr_p, pre_p, lhs_addr, lhs_var);
9908 default:
9909 break;
9911 break;
9912 default:
9913 break;
9916 if (saw_lhs == 0)
9918 enum gimplify_status gs;
9919 gs = gimplify_expr (expr_p, pre_p, NULL, is_gimple_val, fb_rvalue);
9920 if (gs != GS_ALL_DONE)
9921 saw_lhs = -1;
9924 return saw_lhs;
9927 /* Gimplify an OMP_ATOMIC statement. */
9929 static enum gimplify_status
9930 gimplify_omp_atomic (tree *expr_p, gimple_seq *pre_p)
9932 tree addr = TREE_OPERAND (*expr_p, 0);
9933 tree rhs = TREE_CODE (*expr_p) == OMP_ATOMIC_READ
9934 ? NULL : TREE_OPERAND (*expr_p, 1);
9935 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (addr)));
9936 tree tmp_load;
9937 gomp_atomic_load *loadstmt;
9938 gomp_atomic_store *storestmt;
9940 tmp_load = create_tmp_reg (type);
9941 if (rhs && goa_stabilize_expr (&rhs, pre_p, addr, tmp_load) < 0)
9942 return GS_ERROR;
9944 if (gimplify_expr (&addr, pre_p, NULL, is_gimple_val, fb_rvalue)
9945 != GS_ALL_DONE)
9946 return GS_ERROR;
9948 loadstmt = gimple_build_omp_atomic_load (tmp_load, addr);
9949 gimplify_seq_add_stmt (pre_p, loadstmt);
9950 if (rhs && gimplify_expr (&rhs, pre_p, NULL, is_gimple_val, fb_rvalue)
9951 != GS_ALL_DONE)
9952 return GS_ERROR;
9954 if (TREE_CODE (*expr_p) == OMP_ATOMIC_READ)
9955 rhs = tmp_load;
9956 storestmt = gimple_build_omp_atomic_store (rhs);
9957 gimplify_seq_add_stmt (pre_p, storestmt);
9958 if (OMP_ATOMIC_SEQ_CST (*expr_p))
9960 gimple_omp_atomic_set_seq_cst (loadstmt);
9961 gimple_omp_atomic_set_seq_cst (storestmt);
9963 switch (TREE_CODE (*expr_p))
9965 case OMP_ATOMIC_READ:
9966 case OMP_ATOMIC_CAPTURE_OLD:
9967 *expr_p = tmp_load;
9968 gimple_omp_atomic_set_need_value (loadstmt);
9969 break;
9970 case OMP_ATOMIC_CAPTURE_NEW:
9971 *expr_p = rhs;
9972 gimple_omp_atomic_set_need_value (storestmt);
9973 break;
9974 default:
9975 *expr_p = NULL;
9976 break;
9979 return GS_ALL_DONE;
9982 /* Gimplify a TRANSACTION_EXPR. This involves gimplification of the
9983 body, and adding some EH bits. */
9985 static enum gimplify_status
9986 gimplify_transaction (tree *expr_p, gimple_seq *pre_p)
9988 tree expr = *expr_p, temp, tbody = TRANSACTION_EXPR_BODY (expr);
9989 gimple *body_stmt;
9990 gtransaction *trans_stmt;
9991 gimple_seq body = NULL;
9992 int subcode = 0;
9994 /* Wrap the transaction body in a BIND_EXPR so we have a context
9995 where to put decls for OMP. */
9996 if (TREE_CODE (tbody) != BIND_EXPR)
9998 tree bind = build3 (BIND_EXPR, void_type_node, NULL, tbody, NULL);
9999 TREE_SIDE_EFFECTS (bind) = 1;
10000 SET_EXPR_LOCATION (bind, EXPR_LOCATION (tbody));
10001 TRANSACTION_EXPR_BODY (expr) = bind;
10004 push_gimplify_context ();
10005 temp = voidify_wrapper_expr (*expr_p, NULL);
10007 body_stmt = gimplify_and_return_first (TRANSACTION_EXPR_BODY (expr), &body);
10008 pop_gimplify_context (body_stmt);
10010 trans_stmt = gimple_build_transaction (body);
10011 if (TRANSACTION_EXPR_OUTER (expr))
10012 subcode = GTMA_IS_OUTER;
10013 else if (TRANSACTION_EXPR_RELAXED (expr))
10014 subcode = GTMA_IS_RELAXED;
10015 gimple_transaction_set_subcode (trans_stmt, subcode);
10017 gimplify_seq_add_stmt (pre_p, trans_stmt);
10019 if (temp)
10021 *expr_p = temp;
10022 return GS_OK;
10025 *expr_p = NULL_TREE;
10026 return GS_ALL_DONE;
10029 /* Gimplify an OMP_ORDERED construct. EXPR is the tree version. BODY
10030 is the OMP_BODY of the original EXPR (which has already been
10031 gimplified so it's not present in the EXPR).
10033 Return the gimplified GIMPLE_OMP_ORDERED tuple. */
10035 static gimple *
10036 gimplify_omp_ordered (tree expr, gimple_seq body)
10038 tree c, decls;
10039 int failures = 0;
10040 unsigned int i;
10041 tree source_c = NULL_TREE;
10042 tree sink_c = NULL_TREE;
10044 if (gimplify_omp_ctxp)
10046 for (c = OMP_ORDERED_CLAUSES (expr); c; c = OMP_CLAUSE_CHAIN (c))
10047 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_DEPEND
10048 && gimplify_omp_ctxp->loop_iter_var.is_empty ()
10049 && (OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SINK
10050 || OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SOURCE))
10052 error_at (OMP_CLAUSE_LOCATION (c),
10053 "%<ordered%> construct with %<depend%> clause must be "
10054 "closely nested inside a loop with %<ordered%> clause "
10055 "with a parameter");
10056 failures++;
10058 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_DEPEND
10059 && OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SINK)
10061 bool fail = false;
10062 for (decls = OMP_CLAUSE_DECL (c), i = 0;
10063 decls && TREE_CODE (decls) == TREE_LIST;
10064 decls = TREE_CHAIN (decls), ++i)
10065 if (i >= gimplify_omp_ctxp->loop_iter_var.length () / 2)
10066 continue;
10067 else if (TREE_VALUE (decls)
10068 != gimplify_omp_ctxp->loop_iter_var[2 * i])
10070 error_at (OMP_CLAUSE_LOCATION (c),
10071 "variable %qE is not an iteration "
10072 "of outermost loop %d, expected %qE",
10073 TREE_VALUE (decls), i + 1,
10074 gimplify_omp_ctxp->loop_iter_var[2 * i]);
10075 fail = true;
10076 failures++;
10078 else
10079 TREE_VALUE (decls)
10080 = gimplify_omp_ctxp->loop_iter_var[2 * i + 1];
10081 if (!fail && i != gimplify_omp_ctxp->loop_iter_var.length () / 2)
10083 error_at (OMP_CLAUSE_LOCATION (c),
10084 "number of variables in %<depend(sink)%> "
10085 "clause does not match number of "
10086 "iteration variables");
10087 failures++;
10089 sink_c = c;
10091 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_DEPEND
10092 && OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SOURCE)
10094 if (source_c)
10096 error_at (OMP_CLAUSE_LOCATION (c),
10097 "more than one %<depend(source)%> clause on an "
10098 "%<ordered%> construct");
10099 failures++;
10101 else
10102 source_c = c;
10105 if (source_c && sink_c)
10107 error_at (OMP_CLAUSE_LOCATION (source_c),
10108 "%<depend(source)%> clause specified together with "
10109 "%<depend(sink:)%> clauses on the same construct");
10110 failures++;
10113 if (failures)
10114 return gimple_build_nop ();
10115 return gimple_build_omp_ordered (body, OMP_ORDERED_CLAUSES (expr));
10118 /* Convert the GENERIC expression tree *EXPR_P to GIMPLE. If the
10119 expression produces a value to be used as an operand inside a GIMPLE
10120 statement, the value will be stored back in *EXPR_P. This value will
10121 be a tree of class tcc_declaration, tcc_constant, tcc_reference or
10122 an SSA_NAME. The corresponding sequence of GIMPLE statements is
10123 emitted in PRE_P and POST_P.
10125 Additionally, this process may overwrite parts of the input
10126 expression during gimplification. Ideally, it should be
10127 possible to do non-destructive gimplification.
10129 EXPR_P points to the GENERIC expression to convert to GIMPLE. If
10130 the expression needs to evaluate to a value to be used as
10131 an operand in a GIMPLE statement, this value will be stored in
10132 *EXPR_P on exit. This happens when the caller specifies one
10133 of fb_lvalue or fb_rvalue fallback flags.
10135 PRE_P will contain the sequence of GIMPLE statements corresponding
10136 to the evaluation of EXPR and all the side-effects that must
10137 be executed before the main expression. On exit, the last
10138 statement of PRE_P is the core statement being gimplified. For
10139 instance, when gimplifying 'if (++a)' the last statement in
10140 PRE_P will be 'if (t.1)' where t.1 is the result of
10141 pre-incrementing 'a'.
10143 POST_P will contain the sequence of GIMPLE statements corresponding
10144 to the evaluation of all the side-effects that must be executed
10145 after the main expression. If this is NULL, the post
10146 side-effects are stored at the end of PRE_P.
10148 The reason why the output is split in two is to handle post
10149 side-effects explicitly. In some cases, an expression may have
10150 inner and outer post side-effects which need to be emitted in
10151 an order different from the one given by the recursive
10152 traversal. For instance, for the expression (*p--)++ the post
10153 side-effects of '--' must actually occur *after* the post
10154 side-effects of '++'. However, gimplification will first visit
10155 the inner expression, so if a separate POST sequence was not
10156 used, the resulting sequence would be:
10158 1 t.1 = *p
10159 2 p = p - 1
10160 3 t.2 = t.1 + 1
10161 4 *p = t.2
10163 However, the post-decrement operation in line #2 must not be
10164 evaluated until after the store to *p at line #4, so the
10165 correct sequence should be:
10167 1 t.1 = *p
10168 2 t.2 = t.1 + 1
10169 3 *p = t.2
10170 4 p = p - 1
10172 So, by specifying a separate post queue, it is possible
10173 to emit the post side-effects in the correct order.
10174 If POST_P is NULL, an internal queue will be used. Before
10175 returning to the caller, the sequence POST_P is appended to
10176 the main output sequence PRE_P.
10178 GIMPLE_TEST_F points to a function that takes a tree T and
10179 returns nonzero if T is in the GIMPLE form requested by the
10180 caller. The GIMPLE predicates are in gimple.c.
10182 FALLBACK tells the function what sort of a temporary we want if
10183 gimplification cannot produce an expression that complies with
10184 GIMPLE_TEST_F.
10186 fb_none means that no temporary should be generated
10187 fb_rvalue means that an rvalue is OK to generate
10188 fb_lvalue means that an lvalue is OK to generate
10189 fb_either means that either is OK, but an lvalue is preferable.
10190 fb_mayfail means that gimplification may fail (in which case
10191 GS_ERROR will be returned)
10193 The return value is either GS_ERROR or GS_ALL_DONE, since this
10194 function iterates until EXPR is completely gimplified or an error
10195 occurs. */
10197 enum gimplify_status
10198 gimplify_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
10199 bool (*gimple_test_f) (tree), fallback_t fallback)
10201 tree tmp;
10202 gimple_seq internal_pre = NULL;
10203 gimple_seq internal_post = NULL;
10204 tree save_expr;
10205 bool is_statement;
10206 location_t saved_location;
10207 enum gimplify_status ret;
10208 gimple_stmt_iterator pre_last_gsi, post_last_gsi;
10210 save_expr = *expr_p;
10211 if (save_expr == NULL_TREE)
10212 return GS_ALL_DONE;
10214 /* If we are gimplifying a top-level statement, PRE_P must be valid. */
10215 is_statement = gimple_test_f == is_gimple_stmt;
10216 if (is_statement)
10217 gcc_assert (pre_p);
10219 /* Consistency checks. */
10220 if (gimple_test_f == is_gimple_reg)
10221 gcc_assert (fallback & (fb_rvalue | fb_lvalue));
10222 else if (gimple_test_f == is_gimple_val
10223 || gimple_test_f == is_gimple_call_addr
10224 || gimple_test_f == is_gimple_condexpr
10225 || gimple_test_f == is_gimple_mem_rhs
10226 || gimple_test_f == is_gimple_mem_rhs_or_call
10227 || gimple_test_f == is_gimple_reg_rhs
10228 || gimple_test_f == is_gimple_reg_rhs_or_call
10229 || gimple_test_f == is_gimple_asm_val
10230 || gimple_test_f == is_gimple_mem_ref_addr)
10231 gcc_assert (fallback & fb_rvalue);
10232 else if (gimple_test_f == is_gimple_min_lval
10233 || gimple_test_f == is_gimple_lvalue)
10234 gcc_assert (fallback & fb_lvalue);
10235 else if (gimple_test_f == is_gimple_addressable)
10236 gcc_assert (fallback & fb_either);
10237 else if (gimple_test_f == is_gimple_stmt)
10238 gcc_assert (fallback == fb_none);
10239 else
10241 /* We should have recognized the GIMPLE_TEST_F predicate to
10242 know what kind of fallback to use in case a temporary is
10243 needed to hold the value or address of *EXPR_P. */
10244 gcc_unreachable ();
10247 /* We used to check the predicate here and return immediately if it
10248 succeeds. This is wrong; the design is for gimplification to be
10249 idempotent, and for the predicates to only test for valid forms, not
10250 whether they are fully simplified. */
10251 if (pre_p == NULL)
10252 pre_p = &internal_pre;
10254 if (post_p == NULL)
10255 post_p = &internal_post;
10257 /* Remember the last statements added to PRE_P and POST_P. Every
10258 new statement added by the gimplification helpers needs to be
10259 annotated with location information. To centralize the
10260 responsibility, we remember the last statement that had been
10261 added to both queues before gimplifying *EXPR_P. If
10262 gimplification produces new statements in PRE_P and POST_P, those
10263 statements will be annotated with the same location information
10264 as *EXPR_P. */
10265 pre_last_gsi = gsi_last (*pre_p);
10266 post_last_gsi = gsi_last (*post_p);
10268 saved_location = input_location;
10269 if (save_expr != error_mark_node
10270 && EXPR_HAS_LOCATION (*expr_p))
10271 input_location = EXPR_LOCATION (*expr_p);
10273 /* Loop over the specific gimplifiers until the toplevel node
10274 remains the same. */
10277 /* Strip away as many useless type conversions as possible
10278 at the toplevel. */
10279 STRIP_USELESS_TYPE_CONVERSION (*expr_p);
10281 /* Remember the expr. */
10282 save_expr = *expr_p;
10284 /* Die, die, die, my darling. */
10285 if (save_expr == error_mark_node
10286 || (TREE_TYPE (save_expr)
10287 && TREE_TYPE (save_expr) == error_mark_node))
10289 ret = GS_ERROR;
10290 break;
10293 /* Do any language-specific gimplification. */
10294 ret = ((enum gimplify_status)
10295 lang_hooks.gimplify_expr (expr_p, pre_p, post_p));
10296 if (ret == GS_OK)
10298 if (*expr_p == NULL_TREE)
10299 break;
10300 if (*expr_p != save_expr)
10301 continue;
10303 else if (ret != GS_UNHANDLED)
10304 break;
10306 /* Make sure that all the cases set 'ret' appropriately. */
10307 ret = GS_UNHANDLED;
10308 switch (TREE_CODE (*expr_p))
10310 /* First deal with the special cases. */
10312 case POSTINCREMENT_EXPR:
10313 case POSTDECREMENT_EXPR:
10314 case PREINCREMENT_EXPR:
10315 case PREDECREMENT_EXPR:
10316 ret = gimplify_self_mod_expr (expr_p, pre_p, post_p,
10317 fallback != fb_none,
10318 TREE_TYPE (*expr_p));
10319 break;
10321 case VIEW_CONVERT_EXPR:
10322 if (is_gimple_reg_type (TREE_TYPE (*expr_p))
10323 && is_gimple_reg_type (TREE_TYPE (TREE_OPERAND (*expr_p, 0))))
10325 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
10326 post_p, is_gimple_val, fb_rvalue);
10327 recalculate_side_effects (*expr_p);
10328 break;
10330 /* Fallthru. */
10332 case ARRAY_REF:
10333 case ARRAY_RANGE_REF:
10334 case REALPART_EXPR:
10335 case IMAGPART_EXPR:
10336 case COMPONENT_REF:
10337 ret = gimplify_compound_lval (expr_p, pre_p, post_p,
10338 fallback ? fallback : fb_rvalue);
10339 break;
10341 case COND_EXPR:
10342 ret = gimplify_cond_expr (expr_p, pre_p, fallback);
10344 /* C99 code may assign to an array in a structure value of a
10345 conditional expression, and this has undefined behavior
10346 only on execution, so create a temporary if an lvalue is
10347 required. */
10348 if (fallback == fb_lvalue)
10350 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
10351 mark_addressable (*expr_p);
10352 ret = GS_OK;
10354 break;
10356 case CALL_EXPR:
10357 ret = gimplify_call_expr (expr_p, pre_p, fallback != fb_none);
10359 /* C99 code may assign to an array in a structure returned
10360 from a function, and this has undefined behavior only on
10361 execution, so create a temporary if an lvalue is
10362 required. */
10363 if (fallback == fb_lvalue)
10365 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
10366 mark_addressable (*expr_p);
10367 ret = GS_OK;
10369 break;
10371 case TREE_LIST:
10372 gcc_unreachable ();
10374 case COMPOUND_EXPR:
10375 ret = gimplify_compound_expr (expr_p, pre_p, fallback != fb_none);
10376 break;
10378 case COMPOUND_LITERAL_EXPR:
10379 ret = gimplify_compound_literal_expr (expr_p, pre_p,
10380 gimple_test_f, fallback);
10381 break;
10383 case MODIFY_EXPR:
10384 case INIT_EXPR:
10385 ret = gimplify_modify_expr (expr_p, pre_p, post_p,
10386 fallback != fb_none);
10387 break;
10389 case TRUTH_ANDIF_EXPR:
10390 case TRUTH_ORIF_EXPR:
10392 /* Preserve the original type of the expression and the
10393 source location of the outer expression. */
10394 tree org_type = TREE_TYPE (*expr_p);
10395 *expr_p = gimple_boolify (*expr_p);
10396 *expr_p = build3_loc (input_location, COND_EXPR,
10397 org_type, *expr_p,
10398 fold_convert_loc
10399 (input_location,
10400 org_type, boolean_true_node),
10401 fold_convert_loc
10402 (input_location,
10403 org_type, boolean_false_node));
10404 ret = GS_OK;
10405 break;
10408 case TRUTH_NOT_EXPR:
10410 tree type = TREE_TYPE (*expr_p);
10411 /* The parsers are careful to generate TRUTH_NOT_EXPR
10412 only with operands that are always zero or one.
10413 We do not fold here but handle the only interesting case
10414 manually, as fold may re-introduce the TRUTH_NOT_EXPR. */
10415 *expr_p = gimple_boolify (*expr_p);
10416 if (TYPE_PRECISION (TREE_TYPE (*expr_p)) == 1)
10417 *expr_p = build1_loc (input_location, BIT_NOT_EXPR,
10418 TREE_TYPE (*expr_p),
10419 TREE_OPERAND (*expr_p, 0));
10420 else
10421 *expr_p = build2_loc (input_location, BIT_XOR_EXPR,
10422 TREE_TYPE (*expr_p),
10423 TREE_OPERAND (*expr_p, 0),
10424 build_int_cst (TREE_TYPE (*expr_p), 1));
10425 if (!useless_type_conversion_p (type, TREE_TYPE (*expr_p)))
10426 *expr_p = fold_convert_loc (input_location, type, *expr_p);
10427 ret = GS_OK;
10428 break;
10431 case ADDR_EXPR:
10432 ret = gimplify_addr_expr (expr_p, pre_p, post_p);
10433 break;
10435 case ANNOTATE_EXPR:
10437 tree cond = TREE_OPERAND (*expr_p, 0);
10438 tree kind = TREE_OPERAND (*expr_p, 1);
10439 tree type = TREE_TYPE (cond);
10440 if (!INTEGRAL_TYPE_P (type))
10442 *expr_p = cond;
10443 ret = GS_OK;
10444 break;
10446 tree tmp = create_tmp_var (type);
10447 gimplify_arg (&cond, pre_p, EXPR_LOCATION (*expr_p));
10448 gcall *call
10449 = gimple_build_call_internal (IFN_ANNOTATE, 2, cond, kind);
10450 gimple_call_set_lhs (call, tmp);
10451 gimplify_seq_add_stmt (pre_p, call);
10452 *expr_p = tmp;
10453 ret = GS_ALL_DONE;
10454 break;
10457 case VA_ARG_EXPR:
10458 ret = gimplify_va_arg_expr (expr_p, pre_p, post_p);
10459 break;
10461 CASE_CONVERT:
10462 if (IS_EMPTY_STMT (*expr_p))
10464 ret = GS_ALL_DONE;
10465 break;
10468 if (VOID_TYPE_P (TREE_TYPE (*expr_p))
10469 || fallback == fb_none)
10471 /* Just strip a conversion to void (or in void context) and
10472 try again. */
10473 *expr_p = TREE_OPERAND (*expr_p, 0);
10474 ret = GS_OK;
10475 break;
10478 ret = gimplify_conversion (expr_p);
10479 if (ret == GS_ERROR)
10480 break;
10481 if (*expr_p != save_expr)
10482 break;
10483 /* FALLTHRU */
10485 case FIX_TRUNC_EXPR:
10486 /* unary_expr: ... | '(' cast ')' val | ... */
10487 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
10488 is_gimple_val, fb_rvalue);
10489 recalculate_side_effects (*expr_p);
10490 break;
10492 case INDIRECT_REF:
10494 bool volatilep = TREE_THIS_VOLATILE (*expr_p);
10495 bool notrap = TREE_THIS_NOTRAP (*expr_p);
10496 tree saved_ptr_type = TREE_TYPE (TREE_OPERAND (*expr_p, 0));
10498 *expr_p = fold_indirect_ref_loc (input_location, *expr_p);
10499 if (*expr_p != save_expr)
10501 ret = GS_OK;
10502 break;
10505 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
10506 is_gimple_reg, fb_rvalue);
10507 if (ret == GS_ERROR)
10508 break;
10510 recalculate_side_effects (*expr_p);
10511 *expr_p = fold_build2_loc (input_location, MEM_REF,
10512 TREE_TYPE (*expr_p),
10513 TREE_OPERAND (*expr_p, 0),
10514 build_int_cst (saved_ptr_type, 0));
10515 TREE_THIS_VOLATILE (*expr_p) = volatilep;
10516 TREE_THIS_NOTRAP (*expr_p) = notrap;
10517 ret = GS_OK;
10518 break;
10521 /* We arrive here through the various re-gimplifcation paths. */
10522 case MEM_REF:
10523 /* First try re-folding the whole thing. */
10524 tmp = fold_binary (MEM_REF, TREE_TYPE (*expr_p),
10525 TREE_OPERAND (*expr_p, 0),
10526 TREE_OPERAND (*expr_p, 1));
10527 if (tmp)
10529 REF_REVERSE_STORAGE_ORDER (tmp)
10530 = REF_REVERSE_STORAGE_ORDER (*expr_p);
10531 *expr_p = tmp;
10532 recalculate_side_effects (*expr_p);
10533 ret = GS_OK;
10534 break;
10536 /* Avoid re-gimplifying the address operand if it is already
10537 in suitable form. Re-gimplifying would mark the address
10538 operand addressable. Always gimplify when not in SSA form
10539 as we still may have to gimplify decls with value-exprs. */
10540 if (!gimplify_ctxp || !gimplify_ctxp->into_ssa
10541 || !is_gimple_mem_ref_addr (TREE_OPERAND (*expr_p, 0)))
10543 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
10544 is_gimple_mem_ref_addr, fb_rvalue);
10545 if (ret == GS_ERROR)
10546 break;
10548 recalculate_side_effects (*expr_p);
10549 ret = GS_ALL_DONE;
10550 break;
10552 /* Constants need not be gimplified. */
10553 case INTEGER_CST:
10554 case REAL_CST:
10555 case FIXED_CST:
10556 case STRING_CST:
10557 case COMPLEX_CST:
10558 case VECTOR_CST:
10559 /* Drop the overflow flag on constants, we do not want
10560 that in the GIMPLE IL. */
10561 if (TREE_OVERFLOW_P (*expr_p))
10562 *expr_p = drop_tree_overflow (*expr_p);
10563 ret = GS_ALL_DONE;
10564 break;
10566 case CONST_DECL:
10567 /* If we require an lvalue, such as for ADDR_EXPR, retain the
10568 CONST_DECL node. Otherwise the decl is replaceable by its
10569 value. */
10570 /* ??? Should be == fb_lvalue, but ADDR_EXPR passes fb_either. */
10571 if (fallback & fb_lvalue)
10572 ret = GS_ALL_DONE;
10573 else
10575 *expr_p = DECL_INITIAL (*expr_p);
10576 ret = GS_OK;
10578 break;
10580 case DECL_EXPR:
10581 ret = gimplify_decl_expr (expr_p, pre_p);
10582 break;
10584 case BIND_EXPR:
10585 ret = gimplify_bind_expr (expr_p, pre_p);
10586 break;
10588 case LOOP_EXPR:
10589 ret = gimplify_loop_expr (expr_p, pre_p);
10590 break;
10592 case SWITCH_EXPR:
10593 ret = gimplify_switch_expr (expr_p, pre_p);
10594 break;
10596 case EXIT_EXPR:
10597 ret = gimplify_exit_expr (expr_p);
10598 break;
10600 case GOTO_EXPR:
10601 /* If the target is not LABEL, then it is a computed jump
10602 and the target needs to be gimplified. */
10603 if (TREE_CODE (GOTO_DESTINATION (*expr_p)) != LABEL_DECL)
10605 ret = gimplify_expr (&GOTO_DESTINATION (*expr_p), pre_p,
10606 NULL, is_gimple_val, fb_rvalue);
10607 if (ret == GS_ERROR)
10608 break;
10610 gimplify_seq_add_stmt (pre_p,
10611 gimple_build_goto (GOTO_DESTINATION (*expr_p)));
10612 ret = GS_ALL_DONE;
10613 break;
10615 case PREDICT_EXPR:
10616 gimplify_seq_add_stmt (pre_p,
10617 gimple_build_predict (PREDICT_EXPR_PREDICTOR (*expr_p),
10618 PREDICT_EXPR_OUTCOME (*expr_p)));
10619 ret = GS_ALL_DONE;
10620 break;
10622 case LABEL_EXPR:
10623 ret = GS_ALL_DONE;
10624 gcc_assert (decl_function_context (LABEL_EXPR_LABEL (*expr_p))
10625 == current_function_decl);
10626 gimplify_seq_add_stmt (pre_p,
10627 gimple_build_label (LABEL_EXPR_LABEL (*expr_p)));
10628 break;
10630 case CASE_LABEL_EXPR:
10631 ret = gimplify_case_label_expr (expr_p, pre_p);
10632 break;
10634 case RETURN_EXPR:
10635 ret = gimplify_return_expr (*expr_p, pre_p);
10636 break;
10638 case CONSTRUCTOR:
10639 /* Don't reduce this in place; let gimplify_init_constructor work its
10640 magic. Buf if we're just elaborating this for side effects, just
10641 gimplify any element that has side-effects. */
10642 if (fallback == fb_none)
10644 unsigned HOST_WIDE_INT ix;
10645 tree val;
10646 tree temp = NULL_TREE;
10647 FOR_EACH_CONSTRUCTOR_VALUE (CONSTRUCTOR_ELTS (*expr_p), ix, val)
10648 if (TREE_SIDE_EFFECTS (val))
10649 append_to_statement_list (val, &temp);
10651 *expr_p = temp;
10652 ret = temp ? GS_OK : GS_ALL_DONE;
10654 /* C99 code may assign to an array in a constructed
10655 structure or union, and this has undefined behavior only
10656 on execution, so create a temporary if an lvalue is
10657 required. */
10658 else if (fallback == fb_lvalue)
10660 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
10661 mark_addressable (*expr_p);
10662 ret = GS_OK;
10664 else
10665 ret = GS_ALL_DONE;
10666 break;
10668 /* The following are special cases that are not handled by the
10669 original GIMPLE grammar. */
10671 /* SAVE_EXPR nodes are converted into a GIMPLE identifier and
10672 eliminated. */
10673 case SAVE_EXPR:
10674 ret = gimplify_save_expr (expr_p, pre_p, post_p);
10675 break;
10677 case BIT_FIELD_REF:
10678 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
10679 post_p, is_gimple_lvalue, fb_either);
10680 recalculate_side_effects (*expr_p);
10681 break;
10683 case TARGET_MEM_REF:
10685 enum gimplify_status r0 = GS_ALL_DONE, r1 = GS_ALL_DONE;
10687 if (TMR_BASE (*expr_p))
10688 r0 = gimplify_expr (&TMR_BASE (*expr_p), pre_p,
10689 post_p, is_gimple_mem_ref_addr, fb_either);
10690 if (TMR_INDEX (*expr_p))
10691 r1 = gimplify_expr (&TMR_INDEX (*expr_p), pre_p,
10692 post_p, is_gimple_val, fb_rvalue);
10693 if (TMR_INDEX2 (*expr_p))
10694 r1 = gimplify_expr (&TMR_INDEX2 (*expr_p), pre_p,
10695 post_p, is_gimple_val, fb_rvalue);
10696 /* TMR_STEP and TMR_OFFSET are always integer constants. */
10697 ret = MIN (r0, r1);
10699 break;
10701 case NON_LVALUE_EXPR:
10702 /* This should have been stripped above. */
10703 gcc_unreachable ();
10705 case ASM_EXPR:
10706 ret = gimplify_asm_expr (expr_p, pre_p, post_p);
10707 break;
10709 case TRY_FINALLY_EXPR:
10710 case TRY_CATCH_EXPR:
10712 gimple_seq eval, cleanup;
10713 gtry *try_;
10715 /* Calls to destructors are generated automatically in FINALLY/CATCH
10716 block. They should have location as UNKNOWN_LOCATION. However,
10717 gimplify_call_expr will reset these call stmts to input_location
10718 if it finds stmt's location is unknown. To prevent resetting for
10719 destructors, we set the input_location to unknown.
10720 Note that this only affects the destructor calls in FINALLY/CATCH
10721 block, and will automatically reset to its original value by the
10722 end of gimplify_expr. */
10723 input_location = UNKNOWN_LOCATION;
10724 eval = cleanup = NULL;
10725 gimplify_and_add (TREE_OPERAND (*expr_p, 0), &eval);
10726 gimplify_and_add (TREE_OPERAND (*expr_p, 1), &cleanup);
10727 /* Don't create bogus GIMPLE_TRY with empty cleanup. */
10728 if (gimple_seq_empty_p (cleanup))
10730 gimple_seq_add_seq (pre_p, eval);
10731 ret = GS_ALL_DONE;
10732 break;
10734 try_ = gimple_build_try (eval, cleanup,
10735 TREE_CODE (*expr_p) == TRY_FINALLY_EXPR
10736 ? GIMPLE_TRY_FINALLY
10737 : GIMPLE_TRY_CATCH);
10738 if (EXPR_HAS_LOCATION (save_expr))
10739 gimple_set_location (try_, EXPR_LOCATION (save_expr));
10740 else if (LOCATION_LOCUS (saved_location) != UNKNOWN_LOCATION)
10741 gimple_set_location (try_, saved_location);
10742 if (TREE_CODE (*expr_p) == TRY_CATCH_EXPR)
10743 gimple_try_set_catch_is_cleanup (try_,
10744 TRY_CATCH_IS_CLEANUP (*expr_p));
10745 gimplify_seq_add_stmt (pre_p, try_);
10746 ret = GS_ALL_DONE;
10747 break;
10750 case CLEANUP_POINT_EXPR:
10751 ret = gimplify_cleanup_point_expr (expr_p, pre_p);
10752 break;
10754 case TARGET_EXPR:
10755 ret = gimplify_target_expr (expr_p, pre_p, post_p);
10756 break;
10758 case CATCH_EXPR:
10760 gimple *c;
10761 gimple_seq handler = NULL;
10762 gimplify_and_add (CATCH_BODY (*expr_p), &handler);
10763 c = gimple_build_catch (CATCH_TYPES (*expr_p), handler);
10764 gimplify_seq_add_stmt (pre_p, c);
10765 ret = GS_ALL_DONE;
10766 break;
10769 case EH_FILTER_EXPR:
10771 gimple *ehf;
10772 gimple_seq failure = NULL;
10774 gimplify_and_add (EH_FILTER_FAILURE (*expr_p), &failure);
10775 ehf = gimple_build_eh_filter (EH_FILTER_TYPES (*expr_p), failure);
10776 gimple_set_no_warning (ehf, TREE_NO_WARNING (*expr_p));
10777 gimplify_seq_add_stmt (pre_p, ehf);
10778 ret = GS_ALL_DONE;
10779 break;
10782 case OBJ_TYPE_REF:
10784 enum gimplify_status r0, r1;
10785 r0 = gimplify_expr (&OBJ_TYPE_REF_OBJECT (*expr_p), pre_p,
10786 post_p, is_gimple_val, fb_rvalue);
10787 r1 = gimplify_expr (&OBJ_TYPE_REF_EXPR (*expr_p), pre_p,
10788 post_p, is_gimple_val, fb_rvalue);
10789 TREE_SIDE_EFFECTS (*expr_p) = 0;
10790 ret = MIN (r0, r1);
10792 break;
10794 case LABEL_DECL:
10795 /* We get here when taking the address of a label. We mark
10796 the label as "forced"; meaning it can never be removed and
10797 it is a potential target for any computed goto. */
10798 FORCED_LABEL (*expr_p) = 1;
10799 ret = GS_ALL_DONE;
10800 break;
10802 case STATEMENT_LIST:
10803 ret = gimplify_statement_list (expr_p, pre_p);
10804 break;
10806 case WITH_SIZE_EXPR:
10808 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
10809 post_p == &internal_post ? NULL : post_p,
10810 gimple_test_f, fallback);
10811 gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
10812 is_gimple_val, fb_rvalue);
10813 ret = GS_ALL_DONE;
10815 break;
10817 case VAR_DECL:
10818 case PARM_DECL:
10819 ret = gimplify_var_or_parm_decl (expr_p);
10820 break;
10822 case RESULT_DECL:
10823 /* When within an OMP context, notice uses of variables. */
10824 if (gimplify_omp_ctxp)
10825 omp_notice_variable (gimplify_omp_ctxp, *expr_p, true);
10826 ret = GS_ALL_DONE;
10827 break;
10829 case SSA_NAME:
10830 /* Allow callbacks into the gimplifier during optimization. */
10831 ret = GS_ALL_DONE;
10832 break;
10834 case OMP_PARALLEL:
10835 gimplify_omp_parallel (expr_p, pre_p);
10836 ret = GS_ALL_DONE;
10837 break;
10839 case OMP_TASK:
10840 gimplify_omp_task (expr_p, pre_p);
10841 ret = GS_ALL_DONE;
10842 break;
10844 case OMP_FOR:
10845 case OMP_SIMD:
10846 case CILK_SIMD:
10847 case CILK_FOR:
10848 case OMP_DISTRIBUTE:
10849 case OMP_TASKLOOP:
10850 case OACC_LOOP:
10851 ret = gimplify_omp_for (expr_p, pre_p);
10852 break;
10854 case OACC_CACHE:
10855 gimplify_oacc_cache (expr_p, pre_p);
10856 ret = GS_ALL_DONE;
10857 break;
10859 case OACC_DECLARE:
10860 gimplify_oacc_declare (expr_p, pre_p);
10861 ret = GS_ALL_DONE;
10862 break;
10864 case OACC_HOST_DATA:
10865 case OACC_DATA:
10866 case OACC_KERNELS:
10867 case OACC_PARALLEL:
10868 case OMP_SECTIONS:
10869 case OMP_SINGLE:
10870 case OMP_TARGET:
10871 case OMP_TARGET_DATA:
10872 case OMP_TEAMS:
10873 gimplify_omp_workshare (expr_p, pre_p);
10874 ret = GS_ALL_DONE;
10875 break;
10877 case OACC_ENTER_DATA:
10878 case OACC_EXIT_DATA:
10879 case OACC_UPDATE:
10880 case OMP_TARGET_UPDATE:
10881 case OMP_TARGET_ENTER_DATA:
10882 case OMP_TARGET_EXIT_DATA:
10883 gimplify_omp_target_update (expr_p, pre_p);
10884 ret = GS_ALL_DONE;
10885 break;
10887 case OMP_SECTION:
10888 case OMP_MASTER:
10889 case OMP_TASKGROUP:
10890 case OMP_ORDERED:
10891 case OMP_CRITICAL:
10893 gimple_seq body = NULL;
10894 gimple *g;
10896 gimplify_and_add (OMP_BODY (*expr_p), &body);
10897 switch (TREE_CODE (*expr_p))
10899 case OMP_SECTION:
10900 g = gimple_build_omp_section (body);
10901 break;
10902 case OMP_MASTER:
10903 g = gimple_build_omp_master (body);
10904 break;
10905 case OMP_TASKGROUP:
10907 gimple_seq cleanup = NULL;
10908 tree fn
10909 = builtin_decl_explicit (BUILT_IN_GOMP_TASKGROUP_END);
10910 g = gimple_build_call (fn, 0);
10911 gimple_seq_add_stmt (&cleanup, g);
10912 g = gimple_build_try (body, cleanup, GIMPLE_TRY_FINALLY);
10913 body = NULL;
10914 gimple_seq_add_stmt (&body, g);
10915 g = gimple_build_omp_taskgroup (body);
10917 break;
10918 case OMP_ORDERED:
10919 g = gimplify_omp_ordered (*expr_p, body);
10920 break;
10921 case OMP_CRITICAL:
10922 gimplify_scan_omp_clauses (&OMP_CRITICAL_CLAUSES (*expr_p),
10923 pre_p, ORT_WORKSHARE, OMP_CRITICAL);
10924 gimplify_adjust_omp_clauses (pre_p, body,
10925 &OMP_CRITICAL_CLAUSES (*expr_p),
10926 OMP_CRITICAL);
10927 g = gimple_build_omp_critical (body,
10928 OMP_CRITICAL_NAME (*expr_p),
10929 OMP_CRITICAL_CLAUSES (*expr_p));
10930 break;
10931 default:
10932 gcc_unreachable ();
10934 gimplify_seq_add_stmt (pre_p, g);
10935 ret = GS_ALL_DONE;
10936 break;
10939 case OMP_ATOMIC:
10940 case OMP_ATOMIC_READ:
10941 case OMP_ATOMIC_CAPTURE_OLD:
10942 case OMP_ATOMIC_CAPTURE_NEW:
10943 ret = gimplify_omp_atomic (expr_p, pre_p);
10944 break;
10946 case TRANSACTION_EXPR:
10947 ret = gimplify_transaction (expr_p, pre_p);
10948 break;
10950 case TRUTH_AND_EXPR:
10951 case TRUTH_OR_EXPR:
10952 case TRUTH_XOR_EXPR:
10954 tree orig_type = TREE_TYPE (*expr_p);
10955 tree new_type, xop0, xop1;
10956 *expr_p = gimple_boolify (*expr_p);
10957 new_type = TREE_TYPE (*expr_p);
10958 if (!useless_type_conversion_p (orig_type, new_type))
10960 *expr_p = fold_convert_loc (input_location, orig_type, *expr_p);
10961 ret = GS_OK;
10962 break;
10965 /* Boolified binary truth expressions are semantically equivalent
10966 to bitwise binary expressions. Canonicalize them to the
10967 bitwise variant. */
10968 switch (TREE_CODE (*expr_p))
10970 case TRUTH_AND_EXPR:
10971 TREE_SET_CODE (*expr_p, BIT_AND_EXPR);
10972 break;
10973 case TRUTH_OR_EXPR:
10974 TREE_SET_CODE (*expr_p, BIT_IOR_EXPR);
10975 break;
10976 case TRUTH_XOR_EXPR:
10977 TREE_SET_CODE (*expr_p, BIT_XOR_EXPR);
10978 break;
10979 default:
10980 break;
10982 /* Now make sure that operands have compatible type to
10983 expression's new_type. */
10984 xop0 = TREE_OPERAND (*expr_p, 0);
10985 xop1 = TREE_OPERAND (*expr_p, 1);
10986 if (!useless_type_conversion_p (new_type, TREE_TYPE (xop0)))
10987 TREE_OPERAND (*expr_p, 0) = fold_convert_loc (input_location,
10988 new_type,
10989 xop0);
10990 if (!useless_type_conversion_p (new_type, TREE_TYPE (xop1)))
10991 TREE_OPERAND (*expr_p, 1) = fold_convert_loc (input_location,
10992 new_type,
10993 xop1);
10994 /* Continue classified as tcc_binary. */
10995 goto expr_2;
10998 case VEC_COND_EXPR:
11000 enum gimplify_status r0, r1, r2;
11002 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
11003 post_p, is_gimple_condexpr, fb_rvalue);
11004 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
11005 post_p, is_gimple_val, fb_rvalue);
11006 r2 = gimplify_expr (&TREE_OPERAND (*expr_p, 2), pre_p,
11007 post_p, is_gimple_val, fb_rvalue);
11009 ret = MIN (MIN (r0, r1), r2);
11010 recalculate_side_effects (*expr_p);
11012 break;
11014 case FMA_EXPR:
11015 case VEC_PERM_EXPR:
11016 /* Classified as tcc_expression. */
11017 goto expr_3;
11019 case POINTER_PLUS_EXPR:
11021 enum gimplify_status r0, r1;
11022 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
11023 post_p, is_gimple_val, fb_rvalue);
11024 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
11025 post_p, is_gimple_val, fb_rvalue);
11026 recalculate_side_effects (*expr_p);
11027 ret = MIN (r0, r1);
11028 break;
11031 case CILK_SYNC_STMT:
11033 if (!fn_contains_cilk_spawn_p (cfun))
11035 error_at (EXPR_LOCATION (*expr_p),
11036 "expected %<_Cilk_spawn%> before %<_Cilk_sync%>");
11037 ret = GS_ERROR;
11039 else
11041 gimplify_cilk_sync (expr_p, pre_p);
11042 ret = GS_ALL_DONE;
11044 break;
11047 default:
11048 switch (TREE_CODE_CLASS (TREE_CODE (*expr_p)))
11050 case tcc_comparison:
11051 /* Handle comparison of objects of non scalar mode aggregates
11052 with a call to memcmp. It would be nice to only have to do
11053 this for variable-sized objects, but then we'd have to allow
11054 the same nest of reference nodes we allow for MODIFY_EXPR and
11055 that's too complex.
11057 Compare scalar mode aggregates as scalar mode values. Using
11058 memcmp for them would be very inefficient at best, and is
11059 plain wrong if bitfields are involved. */
11061 tree type = TREE_TYPE (TREE_OPERAND (*expr_p, 1));
11063 /* Vector comparisons need no boolification. */
11064 if (TREE_CODE (type) == VECTOR_TYPE)
11065 goto expr_2;
11066 else if (!AGGREGATE_TYPE_P (type))
11068 tree org_type = TREE_TYPE (*expr_p);
11069 *expr_p = gimple_boolify (*expr_p);
11070 if (!useless_type_conversion_p (org_type,
11071 TREE_TYPE (*expr_p)))
11073 *expr_p = fold_convert_loc (input_location,
11074 org_type, *expr_p);
11075 ret = GS_OK;
11077 else
11078 goto expr_2;
11080 else if (TYPE_MODE (type) != BLKmode)
11081 ret = gimplify_scalar_mode_aggregate_compare (expr_p);
11082 else
11083 ret = gimplify_variable_sized_compare (expr_p);
11085 break;
11088 /* If *EXPR_P does not need to be special-cased, handle it
11089 according to its class. */
11090 case tcc_unary:
11091 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
11092 post_p, is_gimple_val, fb_rvalue);
11093 break;
11095 case tcc_binary:
11096 expr_2:
11098 enum gimplify_status r0, r1;
11100 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
11101 post_p, is_gimple_val, fb_rvalue);
11102 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
11103 post_p, is_gimple_val, fb_rvalue);
11105 ret = MIN (r0, r1);
11106 break;
11109 expr_3:
11111 enum gimplify_status r0, r1, r2;
11113 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
11114 post_p, is_gimple_val, fb_rvalue);
11115 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
11116 post_p, is_gimple_val, fb_rvalue);
11117 r2 = gimplify_expr (&TREE_OPERAND (*expr_p, 2), pre_p,
11118 post_p, is_gimple_val, fb_rvalue);
11120 ret = MIN (MIN (r0, r1), r2);
11121 break;
11124 case tcc_declaration:
11125 case tcc_constant:
11126 ret = GS_ALL_DONE;
11127 goto dont_recalculate;
11129 default:
11130 gcc_unreachable ();
11133 recalculate_side_effects (*expr_p);
11135 dont_recalculate:
11136 break;
11139 gcc_assert (*expr_p || ret != GS_OK);
11141 while (ret == GS_OK);
11143 /* If we encountered an error_mark somewhere nested inside, either
11144 stub out the statement or propagate the error back out. */
11145 if (ret == GS_ERROR)
11147 if (is_statement)
11148 *expr_p = NULL;
11149 goto out;
11152 /* This was only valid as a return value from the langhook, which
11153 we handled. Make sure it doesn't escape from any other context. */
11154 gcc_assert (ret != GS_UNHANDLED);
11156 if (fallback == fb_none && *expr_p && !is_gimple_stmt (*expr_p))
11158 /* We aren't looking for a value, and we don't have a valid
11159 statement. If it doesn't have side-effects, throw it away. */
11160 if (!TREE_SIDE_EFFECTS (*expr_p))
11161 *expr_p = NULL;
11162 else if (!TREE_THIS_VOLATILE (*expr_p))
11164 /* This is probably a _REF that contains something nested that
11165 has side effects. Recurse through the operands to find it. */
11166 enum tree_code code = TREE_CODE (*expr_p);
11168 switch (code)
11170 case COMPONENT_REF:
11171 case REALPART_EXPR:
11172 case IMAGPART_EXPR:
11173 case VIEW_CONVERT_EXPR:
11174 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
11175 gimple_test_f, fallback);
11176 break;
11178 case ARRAY_REF:
11179 case ARRAY_RANGE_REF:
11180 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
11181 gimple_test_f, fallback);
11182 gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
11183 gimple_test_f, fallback);
11184 break;
11186 default:
11187 /* Anything else with side-effects must be converted to
11188 a valid statement before we get here. */
11189 gcc_unreachable ();
11192 *expr_p = NULL;
11194 else if (COMPLETE_TYPE_P (TREE_TYPE (*expr_p))
11195 && TYPE_MODE (TREE_TYPE (*expr_p)) != BLKmode)
11197 /* Historically, the compiler has treated a bare reference
11198 to a non-BLKmode volatile lvalue as forcing a load. */
11199 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (*expr_p));
11201 /* Normally, we do not want to create a temporary for a
11202 TREE_ADDRESSABLE type because such a type should not be
11203 copied by bitwise-assignment. However, we make an
11204 exception here, as all we are doing here is ensuring that
11205 we read the bytes that make up the type. We use
11206 create_tmp_var_raw because create_tmp_var will abort when
11207 given a TREE_ADDRESSABLE type. */
11208 tree tmp = create_tmp_var_raw (type, "vol");
11209 gimple_add_tmp_var (tmp);
11210 gimplify_assign (tmp, *expr_p, pre_p);
11211 *expr_p = NULL;
11213 else
11214 /* We can't do anything useful with a volatile reference to
11215 an incomplete type, so just throw it away. Likewise for
11216 a BLKmode type, since any implicit inner load should
11217 already have been turned into an explicit one by the
11218 gimplification process. */
11219 *expr_p = NULL;
11222 /* If we are gimplifying at the statement level, we're done. Tack
11223 everything together and return. */
11224 if (fallback == fb_none || is_statement)
11226 /* Since *EXPR_P has been converted into a GIMPLE tuple, clear
11227 it out for GC to reclaim it. */
11228 *expr_p = NULL_TREE;
11230 if (!gimple_seq_empty_p (internal_pre)
11231 || !gimple_seq_empty_p (internal_post))
11233 gimplify_seq_add_seq (&internal_pre, internal_post);
11234 gimplify_seq_add_seq (pre_p, internal_pre);
11237 /* The result of gimplifying *EXPR_P is going to be the last few
11238 statements in *PRE_P and *POST_P. Add location information
11239 to all the statements that were added by the gimplification
11240 helpers. */
11241 if (!gimple_seq_empty_p (*pre_p))
11242 annotate_all_with_location_after (*pre_p, pre_last_gsi, input_location);
11244 if (!gimple_seq_empty_p (*post_p))
11245 annotate_all_with_location_after (*post_p, post_last_gsi,
11246 input_location);
11248 goto out;
11251 #ifdef ENABLE_GIMPLE_CHECKING
11252 if (*expr_p)
11254 enum tree_code code = TREE_CODE (*expr_p);
11255 /* These expressions should already be in gimple IR form. */
11256 gcc_assert (code != MODIFY_EXPR
11257 && code != ASM_EXPR
11258 && code != BIND_EXPR
11259 && code != CATCH_EXPR
11260 && (code != COND_EXPR || gimplify_ctxp->allow_rhs_cond_expr)
11261 && code != EH_FILTER_EXPR
11262 && code != GOTO_EXPR
11263 && code != LABEL_EXPR
11264 && code != LOOP_EXPR
11265 && code != SWITCH_EXPR
11266 && code != TRY_FINALLY_EXPR
11267 && code != OACC_PARALLEL
11268 && code != OACC_KERNELS
11269 && code != OACC_DATA
11270 && code != OACC_HOST_DATA
11271 && code != OACC_DECLARE
11272 && code != OACC_UPDATE
11273 && code != OACC_ENTER_DATA
11274 && code != OACC_EXIT_DATA
11275 && code != OACC_CACHE
11276 && code != OMP_CRITICAL
11277 && code != OMP_FOR
11278 && code != OACC_LOOP
11279 && code != OMP_MASTER
11280 && code != OMP_TASKGROUP
11281 && code != OMP_ORDERED
11282 && code != OMP_PARALLEL
11283 && code != OMP_SECTIONS
11284 && code != OMP_SECTION
11285 && code != OMP_SINGLE);
11287 #endif
11289 /* Otherwise we're gimplifying a subexpression, so the resulting
11290 value is interesting. If it's a valid operand that matches
11291 GIMPLE_TEST_F, we're done. Unless we are handling some
11292 post-effects internally; if that's the case, we need to copy into
11293 a temporary before adding the post-effects to POST_P. */
11294 if (gimple_seq_empty_p (internal_post) && (*gimple_test_f) (*expr_p))
11295 goto out;
11297 /* Otherwise, we need to create a new temporary for the gimplified
11298 expression. */
11300 /* We can't return an lvalue if we have an internal postqueue. The
11301 object the lvalue refers to would (probably) be modified by the
11302 postqueue; we need to copy the value out first, which means an
11303 rvalue. */
11304 if ((fallback & fb_lvalue)
11305 && gimple_seq_empty_p (internal_post)
11306 && is_gimple_addressable (*expr_p))
11308 /* An lvalue will do. Take the address of the expression, store it
11309 in a temporary, and replace the expression with an INDIRECT_REF of
11310 that temporary. */
11311 tmp = build_fold_addr_expr_loc (input_location, *expr_p);
11312 gimplify_expr (&tmp, pre_p, post_p, is_gimple_reg, fb_rvalue);
11313 *expr_p = build_simple_mem_ref (tmp);
11315 else if ((fallback & fb_rvalue) && is_gimple_reg_rhs_or_call (*expr_p))
11317 /* An rvalue will do. Assign the gimplified expression into a
11318 new temporary TMP and replace the original expression with
11319 TMP. First, make sure that the expression has a type so that
11320 it can be assigned into a temporary. */
11321 gcc_assert (!VOID_TYPE_P (TREE_TYPE (*expr_p)));
11322 *expr_p = get_formal_tmp_var (*expr_p, pre_p);
11324 else
11326 #ifdef ENABLE_GIMPLE_CHECKING
11327 if (!(fallback & fb_mayfail))
11329 fprintf (stderr, "gimplification failed:\n");
11330 print_generic_expr (stderr, *expr_p, 0);
11331 debug_tree (*expr_p);
11332 internal_error ("gimplification failed");
11334 #endif
11335 gcc_assert (fallback & fb_mayfail);
11337 /* If this is an asm statement, and the user asked for the
11338 impossible, don't die. Fail and let gimplify_asm_expr
11339 issue an error. */
11340 ret = GS_ERROR;
11341 goto out;
11344 /* Make sure the temporary matches our predicate. */
11345 gcc_assert ((*gimple_test_f) (*expr_p));
11347 if (!gimple_seq_empty_p (internal_post))
11349 annotate_all_with_location (internal_post, input_location);
11350 gimplify_seq_add_seq (pre_p, internal_post);
11353 out:
11354 input_location = saved_location;
11355 return ret;
11358 /* Look through TYPE for variable-sized objects and gimplify each such
11359 size that we find. Add to LIST_P any statements generated. */
11361 void
11362 gimplify_type_sizes (tree type, gimple_seq *list_p)
11364 tree field, t;
11366 if (type == NULL || type == error_mark_node)
11367 return;
11369 /* We first do the main variant, then copy into any other variants. */
11370 type = TYPE_MAIN_VARIANT (type);
11372 /* Avoid infinite recursion. */
11373 if (TYPE_SIZES_GIMPLIFIED (type))
11374 return;
11376 TYPE_SIZES_GIMPLIFIED (type) = 1;
11378 switch (TREE_CODE (type))
11380 case INTEGER_TYPE:
11381 case ENUMERAL_TYPE:
11382 case BOOLEAN_TYPE:
11383 case REAL_TYPE:
11384 case FIXED_POINT_TYPE:
11385 gimplify_one_sizepos (&TYPE_MIN_VALUE (type), list_p);
11386 gimplify_one_sizepos (&TYPE_MAX_VALUE (type), list_p);
11388 for (t = TYPE_NEXT_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
11390 TYPE_MIN_VALUE (t) = TYPE_MIN_VALUE (type);
11391 TYPE_MAX_VALUE (t) = TYPE_MAX_VALUE (type);
11393 break;
11395 case ARRAY_TYPE:
11396 /* These types may not have declarations, so handle them here. */
11397 gimplify_type_sizes (TREE_TYPE (type), list_p);
11398 gimplify_type_sizes (TYPE_DOMAIN (type), list_p);
11399 /* Ensure VLA bounds aren't removed, for -O0 they should be variables
11400 with assigned stack slots, for -O1+ -g they should be tracked
11401 by VTA. */
11402 if (!(TYPE_NAME (type)
11403 && TREE_CODE (TYPE_NAME (type)) == TYPE_DECL
11404 && DECL_IGNORED_P (TYPE_NAME (type)))
11405 && TYPE_DOMAIN (type)
11406 && INTEGRAL_TYPE_P (TYPE_DOMAIN (type)))
11408 t = TYPE_MIN_VALUE (TYPE_DOMAIN (type));
11409 if (t && TREE_CODE (t) == VAR_DECL && DECL_ARTIFICIAL (t))
11410 DECL_IGNORED_P (t) = 0;
11411 t = TYPE_MAX_VALUE (TYPE_DOMAIN (type));
11412 if (t && TREE_CODE (t) == VAR_DECL && DECL_ARTIFICIAL (t))
11413 DECL_IGNORED_P (t) = 0;
11415 break;
11417 case RECORD_TYPE:
11418 case UNION_TYPE:
11419 case QUAL_UNION_TYPE:
11420 for (field = TYPE_FIELDS (type); field; field = DECL_CHAIN (field))
11421 if (TREE_CODE (field) == FIELD_DECL)
11423 gimplify_one_sizepos (&DECL_FIELD_OFFSET (field), list_p);
11424 gimplify_one_sizepos (&DECL_SIZE (field), list_p);
11425 gimplify_one_sizepos (&DECL_SIZE_UNIT (field), list_p);
11426 gimplify_type_sizes (TREE_TYPE (field), list_p);
11428 break;
11430 case POINTER_TYPE:
11431 case REFERENCE_TYPE:
11432 /* We used to recurse on the pointed-to type here, which turned out to
11433 be incorrect because its definition might refer to variables not
11434 yet initialized at this point if a forward declaration is involved.
11436 It was actually useful for anonymous pointed-to types to ensure
11437 that the sizes evaluation dominates every possible later use of the
11438 values. Restricting to such types here would be safe since there
11439 is no possible forward declaration around, but would introduce an
11440 undesirable middle-end semantic to anonymity. We then defer to
11441 front-ends the responsibility of ensuring that the sizes are
11442 evaluated both early and late enough, e.g. by attaching artificial
11443 type declarations to the tree. */
11444 break;
11446 default:
11447 break;
11450 gimplify_one_sizepos (&TYPE_SIZE (type), list_p);
11451 gimplify_one_sizepos (&TYPE_SIZE_UNIT (type), list_p);
11453 for (t = TYPE_NEXT_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
11455 TYPE_SIZE (t) = TYPE_SIZE (type);
11456 TYPE_SIZE_UNIT (t) = TYPE_SIZE_UNIT (type);
11457 TYPE_SIZES_GIMPLIFIED (t) = 1;
11461 /* A subroutine of gimplify_type_sizes to make sure that *EXPR_P,
11462 a size or position, has had all of its SAVE_EXPRs evaluated.
11463 We add any required statements to *STMT_P. */
11465 void
11466 gimplify_one_sizepos (tree *expr_p, gimple_seq *stmt_p)
11468 tree expr = *expr_p;
11470 /* We don't do anything if the value isn't there, is constant, or contains
11471 A PLACEHOLDER_EXPR. We also don't want to do anything if it's already
11472 a VAR_DECL. If it's a VAR_DECL from another function, the gimplifier
11473 will want to replace it with a new variable, but that will cause problems
11474 if this type is from outside the function. It's OK to have that here. */
11475 if (is_gimple_sizepos (expr))
11476 return;
11478 *expr_p = unshare_expr (expr);
11480 gimplify_expr (expr_p, stmt_p, NULL, is_gimple_val, fb_rvalue);
11483 /* Gimplify the body of statements of FNDECL and return a GIMPLE_BIND node
11484 containing the sequence of corresponding GIMPLE statements. If DO_PARMS
11485 is true, also gimplify the parameters. */
11487 gbind *
11488 gimplify_body (tree fndecl, bool do_parms)
11490 location_t saved_location = input_location;
11491 gimple_seq parm_stmts, seq;
11492 gimple *outer_stmt;
11493 gbind *outer_bind;
11494 struct cgraph_node *cgn;
11496 timevar_push (TV_TREE_GIMPLIFY);
11498 /* Initialize for optimize_insn_for_s{ize,peed}_p possibly called during
11499 gimplification. */
11500 default_rtl_profile ();
11502 gcc_assert (gimplify_ctxp == NULL);
11503 push_gimplify_context ();
11505 if (flag_openacc || flag_openmp)
11507 gcc_assert (gimplify_omp_ctxp == NULL);
11508 if (lookup_attribute ("omp declare target", DECL_ATTRIBUTES (fndecl)))
11509 gimplify_omp_ctxp = new_omp_context (ORT_TARGET);
11512 /* Unshare most shared trees in the body and in that of any nested functions.
11513 It would seem we don't have to do this for nested functions because
11514 they are supposed to be output and then the outer function gimplified
11515 first, but the g++ front end doesn't always do it that way. */
11516 unshare_body (fndecl);
11517 unvisit_body (fndecl);
11519 cgn = cgraph_node::get (fndecl);
11520 if (cgn && cgn->origin)
11521 nonlocal_vlas = new hash_set<tree>;
11523 /* Make sure input_location isn't set to something weird. */
11524 input_location = DECL_SOURCE_LOCATION (fndecl);
11526 /* Resolve callee-copies. This has to be done before processing
11527 the body so that DECL_VALUE_EXPR gets processed correctly. */
11528 parm_stmts = do_parms ? gimplify_parameters () : NULL;
11530 /* Gimplify the function's body. */
11531 seq = NULL;
11532 gimplify_stmt (&DECL_SAVED_TREE (fndecl), &seq);
11533 outer_stmt = gimple_seq_first_stmt (seq);
11534 if (!outer_stmt)
11536 outer_stmt = gimple_build_nop ();
11537 gimplify_seq_add_stmt (&seq, outer_stmt);
11540 /* The body must contain exactly one statement, a GIMPLE_BIND. If this is
11541 not the case, wrap everything in a GIMPLE_BIND to make it so. */
11542 if (gimple_code (outer_stmt) == GIMPLE_BIND
11543 && gimple_seq_first (seq) == gimple_seq_last (seq))
11544 outer_bind = as_a <gbind *> (outer_stmt);
11545 else
11546 outer_bind = gimple_build_bind (NULL_TREE, seq, NULL);
11548 DECL_SAVED_TREE (fndecl) = NULL_TREE;
11550 /* If we had callee-copies statements, insert them at the beginning
11551 of the function and clear DECL_VALUE_EXPR_P on the parameters. */
11552 if (!gimple_seq_empty_p (parm_stmts))
11554 tree parm;
11556 gimplify_seq_add_seq (&parm_stmts, gimple_bind_body (outer_bind));
11557 gimple_bind_set_body (outer_bind, parm_stmts);
11559 for (parm = DECL_ARGUMENTS (current_function_decl);
11560 parm; parm = DECL_CHAIN (parm))
11561 if (DECL_HAS_VALUE_EXPR_P (parm))
11563 DECL_HAS_VALUE_EXPR_P (parm) = 0;
11564 DECL_IGNORED_P (parm) = 0;
11568 if (nonlocal_vlas)
11570 if (nonlocal_vla_vars)
11572 /* tree-nested.c may later on call declare_vars (..., true);
11573 which relies on BLOCK_VARS chain to be the tail of the
11574 gimple_bind_vars chain. Ensure we don't violate that
11575 assumption. */
11576 if (gimple_bind_block (outer_bind)
11577 == DECL_INITIAL (current_function_decl))
11578 declare_vars (nonlocal_vla_vars, outer_bind, true);
11579 else
11580 BLOCK_VARS (DECL_INITIAL (current_function_decl))
11581 = chainon (BLOCK_VARS (DECL_INITIAL (current_function_decl)),
11582 nonlocal_vla_vars);
11583 nonlocal_vla_vars = NULL_TREE;
11585 delete nonlocal_vlas;
11586 nonlocal_vlas = NULL;
11589 if ((flag_openacc || flag_openmp || flag_openmp_simd)
11590 && gimplify_omp_ctxp)
11592 delete_omp_context (gimplify_omp_ctxp);
11593 gimplify_omp_ctxp = NULL;
11596 pop_gimplify_context (outer_bind);
11597 gcc_assert (gimplify_ctxp == NULL);
11599 if (flag_checking && !seen_error ())
11600 verify_gimple_in_seq (gimple_bind_body (outer_bind));
11602 timevar_pop (TV_TREE_GIMPLIFY);
11603 input_location = saved_location;
11605 return outer_bind;
11608 typedef char *char_p; /* For DEF_VEC_P. */
11610 /* Return whether we should exclude FNDECL from instrumentation. */
11612 static bool
11613 flag_instrument_functions_exclude_p (tree fndecl)
11615 vec<char_p> *v;
11617 v = (vec<char_p> *) flag_instrument_functions_exclude_functions;
11618 if (v && v->length () > 0)
11620 const char *name;
11621 int i;
11622 char *s;
11624 name = lang_hooks.decl_printable_name (fndecl, 0);
11625 FOR_EACH_VEC_ELT (*v, i, s)
11626 if (strstr (name, s) != NULL)
11627 return true;
11630 v = (vec<char_p> *) flag_instrument_functions_exclude_files;
11631 if (v && v->length () > 0)
11633 const char *name;
11634 int i;
11635 char *s;
11637 name = DECL_SOURCE_FILE (fndecl);
11638 FOR_EACH_VEC_ELT (*v, i, s)
11639 if (strstr (name, s) != NULL)
11640 return true;
11643 return false;
11646 /* Entry point to the gimplification pass. FNDECL is the FUNCTION_DECL
11647 node for the function we want to gimplify.
11649 Return the sequence of GIMPLE statements corresponding to the body
11650 of FNDECL. */
11652 void
11653 gimplify_function_tree (tree fndecl)
11655 tree parm, ret;
11656 gimple_seq seq;
11657 gbind *bind;
11659 gcc_assert (!gimple_body (fndecl));
11661 if (DECL_STRUCT_FUNCTION (fndecl))
11662 push_cfun (DECL_STRUCT_FUNCTION (fndecl));
11663 else
11664 push_struct_function (fndecl);
11666 /* Tentatively set PROP_gimple_lva here, and reset it in gimplify_va_arg_expr
11667 if necessary. */
11668 cfun->curr_properties |= PROP_gimple_lva;
11670 for (parm = DECL_ARGUMENTS (fndecl); parm ; parm = DECL_CHAIN (parm))
11672 /* Preliminarily mark non-addressed complex variables as eligible
11673 for promotion to gimple registers. We'll transform their uses
11674 as we find them. */
11675 if ((TREE_CODE (TREE_TYPE (parm)) == COMPLEX_TYPE
11676 || TREE_CODE (TREE_TYPE (parm)) == VECTOR_TYPE)
11677 && !TREE_THIS_VOLATILE (parm)
11678 && !needs_to_live_in_memory (parm))
11679 DECL_GIMPLE_REG_P (parm) = 1;
11682 ret = DECL_RESULT (fndecl);
11683 if ((TREE_CODE (TREE_TYPE (ret)) == COMPLEX_TYPE
11684 || TREE_CODE (TREE_TYPE (ret)) == VECTOR_TYPE)
11685 && !needs_to_live_in_memory (ret))
11686 DECL_GIMPLE_REG_P (ret) = 1;
11688 bind = gimplify_body (fndecl, true);
11690 /* The tree body of the function is no longer needed, replace it
11691 with the new GIMPLE body. */
11692 seq = NULL;
11693 gimple_seq_add_stmt (&seq, bind);
11694 gimple_set_body (fndecl, seq);
11696 /* If we're instrumenting function entry/exit, then prepend the call to
11697 the entry hook and wrap the whole function in a TRY_FINALLY_EXPR to
11698 catch the exit hook. */
11699 /* ??? Add some way to ignore exceptions for this TFE. */
11700 if (flag_instrument_function_entry_exit
11701 && !DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (fndecl)
11702 /* Do not instrument extern inline functions. */
11703 && !(DECL_DECLARED_INLINE_P (fndecl)
11704 && DECL_EXTERNAL (fndecl)
11705 && DECL_DISREGARD_INLINE_LIMITS (fndecl))
11706 && !flag_instrument_functions_exclude_p (fndecl))
11708 tree x;
11709 gbind *new_bind;
11710 gimple *tf;
11711 gimple_seq cleanup = NULL, body = NULL;
11712 tree tmp_var;
11713 gcall *call;
11715 x = builtin_decl_implicit (BUILT_IN_RETURN_ADDRESS);
11716 call = gimple_build_call (x, 1, integer_zero_node);
11717 tmp_var = create_tmp_var (ptr_type_node, "return_addr");
11718 gimple_call_set_lhs (call, tmp_var);
11719 gimplify_seq_add_stmt (&cleanup, call);
11720 x = builtin_decl_implicit (BUILT_IN_PROFILE_FUNC_EXIT);
11721 call = gimple_build_call (x, 2,
11722 build_fold_addr_expr (current_function_decl),
11723 tmp_var);
11724 gimplify_seq_add_stmt (&cleanup, call);
11725 tf = gimple_build_try (seq, cleanup, GIMPLE_TRY_FINALLY);
11727 x = builtin_decl_implicit (BUILT_IN_RETURN_ADDRESS);
11728 call = gimple_build_call (x, 1, integer_zero_node);
11729 tmp_var = create_tmp_var (ptr_type_node, "return_addr");
11730 gimple_call_set_lhs (call, tmp_var);
11731 gimplify_seq_add_stmt (&body, call);
11732 x = builtin_decl_implicit (BUILT_IN_PROFILE_FUNC_ENTER);
11733 call = gimple_build_call (x, 2,
11734 build_fold_addr_expr (current_function_decl),
11735 tmp_var);
11736 gimplify_seq_add_stmt (&body, call);
11737 gimplify_seq_add_stmt (&body, tf);
11738 new_bind = gimple_build_bind (NULL, body, gimple_bind_block (bind));
11739 /* Clear the block for BIND, since it is no longer directly inside
11740 the function, but within a try block. */
11741 gimple_bind_set_block (bind, NULL);
11743 /* Replace the current function body with the body
11744 wrapped in the try/finally TF. */
11745 seq = NULL;
11746 gimple_seq_add_stmt (&seq, new_bind);
11747 gimple_set_body (fndecl, seq);
11748 bind = new_bind;
11751 if ((flag_sanitize & SANITIZE_THREAD) != 0
11752 && !lookup_attribute ("no_sanitize_thread", DECL_ATTRIBUTES (fndecl)))
11754 gcall *call = gimple_build_call_internal (IFN_TSAN_FUNC_EXIT, 0);
11755 gimple *tf = gimple_build_try (seq, call, GIMPLE_TRY_FINALLY);
11756 gbind *new_bind = gimple_build_bind (NULL, tf, gimple_bind_block (bind));
11757 /* Clear the block for BIND, since it is no longer directly inside
11758 the function, but within a try block. */
11759 gimple_bind_set_block (bind, NULL);
11760 /* Replace the current function body with the body
11761 wrapped in the try/finally TF. */
11762 seq = NULL;
11763 gimple_seq_add_stmt (&seq, new_bind);
11764 gimple_set_body (fndecl, seq);
11767 DECL_SAVED_TREE (fndecl) = NULL_TREE;
11768 cfun->curr_properties |= PROP_gimple_any;
11770 pop_cfun ();
11772 dump_function (TDI_generic, fndecl);
11775 /* Return a dummy expression of type TYPE in order to keep going after an
11776 error. */
11778 static tree
11779 dummy_object (tree type)
11781 tree t = build_int_cst (build_pointer_type (type), 0);
11782 return build2 (MEM_REF, type, t, t);
11785 /* Gimplify __builtin_va_arg, aka VA_ARG_EXPR, which is not really a
11786 builtin function, but a very special sort of operator. */
11788 enum gimplify_status
11789 gimplify_va_arg_expr (tree *expr_p, gimple_seq *pre_p,
11790 gimple_seq *post_p ATTRIBUTE_UNUSED)
11792 tree promoted_type, have_va_type;
11793 tree valist = TREE_OPERAND (*expr_p, 0);
11794 tree type = TREE_TYPE (*expr_p);
11795 tree t, tag, aptag;
11796 location_t loc = EXPR_LOCATION (*expr_p);
11798 /* Verify that valist is of the proper type. */
11799 have_va_type = TREE_TYPE (valist);
11800 if (have_va_type == error_mark_node)
11801 return GS_ERROR;
11802 have_va_type = targetm.canonical_va_list_type (have_va_type);
11804 if (have_va_type == NULL_TREE)
11806 error_at (loc, "first argument to %<va_arg%> not of type %<va_list%>");
11807 return GS_ERROR;
11810 /* Generate a diagnostic for requesting data of a type that cannot
11811 be passed through `...' due to type promotion at the call site. */
11812 if ((promoted_type = lang_hooks.types.type_promotes_to (type))
11813 != type)
11815 static bool gave_help;
11816 bool warned;
11817 /* Use the expansion point to handle cases such as passing bool (defined
11818 in a system header) through `...'. */
11819 source_location xloc
11820 = expansion_point_location_if_in_system_header (loc);
11822 /* Unfortunately, this is merely undefined, rather than a constraint
11823 violation, so we cannot make this an error. If this call is never
11824 executed, the program is still strictly conforming. */
11825 warned = warning_at (xloc, 0,
11826 "%qT is promoted to %qT when passed through %<...%>",
11827 type, promoted_type);
11828 if (!gave_help && warned)
11830 gave_help = true;
11831 inform (xloc, "(so you should pass %qT not %qT to %<va_arg%>)",
11832 promoted_type, type);
11835 /* We can, however, treat "undefined" any way we please.
11836 Call abort to encourage the user to fix the program. */
11837 if (warned)
11838 inform (xloc, "if this code is reached, the program will abort");
11839 /* Before the abort, allow the evaluation of the va_list
11840 expression to exit or longjmp. */
11841 gimplify_and_add (valist, pre_p);
11842 t = build_call_expr_loc (loc,
11843 builtin_decl_implicit (BUILT_IN_TRAP), 0);
11844 gimplify_and_add (t, pre_p);
11846 /* This is dead code, but go ahead and finish so that the
11847 mode of the result comes out right. */
11848 *expr_p = dummy_object (type);
11849 return GS_ALL_DONE;
11852 tag = build_int_cst (build_pointer_type (type), 0);
11853 aptag = build_int_cst (TREE_TYPE (valist), 0);
11855 *expr_p = build_call_expr_internal_loc (loc, IFN_VA_ARG, type, 3,
11856 valist, tag, aptag);
11858 /* Clear the tentatively set PROP_gimple_lva, to indicate that IFN_VA_ARG
11859 needs to be expanded. */
11860 cfun->curr_properties &= ~PROP_gimple_lva;
11862 return GS_OK;
11865 /* Build a new GIMPLE_ASSIGN tuple and append it to the end of *SEQ_P.
11867 DST/SRC are the destination and source respectively. You can pass
11868 ungimplified trees in DST or SRC, in which case they will be
11869 converted to a gimple operand if necessary.
11871 This function returns the newly created GIMPLE_ASSIGN tuple. */
11873 gimple *
11874 gimplify_assign (tree dst, tree src, gimple_seq *seq_p)
11876 tree t = build2 (MODIFY_EXPR, TREE_TYPE (dst), dst, src);
11877 gimplify_and_add (t, seq_p);
11878 ggc_free (t);
11879 return gimple_seq_last_stmt (*seq_p);
11882 inline hashval_t
11883 gimplify_hasher::hash (const elt_t *p)
11885 tree t = p->val;
11886 return iterative_hash_expr (t, 0);
11889 inline bool
11890 gimplify_hasher::equal (const elt_t *p1, const elt_t *p2)
11892 tree t1 = p1->val;
11893 tree t2 = p2->val;
11894 enum tree_code code = TREE_CODE (t1);
11896 if (TREE_CODE (t2) != code
11897 || TREE_TYPE (t1) != TREE_TYPE (t2))
11898 return false;
11900 if (!operand_equal_p (t1, t2, 0))
11901 return false;
11903 /* Only allow them to compare equal if they also hash equal; otherwise
11904 results are nondeterminate, and we fail bootstrap comparison. */
11905 gcc_checking_assert (hash (p1) == hash (p2));
11907 return true;