Update .po files.
[official-gcc.git] / gcc / gimplify.c
blobe223e592af59d9dc039e3629eb82738654247fad
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 else if (want_value)
4194 *expr_p = object;
4195 return GS_OK;
4197 else
4199 /* If we have gimplified both sides of the initializer but have
4200 not emitted an assignment, do so now. */
4201 if (*expr_p)
4203 tree lhs = TREE_OPERAND (*expr_p, 0);
4204 tree rhs = TREE_OPERAND (*expr_p, 1);
4205 gassign *init = gimple_build_assign (lhs, rhs);
4206 gimplify_seq_add_stmt (pre_p, init);
4207 *expr_p = NULL;
4210 return GS_ALL_DONE;
4214 /* Given a pointer value OP0, return a simplified version of an
4215 indirection through OP0, or NULL_TREE if no simplification is
4216 possible. This may only be applied to a rhs of an expression.
4217 Note that the resulting type may be different from the type pointed
4218 to in the sense that it is still compatible from the langhooks
4219 point of view. */
4221 static tree
4222 gimple_fold_indirect_ref_rhs (tree t)
4224 return gimple_fold_indirect_ref (t);
4227 /* Subroutine of gimplify_modify_expr to do simplifications of
4228 MODIFY_EXPRs based on the code of the RHS. We loop for as long as
4229 something changes. */
4231 static enum gimplify_status
4232 gimplify_modify_expr_rhs (tree *expr_p, tree *from_p, tree *to_p,
4233 gimple_seq *pre_p, gimple_seq *post_p,
4234 bool want_value)
4236 enum gimplify_status ret = GS_UNHANDLED;
4237 bool changed;
4241 changed = false;
4242 switch (TREE_CODE (*from_p))
4244 case VAR_DECL:
4245 /* If we're assigning from a read-only variable initialized with
4246 a constructor, do the direct assignment from the constructor,
4247 but only if neither source nor target are volatile since this
4248 latter assignment might end up being done on a per-field basis. */
4249 if (DECL_INITIAL (*from_p)
4250 && TREE_READONLY (*from_p)
4251 && !TREE_THIS_VOLATILE (*from_p)
4252 && !TREE_THIS_VOLATILE (*to_p)
4253 && TREE_CODE (DECL_INITIAL (*from_p)) == CONSTRUCTOR)
4255 tree old_from = *from_p;
4256 enum gimplify_status subret;
4258 /* Move the constructor into the RHS. */
4259 *from_p = unshare_expr (DECL_INITIAL (*from_p));
4261 /* Let's see if gimplify_init_constructor will need to put
4262 it in memory. */
4263 subret = gimplify_init_constructor (expr_p, NULL, NULL,
4264 false, true);
4265 if (subret == GS_ERROR)
4267 /* If so, revert the change. */
4268 *from_p = old_from;
4270 else
4272 ret = GS_OK;
4273 changed = true;
4276 break;
4277 case INDIRECT_REF:
4279 /* If we have code like
4281 *(const A*)(A*)&x
4283 where the type of "x" is a (possibly cv-qualified variant
4284 of "A"), treat the entire expression as identical to "x".
4285 This kind of code arises in C++ when an object is bound
4286 to a const reference, and if "x" is a TARGET_EXPR we want
4287 to take advantage of the optimization below. */
4288 bool volatile_p = TREE_THIS_VOLATILE (*from_p);
4289 tree t = gimple_fold_indirect_ref_rhs (TREE_OPERAND (*from_p, 0));
4290 if (t)
4292 if (TREE_THIS_VOLATILE (t) != volatile_p)
4294 if (DECL_P (t))
4295 t = build_simple_mem_ref_loc (EXPR_LOCATION (*from_p),
4296 build_fold_addr_expr (t));
4297 if (REFERENCE_CLASS_P (t))
4298 TREE_THIS_VOLATILE (t) = volatile_p;
4300 *from_p = t;
4301 ret = GS_OK;
4302 changed = true;
4304 break;
4307 case TARGET_EXPR:
4309 /* If we are initializing something from a TARGET_EXPR, strip the
4310 TARGET_EXPR and initialize it directly, if possible. This can't
4311 be done if the initializer is void, since that implies that the
4312 temporary is set in some non-trivial way.
4314 ??? What about code that pulls out the temp and uses it
4315 elsewhere? I think that such code never uses the TARGET_EXPR as
4316 an initializer. If I'm wrong, we'll die because the temp won't
4317 have any RTL. In that case, I guess we'll need to replace
4318 references somehow. */
4319 tree init = TARGET_EXPR_INITIAL (*from_p);
4321 if (init
4322 && !VOID_TYPE_P (TREE_TYPE (init)))
4324 *from_p = init;
4325 ret = GS_OK;
4326 changed = true;
4329 break;
4331 case COMPOUND_EXPR:
4332 /* Remove any COMPOUND_EXPR in the RHS so the following cases will be
4333 caught. */
4334 gimplify_compound_expr (from_p, pre_p, true);
4335 ret = GS_OK;
4336 changed = true;
4337 break;
4339 case CONSTRUCTOR:
4340 /* If we already made some changes, let the front end have a
4341 crack at this before we break it down. */
4342 if (ret != GS_UNHANDLED)
4343 break;
4344 /* If we're initializing from a CONSTRUCTOR, break this into
4345 individual MODIFY_EXPRs. */
4346 return gimplify_init_constructor (expr_p, pre_p, post_p, want_value,
4347 false);
4349 case COND_EXPR:
4350 /* If we're assigning to a non-register type, push the assignment
4351 down into the branches. This is mandatory for ADDRESSABLE types,
4352 since we cannot generate temporaries for such, but it saves a
4353 copy in other cases as well. */
4354 if (!is_gimple_reg_type (TREE_TYPE (*from_p)))
4356 /* This code should mirror the code in gimplify_cond_expr. */
4357 enum tree_code code = TREE_CODE (*expr_p);
4358 tree cond = *from_p;
4359 tree result = *to_p;
4361 ret = gimplify_expr (&result, pre_p, post_p,
4362 is_gimple_lvalue, fb_lvalue);
4363 if (ret != GS_ERROR)
4364 ret = GS_OK;
4366 if (TREE_TYPE (TREE_OPERAND (cond, 1)) != void_type_node)
4367 TREE_OPERAND (cond, 1)
4368 = build2 (code, void_type_node, result,
4369 TREE_OPERAND (cond, 1));
4370 if (TREE_TYPE (TREE_OPERAND (cond, 2)) != void_type_node)
4371 TREE_OPERAND (cond, 2)
4372 = build2 (code, void_type_node, unshare_expr (result),
4373 TREE_OPERAND (cond, 2));
4375 TREE_TYPE (cond) = void_type_node;
4376 recalculate_side_effects (cond);
4378 if (want_value)
4380 gimplify_and_add (cond, pre_p);
4381 *expr_p = unshare_expr (result);
4383 else
4384 *expr_p = cond;
4385 return ret;
4387 break;
4389 case CALL_EXPR:
4390 /* For calls that return in memory, give *to_p as the CALL_EXPR's
4391 return slot so that we don't generate a temporary. */
4392 if (!CALL_EXPR_RETURN_SLOT_OPT (*from_p)
4393 && aggregate_value_p (*from_p, *from_p))
4395 bool use_target;
4397 if (!(rhs_predicate_for (*to_p))(*from_p))
4398 /* If we need a temporary, *to_p isn't accurate. */
4399 use_target = false;
4400 /* It's OK to use the return slot directly unless it's an NRV. */
4401 else if (TREE_CODE (*to_p) == RESULT_DECL
4402 && DECL_NAME (*to_p) == NULL_TREE
4403 && needs_to_live_in_memory (*to_p))
4404 use_target = true;
4405 else if (is_gimple_reg_type (TREE_TYPE (*to_p))
4406 || (DECL_P (*to_p) && DECL_REGISTER (*to_p)))
4407 /* Don't force regs into memory. */
4408 use_target = false;
4409 else if (TREE_CODE (*expr_p) == INIT_EXPR)
4410 /* It's OK to use the target directly if it's being
4411 initialized. */
4412 use_target = true;
4413 else if (TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (*to_p)))
4414 != INTEGER_CST)
4415 /* Always use the target and thus RSO for variable-sized types.
4416 GIMPLE cannot deal with a variable-sized assignment
4417 embedded in a call statement. */
4418 use_target = true;
4419 else if (TREE_CODE (*to_p) != SSA_NAME
4420 && (!is_gimple_variable (*to_p)
4421 || needs_to_live_in_memory (*to_p)))
4422 /* Don't use the original target if it's already addressable;
4423 if its address escapes, and the called function uses the
4424 NRV optimization, a conforming program could see *to_p
4425 change before the called function returns; see c++/19317.
4426 When optimizing, the return_slot pass marks more functions
4427 as safe after we have escape info. */
4428 use_target = false;
4429 else
4430 use_target = true;
4432 if (use_target)
4434 CALL_EXPR_RETURN_SLOT_OPT (*from_p) = 1;
4435 mark_addressable (*to_p);
4438 break;
4440 case WITH_SIZE_EXPR:
4441 /* Likewise for calls that return an aggregate of non-constant size,
4442 since we would not be able to generate a temporary at all. */
4443 if (TREE_CODE (TREE_OPERAND (*from_p, 0)) == CALL_EXPR)
4445 *from_p = TREE_OPERAND (*from_p, 0);
4446 /* We don't change ret in this case because the
4447 WITH_SIZE_EXPR might have been added in
4448 gimplify_modify_expr, so returning GS_OK would lead to an
4449 infinite loop. */
4450 changed = true;
4452 break;
4454 /* If we're initializing from a container, push the initialization
4455 inside it. */
4456 case CLEANUP_POINT_EXPR:
4457 case BIND_EXPR:
4458 case STATEMENT_LIST:
4460 tree wrap = *from_p;
4461 tree t;
4463 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_min_lval,
4464 fb_lvalue);
4465 if (ret != GS_ERROR)
4466 ret = GS_OK;
4468 t = voidify_wrapper_expr (wrap, *expr_p);
4469 gcc_assert (t == *expr_p);
4471 if (want_value)
4473 gimplify_and_add (wrap, pre_p);
4474 *expr_p = unshare_expr (*to_p);
4476 else
4477 *expr_p = wrap;
4478 return GS_OK;
4481 case COMPOUND_LITERAL_EXPR:
4483 tree complit = TREE_OPERAND (*expr_p, 1);
4484 tree decl_s = COMPOUND_LITERAL_EXPR_DECL_EXPR (complit);
4485 tree decl = DECL_EXPR_DECL (decl_s);
4486 tree init = DECL_INITIAL (decl);
4488 /* struct T x = (struct T) { 0, 1, 2 } can be optimized
4489 into struct T x = { 0, 1, 2 } if the address of the
4490 compound literal has never been taken. */
4491 if (!TREE_ADDRESSABLE (complit)
4492 && !TREE_ADDRESSABLE (decl)
4493 && init)
4495 *expr_p = copy_node (*expr_p);
4496 TREE_OPERAND (*expr_p, 1) = init;
4497 return GS_OK;
4501 default:
4502 break;
4505 while (changed);
4507 return ret;
4511 /* Return true if T looks like a valid GIMPLE statement. */
4513 static bool
4514 is_gimple_stmt (tree t)
4516 const enum tree_code code = TREE_CODE (t);
4518 switch (code)
4520 case NOP_EXPR:
4521 /* The only valid NOP_EXPR is the empty statement. */
4522 return IS_EMPTY_STMT (t);
4524 case BIND_EXPR:
4525 case COND_EXPR:
4526 /* These are only valid if they're void. */
4527 return TREE_TYPE (t) == NULL || VOID_TYPE_P (TREE_TYPE (t));
4529 case SWITCH_EXPR:
4530 case GOTO_EXPR:
4531 case RETURN_EXPR:
4532 case LABEL_EXPR:
4533 case CASE_LABEL_EXPR:
4534 case TRY_CATCH_EXPR:
4535 case TRY_FINALLY_EXPR:
4536 case EH_FILTER_EXPR:
4537 case CATCH_EXPR:
4538 case ASM_EXPR:
4539 case STATEMENT_LIST:
4540 case OACC_PARALLEL:
4541 case OACC_KERNELS:
4542 case OACC_DATA:
4543 case OACC_HOST_DATA:
4544 case OACC_DECLARE:
4545 case OACC_UPDATE:
4546 case OACC_ENTER_DATA:
4547 case OACC_EXIT_DATA:
4548 case OACC_CACHE:
4549 case OMP_PARALLEL:
4550 case OMP_FOR:
4551 case OMP_SIMD:
4552 case CILK_SIMD:
4553 case OMP_DISTRIBUTE:
4554 case OACC_LOOP:
4555 case OMP_SECTIONS:
4556 case OMP_SECTION:
4557 case OMP_SINGLE:
4558 case OMP_MASTER:
4559 case OMP_TASKGROUP:
4560 case OMP_ORDERED:
4561 case OMP_CRITICAL:
4562 case OMP_TASK:
4563 case OMP_TARGET:
4564 case OMP_TARGET_DATA:
4565 case OMP_TARGET_UPDATE:
4566 case OMP_TARGET_ENTER_DATA:
4567 case OMP_TARGET_EXIT_DATA:
4568 case OMP_TASKLOOP:
4569 case OMP_TEAMS:
4570 /* These are always void. */
4571 return true;
4573 case CALL_EXPR:
4574 case MODIFY_EXPR:
4575 case PREDICT_EXPR:
4576 /* These are valid regardless of their type. */
4577 return true;
4579 default:
4580 return false;
4585 /* Promote partial stores to COMPLEX variables to total stores. *EXPR_P is
4586 a MODIFY_EXPR with a lhs of a REAL/IMAGPART_EXPR of a variable with
4587 DECL_GIMPLE_REG_P set.
4589 IMPORTANT NOTE: This promotion is performed by introducing a load of the
4590 other, unmodified part of the complex object just before the total store.
4591 As a consequence, if the object is still uninitialized, an undefined value
4592 will be loaded into a register, which may result in a spurious exception
4593 if the register is floating-point and the value happens to be a signaling
4594 NaN for example. Then the fully-fledged complex operations lowering pass
4595 followed by a DCE pass are necessary in order to fix things up. */
4597 static enum gimplify_status
4598 gimplify_modify_expr_complex_part (tree *expr_p, gimple_seq *pre_p,
4599 bool want_value)
4601 enum tree_code code, ocode;
4602 tree lhs, rhs, new_rhs, other, realpart, imagpart;
4604 lhs = TREE_OPERAND (*expr_p, 0);
4605 rhs = TREE_OPERAND (*expr_p, 1);
4606 code = TREE_CODE (lhs);
4607 lhs = TREE_OPERAND (lhs, 0);
4609 ocode = code == REALPART_EXPR ? IMAGPART_EXPR : REALPART_EXPR;
4610 other = build1 (ocode, TREE_TYPE (rhs), lhs);
4611 TREE_NO_WARNING (other) = 1;
4612 other = get_formal_tmp_var (other, pre_p);
4614 realpart = code == REALPART_EXPR ? rhs : other;
4615 imagpart = code == REALPART_EXPR ? other : rhs;
4617 if (TREE_CONSTANT (realpart) && TREE_CONSTANT (imagpart))
4618 new_rhs = build_complex (TREE_TYPE (lhs), realpart, imagpart);
4619 else
4620 new_rhs = build2 (COMPLEX_EXPR, TREE_TYPE (lhs), realpart, imagpart);
4622 gimplify_seq_add_stmt (pre_p, gimple_build_assign (lhs, new_rhs));
4623 *expr_p = (want_value) ? rhs : NULL_TREE;
4625 return GS_ALL_DONE;
4628 /* Gimplify the MODIFY_EXPR node pointed to by EXPR_P.
4630 modify_expr
4631 : varname '=' rhs
4632 | '*' ID '=' rhs
4634 PRE_P points to the list where side effects that must happen before
4635 *EXPR_P should be stored.
4637 POST_P points to the list where side effects that must happen after
4638 *EXPR_P should be stored.
4640 WANT_VALUE is nonzero iff we want to use the value of this expression
4641 in another expression. */
4643 static enum gimplify_status
4644 gimplify_modify_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
4645 bool want_value)
4647 tree *from_p = &TREE_OPERAND (*expr_p, 1);
4648 tree *to_p = &TREE_OPERAND (*expr_p, 0);
4649 enum gimplify_status ret = GS_UNHANDLED;
4650 gimple *assign;
4651 location_t loc = EXPR_LOCATION (*expr_p);
4652 gimple_stmt_iterator gsi;
4654 gcc_assert (TREE_CODE (*expr_p) == MODIFY_EXPR
4655 || TREE_CODE (*expr_p) == INIT_EXPR);
4657 /* Trying to simplify a clobber using normal logic doesn't work,
4658 so handle it here. */
4659 if (TREE_CLOBBER_P (*from_p))
4661 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
4662 if (ret == GS_ERROR)
4663 return ret;
4664 gcc_assert (!want_value
4665 && (TREE_CODE (*to_p) == VAR_DECL
4666 || TREE_CODE (*to_p) == MEM_REF));
4667 gimplify_seq_add_stmt (pre_p, gimple_build_assign (*to_p, *from_p));
4668 *expr_p = NULL;
4669 return GS_ALL_DONE;
4672 /* Insert pointer conversions required by the middle-end that are not
4673 required by the frontend. This fixes middle-end type checking for
4674 for example gcc.dg/redecl-6.c. */
4675 if (POINTER_TYPE_P (TREE_TYPE (*to_p)))
4677 STRIP_USELESS_TYPE_CONVERSION (*from_p);
4678 if (!useless_type_conversion_p (TREE_TYPE (*to_p), TREE_TYPE (*from_p)))
4679 *from_p = fold_convert_loc (loc, TREE_TYPE (*to_p), *from_p);
4682 /* See if any simplifications can be done based on what the RHS is. */
4683 ret = gimplify_modify_expr_rhs (expr_p, from_p, to_p, pre_p, post_p,
4684 want_value);
4685 if (ret != GS_UNHANDLED)
4686 return ret;
4688 /* For zero sized types only gimplify the left hand side and right hand
4689 side as statements and throw away the assignment. Do this after
4690 gimplify_modify_expr_rhs so we handle TARGET_EXPRs of addressable
4691 types properly. */
4692 if (zero_sized_type (TREE_TYPE (*from_p)) && !want_value)
4694 gimplify_stmt (from_p, pre_p);
4695 gimplify_stmt (to_p, pre_p);
4696 *expr_p = NULL_TREE;
4697 return GS_ALL_DONE;
4700 /* If the value being copied is of variable width, compute the length
4701 of the copy into a WITH_SIZE_EXPR. Note that we need to do this
4702 before gimplifying any of the operands so that we can resolve any
4703 PLACEHOLDER_EXPRs in the size. Also note that the RTL expander uses
4704 the size of the expression to be copied, not of the destination, so
4705 that is what we must do here. */
4706 maybe_with_size_expr (from_p);
4708 ret = gimplify_expr (to_p, pre_p, post_p, is_gimple_lvalue, fb_lvalue);
4709 if (ret == GS_ERROR)
4710 return ret;
4712 /* As a special case, we have to temporarily allow for assignments
4713 with a CALL_EXPR on the RHS. Since in GIMPLE a function call is
4714 a toplevel statement, when gimplifying the GENERIC expression
4715 MODIFY_EXPR <a, CALL_EXPR <foo>>, we cannot create the tuple
4716 GIMPLE_ASSIGN <a, GIMPLE_CALL <foo>>.
4718 Instead, we need to create the tuple GIMPLE_CALL <a, foo>. To
4719 prevent gimplify_expr from trying to create a new temporary for
4720 foo's LHS, we tell it that it should only gimplify until it
4721 reaches the CALL_EXPR. On return from gimplify_expr, the newly
4722 created GIMPLE_CALL <foo> will be the last statement in *PRE_P
4723 and all we need to do here is set 'a' to be its LHS. */
4724 ret = gimplify_expr (from_p, pre_p, post_p, rhs_predicate_for (*to_p),
4725 fb_rvalue);
4726 if (ret == GS_ERROR)
4727 return ret;
4729 /* In case of va_arg internal fn wrappped in a WITH_SIZE_EXPR, add the type
4730 size as argument to the call. */
4731 if (TREE_CODE (*from_p) == WITH_SIZE_EXPR)
4733 tree call = TREE_OPERAND (*from_p, 0);
4734 tree vlasize = TREE_OPERAND (*from_p, 1);
4736 if (TREE_CODE (call) == CALL_EXPR
4737 && CALL_EXPR_IFN (call) == IFN_VA_ARG)
4739 int nargs = call_expr_nargs (call);
4740 tree type = TREE_TYPE (call);
4741 tree ap = CALL_EXPR_ARG (call, 0);
4742 tree tag = CALL_EXPR_ARG (call, 1);
4743 tree aptag = CALL_EXPR_ARG (call, 2);
4744 tree newcall = build_call_expr_internal_loc (EXPR_LOCATION (call),
4745 IFN_VA_ARG, type,
4746 nargs + 1, ap, tag,
4747 aptag, vlasize);
4748 TREE_OPERAND (*from_p, 0) = newcall;
4752 /* Now see if the above changed *from_p to something we handle specially. */
4753 ret = gimplify_modify_expr_rhs (expr_p, from_p, to_p, pre_p, post_p,
4754 want_value);
4755 if (ret != GS_UNHANDLED)
4756 return ret;
4758 /* If we've got a variable sized assignment between two lvalues (i.e. does
4759 not involve a call), then we can make things a bit more straightforward
4760 by converting the assignment to memcpy or memset. */
4761 if (TREE_CODE (*from_p) == WITH_SIZE_EXPR)
4763 tree from = TREE_OPERAND (*from_p, 0);
4764 tree size = TREE_OPERAND (*from_p, 1);
4766 if (TREE_CODE (from) == CONSTRUCTOR)
4767 return gimplify_modify_expr_to_memset (expr_p, size, want_value, pre_p);
4769 if (is_gimple_addressable (from))
4771 *from_p = from;
4772 return gimplify_modify_expr_to_memcpy (expr_p, size, want_value,
4773 pre_p);
4777 /* Transform partial stores to non-addressable complex variables into
4778 total stores. This allows us to use real instead of virtual operands
4779 for these variables, which improves optimization. */
4780 if ((TREE_CODE (*to_p) == REALPART_EXPR
4781 || TREE_CODE (*to_p) == IMAGPART_EXPR)
4782 && is_gimple_reg (TREE_OPERAND (*to_p, 0)))
4783 return gimplify_modify_expr_complex_part (expr_p, pre_p, want_value);
4785 /* Try to alleviate the effects of the gimplification creating artificial
4786 temporaries (see for example is_gimple_reg_rhs) on the debug info, but
4787 make sure not to create DECL_DEBUG_EXPR links across functions. */
4788 if (!gimplify_ctxp->into_ssa
4789 && TREE_CODE (*from_p) == VAR_DECL
4790 && DECL_IGNORED_P (*from_p)
4791 && DECL_P (*to_p)
4792 && !DECL_IGNORED_P (*to_p)
4793 && decl_function_context (*to_p) == current_function_decl)
4795 if (!DECL_NAME (*from_p) && DECL_NAME (*to_p))
4796 DECL_NAME (*from_p)
4797 = create_tmp_var_name (IDENTIFIER_POINTER (DECL_NAME (*to_p)));
4798 DECL_HAS_DEBUG_EXPR_P (*from_p) = 1;
4799 SET_DECL_DEBUG_EXPR (*from_p, *to_p);
4802 if (want_value && TREE_THIS_VOLATILE (*to_p))
4803 *from_p = get_initialized_tmp_var (*from_p, pre_p, post_p);
4805 if (TREE_CODE (*from_p) == CALL_EXPR)
4807 /* Since the RHS is a CALL_EXPR, we need to create a GIMPLE_CALL
4808 instead of a GIMPLE_ASSIGN. */
4809 gcall *call_stmt;
4810 if (CALL_EXPR_FN (*from_p) == NULL_TREE)
4812 /* Gimplify internal functions created in the FEs. */
4813 int nargs = call_expr_nargs (*from_p), i;
4814 enum internal_fn ifn = CALL_EXPR_IFN (*from_p);
4815 auto_vec<tree> vargs (nargs);
4817 for (i = 0; i < nargs; i++)
4819 gimplify_arg (&CALL_EXPR_ARG (*from_p, i), pre_p,
4820 EXPR_LOCATION (*from_p));
4821 vargs.quick_push (CALL_EXPR_ARG (*from_p, i));
4823 call_stmt = gimple_build_call_internal_vec (ifn, vargs);
4824 gimple_set_location (call_stmt, EXPR_LOCATION (*expr_p));
4826 else
4828 tree fnptrtype = TREE_TYPE (CALL_EXPR_FN (*from_p));
4829 CALL_EXPR_FN (*from_p) = TREE_OPERAND (CALL_EXPR_FN (*from_p), 0);
4830 STRIP_USELESS_TYPE_CONVERSION (CALL_EXPR_FN (*from_p));
4831 tree fndecl = get_callee_fndecl (*from_p);
4832 if (fndecl
4833 && DECL_BUILT_IN_CLASS (fndecl) == BUILT_IN_NORMAL
4834 && DECL_FUNCTION_CODE (fndecl) == BUILT_IN_EXPECT
4835 && call_expr_nargs (*from_p) == 3)
4836 call_stmt = gimple_build_call_internal (IFN_BUILTIN_EXPECT, 3,
4837 CALL_EXPR_ARG (*from_p, 0),
4838 CALL_EXPR_ARG (*from_p, 1),
4839 CALL_EXPR_ARG (*from_p, 2));
4840 else
4842 call_stmt = gimple_build_call_from_tree (*from_p);
4843 gimple_call_set_fntype (call_stmt, TREE_TYPE (fnptrtype));
4846 notice_special_calls (call_stmt);
4847 if (!gimple_call_noreturn_p (call_stmt)
4848 || TREE_ADDRESSABLE (TREE_TYPE (*to_p))
4849 || TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (*to_p))) != INTEGER_CST)
4850 gimple_call_set_lhs (call_stmt, *to_p);
4851 assign = call_stmt;
4853 else
4855 assign = gimple_build_assign (*to_p, *from_p);
4856 gimple_set_location (assign, EXPR_LOCATION (*expr_p));
4857 if (COMPARISON_CLASS_P (*from_p))
4858 gimple_set_no_warning (assign, TREE_NO_WARNING (*from_p));
4861 if (gimplify_ctxp->into_ssa && is_gimple_reg (*to_p))
4863 /* We should have got an SSA name from the start. */
4864 gcc_assert (TREE_CODE (*to_p) == SSA_NAME);
4867 gimplify_seq_add_stmt (pre_p, assign);
4868 gsi = gsi_last (*pre_p);
4869 maybe_fold_stmt (&gsi);
4871 if (want_value)
4873 *expr_p = TREE_THIS_VOLATILE (*to_p) ? *from_p : unshare_expr (*to_p);
4874 return GS_OK;
4876 else
4877 *expr_p = NULL;
4879 return GS_ALL_DONE;
4882 /* Gimplify a comparison between two variable-sized objects. Do this
4883 with a call to BUILT_IN_MEMCMP. */
4885 static enum gimplify_status
4886 gimplify_variable_sized_compare (tree *expr_p)
4888 location_t loc = EXPR_LOCATION (*expr_p);
4889 tree op0 = TREE_OPERAND (*expr_p, 0);
4890 tree op1 = TREE_OPERAND (*expr_p, 1);
4891 tree t, arg, dest, src, expr;
4893 arg = TYPE_SIZE_UNIT (TREE_TYPE (op0));
4894 arg = unshare_expr (arg);
4895 arg = SUBSTITUTE_PLACEHOLDER_IN_EXPR (arg, op0);
4896 src = build_fold_addr_expr_loc (loc, op1);
4897 dest = build_fold_addr_expr_loc (loc, op0);
4898 t = builtin_decl_implicit (BUILT_IN_MEMCMP);
4899 t = build_call_expr_loc (loc, t, 3, dest, src, arg);
4901 expr
4902 = build2 (TREE_CODE (*expr_p), TREE_TYPE (*expr_p), t, integer_zero_node);
4903 SET_EXPR_LOCATION (expr, loc);
4904 *expr_p = expr;
4906 return GS_OK;
4909 /* Gimplify a comparison between two aggregate objects of integral scalar
4910 mode as a comparison between the bitwise equivalent scalar values. */
4912 static enum gimplify_status
4913 gimplify_scalar_mode_aggregate_compare (tree *expr_p)
4915 location_t loc = EXPR_LOCATION (*expr_p);
4916 tree op0 = TREE_OPERAND (*expr_p, 0);
4917 tree op1 = TREE_OPERAND (*expr_p, 1);
4919 tree type = TREE_TYPE (op0);
4920 tree scalar_type = lang_hooks.types.type_for_mode (TYPE_MODE (type), 1);
4922 op0 = fold_build1_loc (loc, VIEW_CONVERT_EXPR, scalar_type, op0);
4923 op1 = fold_build1_loc (loc, VIEW_CONVERT_EXPR, scalar_type, op1);
4925 *expr_p
4926 = fold_build2_loc (loc, TREE_CODE (*expr_p), TREE_TYPE (*expr_p), op0, op1);
4928 return GS_OK;
4931 /* Gimplify an expression sequence. This function gimplifies each
4932 expression and rewrites the original expression with the last
4933 expression of the sequence in GIMPLE form.
4935 PRE_P points to the list where the side effects for all the
4936 expressions in the sequence will be emitted.
4938 WANT_VALUE is true when the result of the last COMPOUND_EXPR is used. */
4940 static enum gimplify_status
4941 gimplify_compound_expr (tree *expr_p, gimple_seq *pre_p, bool want_value)
4943 tree t = *expr_p;
4947 tree *sub_p = &TREE_OPERAND (t, 0);
4949 if (TREE_CODE (*sub_p) == COMPOUND_EXPR)
4950 gimplify_compound_expr (sub_p, pre_p, false);
4951 else
4952 gimplify_stmt (sub_p, pre_p);
4954 t = TREE_OPERAND (t, 1);
4956 while (TREE_CODE (t) == COMPOUND_EXPR);
4958 *expr_p = t;
4959 if (want_value)
4960 return GS_OK;
4961 else
4963 gimplify_stmt (expr_p, pre_p);
4964 return GS_ALL_DONE;
4968 /* Gimplify a SAVE_EXPR node. EXPR_P points to the expression to
4969 gimplify. After gimplification, EXPR_P will point to a new temporary
4970 that holds the original value of the SAVE_EXPR node.
4972 PRE_P points to the list where side effects that must happen before
4973 *EXPR_P should be stored. */
4975 static enum gimplify_status
4976 gimplify_save_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
4978 enum gimplify_status ret = GS_ALL_DONE;
4979 tree val;
4981 gcc_assert (TREE_CODE (*expr_p) == SAVE_EXPR);
4982 val = TREE_OPERAND (*expr_p, 0);
4984 /* If the SAVE_EXPR has not been resolved, then evaluate it once. */
4985 if (!SAVE_EXPR_RESOLVED_P (*expr_p))
4987 /* The operand may be a void-valued expression such as SAVE_EXPRs
4988 generated by the Java frontend for class initialization. It is
4989 being executed only for its side-effects. */
4990 if (TREE_TYPE (val) == void_type_node)
4992 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
4993 is_gimple_stmt, fb_none);
4994 val = NULL;
4996 else
4997 val = get_initialized_tmp_var (val, pre_p, post_p);
4999 TREE_OPERAND (*expr_p, 0) = val;
5000 SAVE_EXPR_RESOLVED_P (*expr_p) = 1;
5003 *expr_p = val;
5005 return ret;
5008 /* Rewrite the ADDR_EXPR node pointed to by EXPR_P
5010 unary_expr
5011 : ...
5012 | '&' varname
5015 PRE_P points to the list where side effects that must happen before
5016 *EXPR_P should be stored.
5018 POST_P points to the list where side effects that must happen after
5019 *EXPR_P should be stored. */
5021 static enum gimplify_status
5022 gimplify_addr_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
5024 tree expr = *expr_p;
5025 tree op0 = TREE_OPERAND (expr, 0);
5026 enum gimplify_status ret;
5027 location_t loc = EXPR_LOCATION (*expr_p);
5029 switch (TREE_CODE (op0))
5031 case INDIRECT_REF:
5032 do_indirect_ref:
5033 /* Check if we are dealing with an expression of the form '&*ptr'.
5034 While the front end folds away '&*ptr' into 'ptr', these
5035 expressions may be generated internally by the compiler (e.g.,
5036 builtins like __builtin_va_end). */
5037 /* Caution: the silent array decomposition semantics we allow for
5038 ADDR_EXPR means we can't always discard the pair. */
5039 /* Gimplification of the ADDR_EXPR operand may drop
5040 cv-qualification conversions, so make sure we add them if
5041 needed. */
5043 tree op00 = TREE_OPERAND (op0, 0);
5044 tree t_expr = TREE_TYPE (expr);
5045 tree t_op00 = TREE_TYPE (op00);
5047 if (!useless_type_conversion_p (t_expr, t_op00))
5048 op00 = fold_convert_loc (loc, TREE_TYPE (expr), op00);
5049 *expr_p = op00;
5050 ret = GS_OK;
5052 break;
5054 case VIEW_CONVERT_EXPR:
5055 /* Take the address of our operand and then convert it to the type of
5056 this ADDR_EXPR.
5058 ??? The interactions of VIEW_CONVERT_EXPR and aliasing is not at
5059 all clear. The impact of this transformation is even less clear. */
5061 /* If the operand is a useless conversion, look through it. Doing so
5062 guarantees that the ADDR_EXPR and its operand will remain of the
5063 same type. */
5064 if (tree_ssa_useless_type_conversion (TREE_OPERAND (op0, 0)))
5065 op0 = TREE_OPERAND (op0, 0);
5067 *expr_p = fold_convert_loc (loc, TREE_TYPE (expr),
5068 build_fold_addr_expr_loc (loc,
5069 TREE_OPERAND (op0, 0)));
5070 ret = GS_OK;
5071 break;
5073 case MEM_REF:
5074 if (integer_zerop (TREE_OPERAND (op0, 1)))
5075 goto do_indirect_ref;
5077 /* ... fall through ... */
5079 default:
5080 /* If we see a call to a declared builtin or see its address
5081 being taken (we can unify those cases here) then we can mark
5082 the builtin for implicit generation by GCC. */
5083 if (TREE_CODE (op0) == FUNCTION_DECL
5084 && DECL_BUILT_IN_CLASS (op0) == BUILT_IN_NORMAL
5085 && builtin_decl_declared_p (DECL_FUNCTION_CODE (op0)))
5086 set_builtin_decl_implicit_p (DECL_FUNCTION_CODE (op0), true);
5088 /* We use fb_either here because the C frontend sometimes takes
5089 the address of a call that returns a struct; see
5090 gcc.dg/c99-array-lval-1.c. The gimplifier will correctly make
5091 the implied temporary explicit. */
5093 /* Make the operand addressable. */
5094 ret = gimplify_expr (&TREE_OPERAND (expr, 0), pre_p, post_p,
5095 is_gimple_addressable, fb_either);
5096 if (ret == GS_ERROR)
5097 break;
5099 /* Then mark it. Beware that it may not be possible to do so directly
5100 if a temporary has been created by the gimplification. */
5101 prepare_gimple_addressable (&TREE_OPERAND (expr, 0), pre_p);
5103 op0 = TREE_OPERAND (expr, 0);
5105 /* For various reasons, the gimplification of the expression
5106 may have made a new INDIRECT_REF. */
5107 if (TREE_CODE (op0) == INDIRECT_REF)
5108 goto do_indirect_ref;
5110 mark_addressable (TREE_OPERAND (expr, 0));
5112 /* The FEs may end up building ADDR_EXPRs early on a decl with
5113 an incomplete type. Re-build ADDR_EXPRs in canonical form
5114 here. */
5115 if (!types_compatible_p (TREE_TYPE (op0), TREE_TYPE (TREE_TYPE (expr))))
5116 *expr_p = build_fold_addr_expr (op0);
5118 /* Make sure TREE_CONSTANT and TREE_SIDE_EFFECTS are set properly. */
5119 recompute_tree_invariant_for_addr_expr (*expr_p);
5121 /* If we re-built the ADDR_EXPR add a conversion to the original type
5122 if required. */
5123 if (!useless_type_conversion_p (TREE_TYPE (expr), TREE_TYPE (*expr_p)))
5124 *expr_p = fold_convert (TREE_TYPE (expr), *expr_p);
5126 break;
5129 return ret;
5132 /* Gimplify the operands of an ASM_EXPR. Input operands should be a gimple
5133 value; output operands should be a gimple lvalue. */
5135 static enum gimplify_status
5136 gimplify_asm_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
5138 tree expr;
5139 int noutputs;
5140 const char **oconstraints;
5141 int i;
5142 tree link;
5143 const char *constraint;
5144 bool allows_mem, allows_reg, is_inout;
5145 enum gimplify_status ret, tret;
5146 gasm *stmt;
5147 vec<tree, va_gc> *inputs;
5148 vec<tree, va_gc> *outputs;
5149 vec<tree, va_gc> *clobbers;
5150 vec<tree, va_gc> *labels;
5151 tree link_next;
5153 expr = *expr_p;
5154 noutputs = list_length (ASM_OUTPUTS (expr));
5155 oconstraints = (const char **) alloca ((noutputs) * sizeof (const char *));
5157 inputs = NULL;
5158 outputs = NULL;
5159 clobbers = NULL;
5160 labels = NULL;
5162 ret = GS_ALL_DONE;
5163 link_next = NULL_TREE;
5164 for (i = 0, link = ASM_OUTPUTS (expr); link; ++i, link = link_next)
5166 bool ok;
5167 size_t constraint_len;
5169 link_next = TREE_CHAIN (link);
5171 oconstraints[i]
5172 = constraint
5173 = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link)));
5174 constraint_len = strlen (constraint);
5175 if (constraint_len == 0)
5176 continue;
5178 ok = parse_output_constraint (&constraint, i, 0, 0,
5179 &allows_mem, &allows_reg, &is_inout);
5180 if (!ok)
5182 ret = GS_ERROR;
5183 is_inout = false;
5186 if (!allows_reg && allows_mem)
5187 mark_addressable (TREE_VALUE (link));
5189 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
5190 is_inout ? is_gimple_min_lval : is_gimple_lvalue,
5191 fb_lvalue | fb_mayfail);
5192 if (tret == GS_ERROR)
5194 error ("invalid lvalue in asm output %d", i);
5195 ret = tret;
5198 /* If the constraint does not allow memory make sure we gimplify
5199 it to a register if it is not already but its base is. This
5200 happens for complex and vector components. */
5201 if (!allows_mem)
5203 tree op = TREE_VALUE (link);
5204 if (! is_gimple_val (op)
5205 && is_gimple_reg_type (TREE_TYPE (op))
5206 && is_gimple_reg (get_base_address (op)))
5208 tree tem = create_tmp_reg (TREE_TYPE (op));
5209 tree ass;
5210 if (is_inout)
5212 ass = build2 (MODIFY_EXPR, TREE_TYPE (tem),
5213 tem, unshare_expr (op));
5214 gimplify_and_add (ass, pre_p);
5216 ass = build2 (MODIFY_EXPR, TREE_TYPE (tem), op, tem);
5217 gimplify_and_add (ass, post_p);
5219 TREE_VALUE (link) = tem;
5220 tret = GS_OK;
5224 vec_safe_push (outputs, link);
5225 TREE_CHAIN (link) = NULL_TREE;
5227 if (is_inout)
5229 /* An input/output operand. To give the optimizers more
5230 flexibility, split it into separate input and output
5231 operands. */
5232 tree input;
5233 char buf[10];
5235 /* Turn the in/out constraint into an output constraint. */
5236 char *p = xstrdup (constraint);
5237 p[0] = '=';
5238 TREE_VALUE (TREE_PURPOSE (link)) = build_string (constraint_len, p);
5240 /* And add a matching input constraint. */
5241 if (allows_reg)
5243 sprintf (buf, "%d", i);
5245 /* If there are multiple alternatives in the constraint,
5246 handle each of them individually. Those that allow register
5247 will be replaced with operand number, the others will stay
5248 unchanged. */
5249 if (strchr (p, ',') != NULL)
5251 size_t len = 0, buflen = strlen (buf);
5252 char *beg, *end, *str, *dst;
5254 for (beg = p + 1;;)
5256 end = strchr (beg, ',');
5257 if (end == NULL)
5258 end = strchr (beg, '\0');
5259 if ((size_t) (end - beg) < buflen)
5260 len += buflen + 1;
5261 else
5262 len += end - beg + 1;
5263 if (*end)
5264 beg = end + 1;
5265 else
5266 break;
5269 str = (char *) alloca (len);
5270 for (beg = p + 1, dst = str;;)
5272 const char *tem;
5273 bool mem_p, reg_p, inout_p;
5275 end = strchr (beg, ',');
5276 if (end)
5277 *end = '\0';
5278 beg[-1] = '=';
5279 tem = beg - 1;
5280 parse_output_constraint (&tem, i, 0, 0,
5281 &mem_p, &reg_p, &inout_p);
5282 if (dst != str)
5283 *dst++ = ',';
5284 if (reg_p)
5286 memcpy (dst, buf, buflen);
5287 dst += buflen;
5289 else
5291 if (end)
5292 len = end - beg;
5293 else
5294 len = strlen (beg);
5295 memcpy (dst, beg, len);
5296 dst += len;
5298 if (end)
5299 beg = end + 1;
5300 else
5301 break;
5303 *dst = '\0';
5304 input = build_string (dst - str, str);
5306 else
5307 input = build_string (strlen (buf), buf);
5309 else
5310 input = build_string (constraint_len - 1, constraint + 1);
5312 free (p);
5314 input = build_tree_list (build_tree_list (NULL_TREE, input),
5315 unshare_expr (TREE_VALUE (link)));
5316 ASM_INPUTS (expr) = chainon (ASM_INPUTS (expr), input);
5320 link_next = NULL_TREE;
5321 for (link = ASM_INPUTS (expr); link; ++i, link = link_next)
5323 link_next = TREE_CHAIN (link);
5324 constraint = TREE_STRING_POINTER (TREE_VALUE (TREE_PURPOSE (link)));
5325 parse_input_constraint (&constraint, 0, 0, noutputs, 0,
5326 oconstraints, &allows_mem, &allows_reg);
5328 /* If we can't make copies, we can only accept memory. */
5329 if (TREE_ADDRESSABLE (TREE_TYPE (TREE_VALUE (link))))
5331 if (allows_mem)
5332 allows_reg = 0;
5333 else
5335 error ("impossible constraint in %<asm%>");
5336 error ("non-memory input %d must stay in memory", i);
5337 return GS_ERROR;
5341 /* If the operand is a memory input, it should be an lvalue. */
5342 if (!allows_reg && allows_mem)
5344 tree inputv = TREE_VALUE (link);
5345 STRIP_NOPS (inputv);
5346 if (TREE_CODE (inputv) == PREDECREMENT_EXPR
5347 || TREE_CODE (inputv) == PREINCREMENT_EXPR
5348 || TREE_CODE (inputv) == POSTDECREMENT_EXPR
5349 || TREE_CODE (inputv) == POSTINCREMENT_EXPR
5350 || TREE_CODE (inputv) == MODIFY_EXPR)
5351 TREE_VALUE (link) = error_mark_node;
5352 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
5353 is_gimple_lvalue, fb_lvalue | fb_mayfail);
5354 if (tret != GS_ERROR)
5356 /* Unlike output operands, memory inputs are not guaranteed
5357 to be lvalues by the FE, and while the expressions are
5358 marked addressable there, if it is e.g. a statement
5359 expression, temporaries in it might not end up being
5360 addressable. They might be already used in the IL and thus
5361 it is too late to make them addressable now though. */
5362 tree x = TREE_VALUE (link);
5363 while (handled_component_p (x))
5364 x = TREE_OPERAND (x, 0);
5365 if (TREE_CODE (x) == MEM_REF
5366 && TREE_CODE (TREE_OPERAND (x, 0)) == ADDR_EXPR)
5367 x = TREE_OPERAND (TREE_OPERAND (x, 0), 0);
5368 if ((TREE_CODE (x) == VAR_DECL
5369 || TREE_CODE (x) == PARM_DECL
5370 || TREE_CODE (x) == RESULT_DECL)
5371 && !TREE_ADDRESSABLE (x)
5372 && is_gimple_reg (x))
5374 warning_at (EXPR_LOC_OR_LOC (TREE_VALUE (link),
5375 input_location), 0,
5376 "memory input %d is not directly addressable",
5378 prepare_gimple_addressable (&TREE_VALUE (link), pre_p);
5381 mark_addressable (TREE_VALUE (link));
5382 if (tret == GS_ERROR)
5384 error_at (EXPR_LOC_OR_LOC (TREE_VALUE (link), input_location),
5385 "memory input %d is not directly addressable", i);
5386 ret = tret;
5389 else
5391 tret = gimplify_expr (&TREE_VALUE (link), pre_p, post_p,
5392 is_gimple_asm_val, fb_rvalue);
5393 if (tret == GS_ERROR)
5394 ret = tret;
5397 TREE_CHAIN (link) = NULL_TREE;
5398 vec_safe_push (inputs, link);
5401 link_next = NULL_TREE;
5402 for (link = ASM_CLOBBERS (expr); link; ++i, link = link_next)
5404 link_next = TREE_CHAIN (link);
5405 TREE_CHAIN (link) = NULL_TREE;
5406 vec_safe_push (clobbers, link);
5409 link_next = NULL_TREE;
5410 for (link = ASM_LABELS (expr); link; ++i, link = link_next)
5412 link_next = TREE_CHAIN (link);
5413 TREE_CHAIN (link) = NULL_TREE;
5414 vec_safe_push (labels, link);
5417 /* Do not add ASMs with errors to the gimple IL stream. */
5418 if (ret != GS_ERROR)
5420 stmt = gimple_build_asm_vec (TREE_STRING_POINTER (ASM_STRING (expr)),
5421 inputs, outputs, clobbers, labels);
5423 gimple_asm_set_volatile (stmt, ASM_VOLATILE_P (expr) || noutputs == 0);
5424 gimple_asm_set_input (stmt, ASM_INPUT_P (expr));
5426 gimplify_seq_add_stmt (pre_p, stmt);
5429 return ret;
5432 /* Gimplify a CLEANUP_POINT_EXPR. Currently this works by adding
5433 GIMPLE_WITH_CLEANUP_EXPRs to the prequeue as we encounter cleanups while
5434 gimplifying the body, and converting them to TRY_FINALLY_EXPRs when we
5435 return to this function.
5437 FIXME should we complexify the prequeue handling instead? Or use flags
5438 for all the cleanups and let the optimizer tighten them up? The current
5439 code seems pretty fragile; it will break on a cleanup within any
5440 non-conditional nesting. But any such nesting would be broken, anyway;
5441 we can't write a TRY_FINALLY_EXPR that starts inside a nesting construct
5442 and continues out of it. We can do that at the RTL level, though, so
5443 having an optimizer to tighten up try/finally regions would be a Good
5444 Thing. */
5446 static enum gimplify_status
5447 gimplify_cleanup_point_expr (tree *expr_p, gimple_seq *pre_p)
5449 gimple_stmt_iterator iter;
5450 gimple_seq body_sequence = NULL;
5452 tree temp = voidify_wrapper_expr (*expr_p, NULL);
5454 /* We only care about the number of conditions between the innermost
5455 CLEANUP_POINT_EXPR and the cleanup. So save and reset the count and
5456 any cleanups collected outside the CLEANUP_POINT_EXPR. */
5457 int old_conds = gimplify_ctxp->conditions;
5458 gimple_seq old_cleanups = gimplify_ctxp->conditional_cleanups;
5459 bool old_in_cleanup_point_expr = gimplify_ctxp->in_cleanup_point_expr;
5460 gimplify_ctxp->conditions = 0;
5461 gimplify_ctxp->conditional_cleanups = NULL;
5462 gimplify_ctxp->in_cleanup_point_expr = true;
5464 gimplify_stmt (&TREE_OPERAND (*expr_p, 0), &body_sequence);
5466 gimplify_ctxp->conditions = old_conds;
5467 gimplify_ctxp->conditional_cleanups = old_cleanups;
5468 gimplify_ctxp->in_cleanup_point_expr = old_in_cleanup_point_expr;
5470 for (iter = gsi_start (body_sequence); !gsi_end_p (iter); )
5472 gimple *wce = gsi_stmt (iter);
5474 if (gimple_code (wce) == GIMPLE_WITH_CLEANUP_EXPR)
5476 if (gsi_one_before_end_p (iter))
5478 /* Note that gsi_insert_seq_before and gsi_remove do not
5479 scan operands, unlike some other sequence mutators. */
5480 if (!gimple_wce_cleanup_eh_only (wce))
5481 gsi_insert_seq_before_without_update (&iter,
5482 gimple_wce_cleanup (wce),
5483 GSI_SAME_STMT);
5484 gsi_remove (&iter, true);
5485 break;
5487 else
5489 gtry *gtry;
5490 gimple_seq seq;
5491 enum gimple_try_flags kind;
5493 if (gimple_wce_cleanup_eh_only (wce))
5494 kind = GIMPLE_TRY_CATCH;
5495 else
5496 kind = GIMPLE_TRY_FINALLY;
5497 seq = gsi_split_seq_after (iter);
5499 gtry = gimple_build_try (seq, gimple_wce_cleanup (wce), kind);
5500 /* Do not use gsi_replace here, as it may scan operands.
5501 We want to do a simple structural modification only. */
5502 gsi_set_stmt (&iter, gtry);
5503 iter = gsi_start (gtry->eval);
5506 else
5507 gsi_next (&iter);
5510 gimplify_seq_add_seq (pre_p, body_sequence);
5511 if (temp)
5513 *expr_p = temp;
5514 return GS_OK;
5516 else
5518 *expr_p = NULL;
5519 return GS_ALL_DONE;
5523 /* Insert a cleanup marker for gimplify_cleanup_point_expr. CLEANUP
5524 is the cleanup action required. EH_ONLY is true if the cleanup should
5525 only be executed if an exception is thrown, not on normal exit. */
5527 static void
5528 gimple_push_cleanup (tree var, tree cleanup, bool eh_only, gimple_seq *pre_p)
5530 gimple *wce;
5531 gimple_seq cleanup_stmts = NULL;
5533 /* Errors can result in improperly nested cleanups. Which results in
5534 confusion when trying to resolve the GIMPLE_WITH_CLEANUP_EXPR. */
5535 if (seen_error ())
5536 return;
5538 if (gimple_conditional_context ())
5540 /* If we're in a conditional context, this is more complex. We only
5541 want to run the cleanup if we actually ran the initialization that
5542 necessitates it, but we want to run it after the end of the
5543 conditional context. So we wrap the try/finally around the
5544 condition and use a flag to determine whether or not to actually
5545 run the destructor. Thus
5547 test ? f(A()) : 0
5549 becomes (approximately)
5551 flag = 0;
5552 try {
5553 if (test) { A::A(temp); flag = 1; val = f(temp); }
5554 else { val = 0; }
5555 } finally {
5556 if (flag) A::~A(temp);
5560 tree flag = create_tmp_var (boolean_type_node, "cleanup");
5561 gassign *ffalse = gimple_build_assign (flag, boolean_false_node);
5562 gassign *ftrue = gimple_build_assign (flag, boolean_true_node);
5564 cleanup = build3 (COND_EXPR, void_type_node, flag, cleanup, NULL);
5565 gimplify_stmt (&cleanup, &cleanup_stmts);
5566 wce = gimple_build_wce (cleanup_stmts);
5568 gimplify_seq_add_stmt (&gimplify_ctxp->conditional_cleanups, ffalse);
5569 gimplify_seq_add_stmt (&gimplify_ctxp->conditional_cleanups, wce);
5570 gimplify_seq_add_stmt (pre_p, ftrue);
5572 /* Because of this manipulation, and the EH edges that jump
5573 threading cannot redirect, the temporary (VAR) will appear
5574 to be used uninitialized. Don't warn. */
5575 TREE_NO_WARNING (var) = 1;
5577 else
5579 gimplify_stmt (&cleanup, &cleanup_stmts);
5580 wce = gimple_build_wce (cleanup_stmts);
5581 gimple_wce_set_cleanup_eh_only (wce, eh_only);
5582 gimplify_seq_add_stmt (pre_p, wce);
5586 /* Gimplify a TARGET_EXPR which doesn't appear on the rhs of an INIT_EXPR. */
5588 static enum gimplify_status
5589 gimplify_target_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p)
5591 tree targ = *expr_p;
5592 tree temp = TARGET_EXPR_SLOT (targ);
5593 tree init = TARGET_EXPR_INITIAL (targ);
5594 enum gimplify_status ret;
5596 if (init)
5598 tree cleanup = NULL_TREE;
5600 /* TARGET_EXPR temps aren't part of the enclosing block, so add it
5601 to the temps list. Handle also variable length TARGET_EXPRs. */
5602 if (TREE_CODE (DECL_SIZE (temp)) != INTEGER_CST)
5604 if (!TYPE_SIZES_GIMPLIFIED (TREE_TYPE (temp)))
5605 gimplify_type_sizes (TREE_TYPE (temp), pre_p);
5606 gimplify_vla_decl (temp, pre_p);
5608 else
5609 gimple_add_tmp_var (temp);
5611 /* If TARGET_EXPR_INITIAL is void, then the mere evaluation of the
5612 expression is supposed to initialize the slot. */
5613 if (VOID_TYPE_P (TREE_TYPE (init)))
5614 ret = gimplify_expr (&init, pre_p, post_p, is_gimple_stmt, fb_none);
5615 else
5617 tree init_expr = build2 (INIT_EXPR, void_type_node, temp, init);
5618 init = init_expr;
5619 ret = gimplify_expr (&init, pre_p, post_p, is_gimple_stmt, fb_none);
5620 init = NULL;
5621 ggc_free (init_expr);
5623 if (ret == GS_ERROR)
5625 /* PR c++/28266 Make sure this is expanded only once. */
5626 TARGET_EXPR_INITIAL (targ) = NULL_TREE;
5627 return GS_ERROR;
5629 if (init)
5630 gimplify_and_add (init, pre_p);
5632 /* If needed, push the cleanup for the temp. */
5633 if (TARGET_EXPR_CLEANUP (targ))
5635 if (CLEANUP_EH_ONLY (targ))
5636 gimple_push_cleanup (temp, TARGET_EXPR_CLEANUP (targ),
5637 CLEANUP_EH_ONLY (targ), pre_p);
5638 else
5639 cleanup = TARGET_EXPR_CLEANUP (targ);
5642 /* Add a clobber for the temporary going out of scope, like
5643 gimplify_bind_expr. */
5644 if (gimplify_ctxp->in_cleanup_point_expr
5645 && needs_to_live_in_memory (temp)
5646 && flag_stack_reuse == SR_ALL)
5648 tree clobber = build_constructor (TREE_TYPE (temp),
5649 NULL);
5650 TREE_THIS_VOLATILE (clobber) = true;
5651 clobber = build2 (MODIFY_EXPR, TREE_TYPE (temp), temp, clobber);
5652 if (cleanup)
5653 cleanup = build2 (COMPOUND_EXPR, void_type_node, cleanup,
5654 clobber);
5655 else
5656 cleanup = clobber;
5659 if (cleanup)
5660 gimple_push_cleanup (temp, cleanup, false, pre_p);
5662 /* Only expand this once. */
5663 TREE_OPERAND (targ, 3) = init;
5664 TARGET_EXPR_INITIAL (targ) = NULL_TREE;
5666 else
5667 /* We should have expanded this before. */
5668 gcc_assert (DECL_SEEN_IN_BIND_EXPR_P (temp));
5670 *expr_p = temp;
5671 return GS_OK;
5674 /* Gimplification of expression trees. */
5676 /* Gimplify an expression which appears at statement context. The
5677 corresponding GIMPLE statements are added to *SEQ_P. If *SEQ_P is
5678 NULL, a new sequence is allocated.
5680 Return true if we actually added a statement to the queue. */
5682 bool
5683 gimplify_stmt (tree *stmt_p, gimple_seq *seq_p)
5685 gimple_seq_node last;
5687 last = gimple_seq_last (*seq_p);
5688 gimplify_expr (stmt_p, seq_p, NULL, is_gimple_stmt, fb_none);
5689 return last != gimple_seq_last (*seq_p);
5692 /* Add FIRSTPRIVATE entries for DECL in the OpenMP the surrounding parallels
5693 to CTX. If entries already exist, force them to be some flavor of private.
5694 If there is no enclosing parallel, do nothing. */
5696 void
5697 omp_firstprivatize_variable (struct gimplify_omp_ctx *ctx, tree decl)
5699 splay_tree_node n;
5701 if (decl == NULL || !DECL_P (decl) || ctx->region_type == ORT_NONE)
5702 return;
5706 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5707 if (n != NULL)
5709 if (n->value & GOVD_SHARED)
5710 n->value = GOVD_FIRSTPRIVATE | (n->value & GOVD_SEEN);
5711 else if (n->value & GOVD_MAP)
5712 n->value |= GOVD_MAP_TO_ONLY;
5713 else
5714 return;
5716 else if ((ctx->region_type & ORT_TARGET) != 0)
5718 if (ctx->target_map_scalars_firstprivate)
5719 omp_add_variable (ctx, decl, GOVD_FIRSTPRIVATE);
5720 else
5721 omp_add_variable (ctx, decl, GOVD_MAP | GOVD_MAP_TO_ONLY);
5723 else if (ctx->region_type != ORT_WORKSHARE
5724 && ctx->region_type != ORT_SIMD
5725 && ctx->region_type != ORT_ACC
5726 && !(ctx->region_type & ORT_TARGET_DATA))
5727 omp_add_variable (ctx, decl, GOVD_FIRSTPRIVATE);
5729 ctx = ctx->outer_context;
5731 while (ctx);
5734 /* Similarly for each of the type sizes of TYPE. */
5736 static void
5737 omp_firstprivatize_type_sizes (struct gimplify_omp_ctx *ctx, tree type)
5739 if (type == NULL || type == error_mark_node)
5740 return;
5741 type = TYPE_MAIN_VARIANT (type);
5743 if (ctx->privatized_types->add (type))
5744 return;
5746 switch (TREE_CODE (type))
5748 case INTEGER_TYPE:
5749 case ENUMERAL_TYPE:
5750 case BOOLEAN_TYPE:
5751 case REAL_TYPE:
5752 case FIXED_POINT_TYPE:
5753 omp_firstprivatize_variable (ctx, TYPE_MIN_VALUE (type));
5754 omp_firstprivatize_variable (ctx, TYPE_MAX_VALUE (type));
5755 break;
5757 case ARRAY_TYPE:
5758 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (type));
5759 omp_firstprivatize_type_sizes (ctx, TYPE_DOMAIN (type));
5760 break;
5762 case RECORD_TYPE:
5763 case UNION_TYPE:
5764 case QUAL_UNION_TYPE:
5766 tree field;
5767 for (field = TYPE_FIELDS (type); field; field = DECL_CHAIN (field))
5768 if (TREE_CODE (field) == FIELD_DECL)
5770 omp_firstprivatize_variable (ctx, DECL_FIELD_OFFSET (field));
5771 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (field));
5774 break;
5776 case POINTER_TYPE:
5777 case REFERENCE_TYPE:
5778 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (type));
5779 break;
5781 default:
5782 break;
5785 omp_firstprivatize_variable (ctx, TYPE_SIZE (type));
5786 omp_firstprivatize_variable (ctx, TYPE_SIZE_UNIT (type));
5787 lang_hooks.types.omp_firstprivatize_type_sizes (ctx, type);
5790 /* Add an entry for DECL in the OMP context CTX with FLAGS. */
5792 static void
5793 omp_add_variable (struct gimplify_omp_ctx *ctx, tree decl, unsigned int flags)
5795 splay_tree_node n;
5796 unsigned int nflags;
5797 tree t;
5799 if (error_operand_p (decl) || ctx->region_type == ORT_NONE)
5800 return;
5802 /* Never elide decls whose type has TREE_ADDRESSABLE set. This means
5803 there are constructors involved somewhere. */
5804 if (TREE_ADDRESSABLE (TREE_TYPE (decl))
5805 || TYPE_NEEDS_CONSTRUCTING (TREE_TYPE (decl)))
5806 flags |= GOVD_SEEN;
5808 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5809 if (n != NULL && (n->value & GOVD_DATA_SHARE_CLASS) != 0)
5811 /* We shouldn't be re-adding the decl with the same data
5812 sharing class. */
5813 gcc_assert ((n->value & GOVD_DATA_SHARE_CLASS & flags) == 0);
5814 nflags = n->value | flags;
5815 /* The only combination of data sharing classes we should see is
5816 FIRSTPRIVATE and LASTPRIVATE. However, OpenACC permits
5817 reduction variables to be used in data sharing clauses. */
5818 gcc_assert ((ctx->region_type & ORT_ACC) != 0
5819 || ((nflags & GOVD_DATA_SHARE_CLASS)
5820 == (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE))
5821 || (flags & GOVD_DATA_SHARE_CLASS) == 0);
5822 n->value = nflags;
5823 return;
5826 /* When adding a variable-sized variable, we have to handle all sorts
5827 of additional bits of data: the pointer replacement variable, and
5828 the parameters of the type. */
5829 if (DECL_SIZE (decl) && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
5831 /* Add the pointer replacement variable as PRIVATE if the variable
5832 replacement is private, else FIRSTPRIVATE since we'll need the
5833 address of the original variable either for SHARED, or for the
5834 copy into or out of the context. */
5835 if (!(flags & GOVD_LOCAL))
5837 if (flags & GOVD_MAP)
5838 nflags = GOVD_MAP | GOVD_MAP_TO_ONLY | GOVD_EXPLICIT;
5839 else if (flags & GOVD_PRIVATE)
5840 nflags = GOVD_PRIVATE;
5841 else if ((ctx->region_type & (ORT_TARGET | ORT_TARGET_DATA)) != 0
5842 && (flags & GOVD_FIRSTPRIVATE))
5843 nflags = GOVD_PRIVATE | GOVD_EXPLICIT;
5844 else
5845 nflags = GOVD_FIRSTPRIVATE;
5846 nflags |= flags & GOVD_SEEN;
5847 t = DECL_VALUE_EXPR (decl);
5848 gcc_assert (TREE_CODE (t) == INDIRECT_REF);
5849 t = TREE_OPERAND (t, 0);
5850 gcc_assert (DECL_P (t));
5851 omp_add_variable (ctx, t, nflags);
5854 /* Add all of the variable and type parameters (which should have
5855 been gimplified to a formal temporary) as FIRSTPRIVATE. */
5856 omp_firstprivatize_variable (ctx, DECL_SIZE_UNIT (decl));
5857 omp_firstprivatize_variable (ctx, DECL_SIZE (decl));
5858 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (decl));
5860 /* The variable-sized variable itself is never SHARED, only some form
5861 of PRIVATE. The sharing would take place via the pointer variable
5862 which we remapped above. */
5863 if (flags & GOVD_SHARED)
5864 flags = GOVD_PRIVATE | GOVD_DEBUG_PRIVATE
5865 | (flags & (GOVD_SEEN | GOVD_EXPLICIT));
5867 /* We're going to make use of the TYPE_SIZE_UNIT at least in the
5868 alloca statement we generate for the variable, so make sure it
5869 is available. This isn't automatically needed for the SHARED
5870 case, since we won't be allocating local storage then.
5871 For local variables TYPE_SIZE_UNIT might not be gimplified yet,
5872 in this case omp_notice_variable will be called later
5873 on when it is gimplified. */
5874 else if (! (flags & (GOVD_LOCAL | GOVD_MAP))
5875 && DECL_P (TYPE_SIZE_UNIT (TREE_TYPE (decl))))
5876 omp_notice_variable (ctx, TYPE_SIZE_UNIT (TREE_TYPE (decl)), true);
5878 else if ((flags & (GOVD_MAP | GOVD_LOCAL)) == 0
5879 && lang_hooks.decls.omp_privatize_by_reference (decl))
5881 omp_firstprivatize_type_sizes (ctx, TREE_TYPE (decl));
5883 /* Similar to the direct variable sized case above, we'll need the
5884 size of references being privatized. */
5885 if ((flags & GOVD_SHARED) == 0)
5887 t = TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl)));
5888 if (DECL_P (t))
5889 omp_notice_variable (ctx, t, true);
5893 if (n != NULL)
5894 n->value |= flags;
5895 else
5896 splay_tree_insert (ctx->variables, (splay_tree_key)decl, flags);
5899 /* Notice a threadprivate variable DECL used in OMP context CTX.
5900 This just prints out diagnostics about threadprivate variable uses
5901 in untied tasks. If DECL2 is non-NULL, prevent this warning
5902 on that variable. */
5904 static bool
5905 omp_notice_threadprivate_variable (struct gimplify_omp_ctx *ctx, tree decl,
5906 tree decl2)
5908 splay_tree_node n;
5909 struct gimplify_omp_ctx *octx;
5911 for (octx = ctx; octx; octx = octx->outer_context)
5912 if ((octx->region_type & ORT_TARGET) != 0)
5914 n = splay_tree_lookup (octx->variables, (splay_tree_key)decl);
5915 if (n == NULL)
5917 error ("threadprivate variable %qE used in target region",
5918 DECL_NAME (decl));
5919 error_at (octx->location, "enclosing target region");
5920 splay_tree_insert (octx->variables, (splay_tree_key)decl, 0);
5922 if (decl2)
5923 splay_tree_insert (octx->variables, (splay_tree_key)decl2, 0);
5926 if (ctx->region_type != ORT_UNTIED_TASK)
5927 return false;
5928 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
5929 if (n == NULL)
5931 error ("threadprivate variable %qE used in untied task",
5932 DECL_NAME (decl));
5933 error_at (ctx->location, "enclosing task");
5934 splay_tree_insert (ctx->variables, (splay_tree_key)decl, 0);
5936 if (decl2)
5937 splay_tree_insert (ctx->variables, (splay_tree_key)decl2, 0);
5938 return false;
5941 /* Return true if global var DECL is device resident. */
5943 static bool
5944 device_resident_p (tree decl)
5946 tree attr = lookup_attribute ("oacc declare target", DECL_ATTRIBUTES (decl));
5948 if (!attr)
5949 return false;
5951 for (tree t = TREE_VALUE (attr); t; t = TREE_PURPOSE (t))
5953 tree c = TREE_VALUE (t);
5954 if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_DEVICE_RESIDENT)
5955 return true;
5958 return false;
5961 /* Determine outer default flags for DECL mentioned in an OMP region
5962 but not declared in an enclosing clause.
5964 ??? Some compiler-generated variables (like SAVE_EXPRs) could be
5965 remapped firstprivate instead of shared. To some extent this is
5966 addressed in omp_firstprivatize_type_sizes, but not
5967 effectively. */
5969 static unsigned
5970 omp_default_clause (struct gimplify_omp_ctx *ctx, tree decl,
5971 bool in_code, unsigned flags)
5973 enum omp_clause_default_kind default_kind = ctx->default_kind;
5974 enum omp_clause_default_kind kind;
5976 kind = lang_hooks.decls.omp_predetermined_sharing (decl);
5977 if (kind != OMP_CLAUSE_DEFAULT_UNSPECIFIED)
5978 default_kind = kind;
5980 switch (default_kind)
5982 case OMP_CLAUSE_DEFAULT_NONE:
5984 const char *rtype;
5986 if (ctx->region_type & ORT_PARALLEL)
5987 rtype = "parallel";
5988 else if (ctx->region_type & ORT_TASK)
5989 rtype = "task";
5990 else if (ctx->region_type & ORT_TEAMS)
5991 rtype = "teams";
5992 else
5993 gcc_unreachable ();
5995 error ("%qE not specified in enclosing %s",
5996 DECL_NAME (lang_hooks.decls.omp_report_decl (decl)), rtype);
5997 error_at (ctx->location, "enclosing %s", rtype);
5999 /* FALLTHRU */
6000 case OMP_CLAUSE_DEFAULT_SHARED:
6001 flags |= GOVD_SHARED;
6002 break;
6003 case OMP_CLAUSE_DEFAULT_PRIVATE:
6004 flags |= GOVD_PRIVATE;
6005 break;
6006 case OMP_CLAUSE_DEFAULT_FIRSTPRIVATE:
6007 flags |= GOVD_FIRSTPRIVATE;
6008 break;
6009 case OMP_CLAUSE_DEFAULT_UNSPECIFIED:
6010 /* decl will be either GOVD_FIRSTPRIVATE or GOVD_SHARED. */
6011 gcc_assert ((ctx->region_type & ORT_TASK) != 0);
6012 if (struct gimplify_omp_ctx *octx = ctx->outer_context)
6014 omp_notice_variable (octx, decl, in_code);
6015 for (; octx; octx = octx->outer_context)
6017 splay_tree_node n2;
6019 n2 = splay_tree_lookup (octx->variables, (splay_tree_key) decl);
6020 if ((octx->region_type & (ORT_TARGET_DATA | ORT_TARGET)) != 0
6021 && (n2 == NULL || (n2->value & GOVD_DATA_SHARE_CLASS) == 0))
6022 continue;
6023 if (n2 && (n2->value & GOVD_DATA_SHARE_CLASS) != GOVD_SHARED)
6025 flags |= GOVD_FIRSTPRIVATE;
6026 goto found_outer;
6028 if ((octx->region_type & (ORT_PARALLEL | ORT_TEAMS)) != 0)
6030 flags |= GOVD_SHARED;
6031 goto found_outer;
6036 if (TREE_CODE (decl) == PARM_DECL
6037 || (!is_global_var (decl)
6038 && DECL_CONTEXT (decl) == current_function_decl))
6039 flags |= GOVD_FIRSTPRIVATE;
6040 else
6041 flags |= GOVD_SHARED;
6042 found_outer:
6043 break;
6045 default:
6046 gcc_unreachable ();
6049 return flags;
6053 /* Determine outer default flags for DECL mentioned in an OACC region
6054 but not declared in an enclosing clause. */
6056 static unsigned
6057 oacc_default_clause (struct gimplify_omp_ctx *ctx, tree decl, unsigned flags)
6059 const char *rkind;
6060 bool on_device = false;
6061 tree type = TREE_TYPE (decl);
6063 if (lang_hooks.decls.omp_privatize_by_reference (decl))
6064 type = TREE_TYPE (type);
6066 if ((ctx->region_type & (ORT_ACC_PARALLEL | ORT_ACC_KERNELS)) != 0
6067 && is_global_var (decl)
6068 && device_resident_p (decl))
6070 on_device = true;
6071 flags |= GOVD_MAP_TO_ONLY;
6074 switch (ctx->region_type)
6076 default:
6077 gcc_unreachable ();
6079 case ORT_ACC_KERNELS:
6080 /* Scalars are default 'copy' under kernels, non-scalars are default
6081 'present_or_copy'. */
6082 flags |= GOVD_MAP;
6083 if (!AGGREGATE_TYPE_P (type))
6084 flags |= GOVD_MAP_FORCE;
6086 rkind = "kernels";
6087 break;
6089 case ORT_ACC_PARALLEL:
6091 if (on_device || AGGREGATE_TYPE_P (type))
6092 /* Aggregates default to 'present_or_copy'. */
6093 flags |= GOVD_MAP;
6094 else
6095 /* Scalars default to 'firstprivate'. */
6096 flags |= GOVD_FIRSTPRIVATE;
6097 rkind = "parallel";
6099 break;
6102 if (DECL_ARTIFICIAL (decl))
6103 ; /* We can get compiler-generated decls, and should not complain
6104 about them. */
6105 else if (ctx->default_kind == OMP_CLAUSE_DEFAULT_NONE)
6107 error ("%qE not specified in enclosing OpenACC %qs construct",
6108 DECL_NAME (lang_hooks.decls.omp_report_decl (decl)), rkind);
6109 inform (ctx->location, "enclosing OpenACC %qs construct", rkind);
6111 else
6112 gcc_checking_assert (ctx->default_kind == OMP_CLAUSE_DEFAULT_SHARED);
6114 return flags;
6117 /* Record the fact that DECL was used within the OMP context CTX.
6118 IN_CODE is true when real code uses DECL, and false when we should
6119 merely emit default(none) errors. Return true if DECL is going to
6120 be remapped and thus DECL shouldn't be gimplified into its
6121 DECL_VALUE_EXPR (if any). */
6123 static bool
6124 omp_notice_variable (struct gimplify_omp_ctx *ctx, tree decl, bool in_code)
6126 splay_tree_node n;
6127 unsigned flags = in_code ? GOVD_SEEN : 0;
6128 bool ret = false, shared;
6130 if (error_operand_p (decl))
6131 return false;
6133 if (ctx->region_type == ORT_NONE)
6134 return lang_hooks.decls.omp_disregard_value_expr (decl, false);
6136 if (is_global_var (decl))
6138 /* Threadprivate variables are predetermined. */
6139 if (DECL_THREAD_LOCAL_P (decl))
6140 return omp_notice_threadprivate_variable (ctx, decl, NULL_TREE);
6142 if (DECL_HAS_VALUE_EXPR_P (decl))
6144 tree value = get_base_address (DECL_VALUE_EXPR (decl));
6146 if (value && DECL_P (value) && DECL_THREAD_LOCAL_P (value))
6147 return omp_notice_threadprivate_variable (ctx, decl, value);
6150 if (gimplify_omp_ctxp->outer_context == NULL
6151 && VAR_P (decl)
6152 && get_oacc_fn_attrib (current_function_decl))
6154 location_t loc = DECL_SOURCE_LOCATION (decl);
6156 if (lookup_attribute ("omp declare target link",
6157 DECL_ATTRIBUTES (decl)))
6159 error_at (loc,
6160 "%qE with %<link%> clause used in %<routine%> function",
6161 DECL_NAME (decl));
6162 return false;
6164 else if (!lookup_attribute ("omp declare target",
6165 DECL_ATTRIBUTES (decl)))
6167 error_at (loc,
6168 "%qE requires a %<declare%> directive for use "
6169 "in a %<routine%> function", DECL_NAME (decl));
6170 return false;
6175 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
6176 if ((ctx->region_type & ORT_TARGET) != 0)
6178 ret = lang_hooks.decls.omp_disregard_value_expr (decl, true);
6179 if (n == NULL)
6181 unsigned nflags = flags;
6182 if (ctx->target_map_pointers_as_0len_arrays
6183 || ctx->target_map_scalars_firstprivate)
6185 bool is_declare_target = false;
6186 bool is_scalar = false;
6187 if (is_global_var (decl)
6188 && varpool_node::get_create (decl)->offloadable)
6190 struct gimplify_omp_ctx *octx;
6191 for (octx = ctx->outer_context;
6192 octx; octx = octx->outer_context)
6194 n = splay_tree_lookup (octx->variables,
6195 (splay_tree_key)decl);
6196 if (n
6197 && (n->value & GOVD_DATA_SHARE_CLASS) != GOVD_SHARED
6198 && (n->value & GOVD_DATA_SHARE_CLASS) != 0)
6199 break;
6201 is_declare_target = octx == NULL;
6203 if (!is_declare_target && ctx->target_map_scalars_firstprivate)
6205 tree type = TREE_TYPE (decl);
6206 if (TREE_CODE (type) == REFERENCE_TYPE)
6207 type = TREE_TYPE (type);
6208 if (TREE_CODE (type) == COMPLEX_TYPE)
6209 type = TREE_TYPE (type);
6210 if (INTEGRAL_TYPE_P (type)
6211 || SCALAR_FLOAT_TYPE_P (type)
6212 || TREE_CODE (type) == POINTER_TYPE)
6213 is_scalar = true;
6215 if (is_declare_target)
6217 else if (ctx->target_map_pointers_as_0len_arrays
6218 && (TREE_CODE (TREE_TYPE (decl)) == POINTER_TYPE
6219 || (TREE_CODE (TREE_TYPE (decl)) == REFERENCE_TYPE
6220 && TREE_CODE (TREE_TYPE (TREE_TYPE (decl)))
6221 == POINTER_TYPE)))
6222 nflags |= GOVD_MAP | GOVD_MAP_0LEN_ARRAY;
6223 else if (is_scalar)
6224 nflags |= GOVD_FIRSTPRIVATE;
6227 struct gimplify_omp_ctx *octx = ctx->outer_context;
6228 if ((ctx->region_type & ORT_ACC) && octx)
6230 /* Look in outer OpenACC contexts, to see if there's a
6231 data attribute for this variable. */
6232 omp_notice_variable (octx, decl, in_code);
6234 for (; octx; octx = octx->outer_context)
6236 if (!(octx->region_type & (ORT_TARGET_DATA | ORT_TARGET)))
6237 break;
6238 splay_tree_node n2
6239 = splay_tree_lookup (octx->variables,
6240 (splay_tree_key) decl);
6241 if (n2)
6243 if (octx->region_type == ORT_ACC_HOST_DATA)
6244 error ("variable %qE declared in enclosing "
6245 "%<host_data%> region", DECL_NAME (decl));
6246 nflags |= GOVD_MAP;
6247 goto found_outer;
6253 tree type = TREE_TYPE (decl);
6255 if (nflags == flags
6256 && gimplify_omp_ctxp->target_firstprivatize_array_bases
6257 && lang_hooks.decls.omp_privatize_by_reference (decl))
6258 type = TREE_TYPE (type);
6259 if (nflags == flags
6260 && !lang_hooks.types.omp_mappable_type (type))
6262 error ("%qD referenced in target region does not have "
6263 "a mappable type", decl);
6264 nflags |= GOVD_MAP | GOVD_EXPLICIT;
6266 else if (nflags == flags)
6268 if ((ctx->region_type & ORT_ACC) != 0)
6269 nflags = oacc_default_clause (ctx, decl, flags);
6270 else
6271 nflags |= GOVD_MAP;
6274 found_outer:
6275 omp_add_variable (ctx, decl, nflags);
6277 else
6279 /* If nothing changed, there's nothing left to do. */
6280 if ((n->value & flags) == flags)
6281 return ret;
6282 flags |= n->value;
6283 n->value = flags;
6285 goto do_outer;
6288 if (n == NULL)
6290 if (ctx->region_type == ORT_WORKSHARE
6291 || ctx->region_type == ORT_SIMD
6292 || ctx->region_type == ORT_ACC
6293 || (ctx->region_type & ORT_TARGET_DATA) != 0)
6294 goto do_outer;
6296 flags = omp_default_clause (ctx, decl, in_code, flags);
6298 if ((flags & GOVD_PRIVATE)
6299 && lang_hooks.decls.omp_private_outer_ref (decl))
6300 flags |= GOVD_PRIVATE_OUTER_REF;
6302 omp_add_variable (ctx, decl, flags);
6304 shared = (flags & GOVD_SHARED) != 0;
6305 ret = lang_hooks.decls.omp_disregard_value_expr (decl, shared);
6306 goto do_outer;
6309 if ((n->value & (GOVD_SEEN | GOVD_LOCAL)) == 0
6310 && (flags & (GOVD_SEEN | GOVD_LOCAL)) == GOVD_SEEN
6311 && DECL_SIZE (decl))
6313 if (TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
6315 splay_tree_node n2;
6316 tree t = DECL_VALUE_EXPR (decl);
6317 gcc_assert (TREE_CODE (t) == INDIRECT_REF);
6318 t = TREE_OPERAND (t, 0);
6319 gcc_assert (DECL_P (t));
6320 n2 = splay_tree_lookup (ctx->variables, (splay_tree_key) t);
6321 n2->value |= GOVD_SEEN;
6323 else if (lang_hooks.decls.omp_privatize_by_reference (decl)
6324 && TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl)))
6325 && (TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl))))
6326 != INTEGER_CST))
6328 splay_tree_node n2;
6329 tree t = TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl)));
6330 gcc_assert (DECL_P (t));
6331 n2 = splay_tree_lookup (ctx->variables, (splay_tree_key) t);
6332 if (n2)
6333 n2->value |= GOVD_SEEN;
6337 shared = ((flags | n->value) & GOVD_SHARED) != 0;
6338 ret = lang_hooks.decls.omp_disregard_value_expr (decl, shared);
6340 /* If nothing changed, there's nothing left to do. */
6341 if ((n->value & flags) == flags)
6342 return ret;
6343 flags |= n->value;
6344 n->value = flags;
6346 do_outer:
6347 /* If the variable is private in the current context, then we don't
6348 need to propagate anything to an outer context. */
6349 if ((flags & GOVD_PRIVATE) && !(flags & GOVD_PRIVATE_OUTER_REF))
6350 return ret;
6351 if ((flags & (GOVD_LINEAR | GOVD_LINEAR_LASTPRIVATE_NO_OUTER))
6352 == (GOVD_LINEAR | GOVD_LINEAR_LASTPRIVATE_NO_OUTER))
6353 return ret;
6354 if ((flags & (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE
6355 | GOVD_LINEAR_LASTPRIVATE_NO_OUTER))
6356 == (GOVD_LASTPRIVATE | GOVD_LINEAR_LASTPRIVATE_NO_OUTER))
6357 return ret;
6358 if (ctx->outer_context
6359 && omp_notice_variable (ctx->outer_context, decl, in_code))
6360 return true;
6361 return ret;
6364 /* Verify that DECL is private within CTX. If there's specific information
6365 to the contrary in the innermost scope, generate an error. */
6367 static bool
6368 omp_is_private (struct gimplify_omp_ctx *ctx, tree decl, int simd)
6370 splay_tree_node n;
6372 n = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
6373 if (n != NULL)
6375 if (n->value & GOVD_SHARED)
6377 if (ctx == gimplify_omp_ctxp)
6379 if (simd)
6380 error ("iteration variable %qE is predetermined linear",
6381 DECL_NAME (decl));
6382 else
6383 error ("iteration variable %qE should be private",
6384 DECL_NAME (decl));
6385 n->value = GOVD_PRIVATE;
6386 return true;
6388 else
6389 return false;
6391 else if ((n->value & GOVD_EXPLICIT) != 0
6392 && (ctx == gimplify_omp_ctxp
6393 || (ctx->region_type == ORT_COMBINED_PARALLEL
6394 && gimplify_omp_ctxp->outer_context == ctx)))
6396 if ((n->value & GOVD_FIRSTPRIVATE) != 0)
6397 error ("iteration variable %qE should not be firstprivate",
6398 DECL_NAME (decl));
6399 else if ((n->value & GOVD_REDUCTION) != 0)
6400 error ("iteration variable %qE should not be reduction",
6401 DECL_NAME (decl));
6402 else if (simd == 0 && (n->value & GOVD_LINEAR) != 0)
6403 error ("iteration variable %qE should not be linear",
6404 DECL_NAME (decl));
6405 else if (simd == 1 && (n->value & GOVD_LASTPRIVATE) != 0)
6406 error ("iteration variable %qE should not be lastprivate",
6407 DECL_NAME (decl));
6408 else if (simd && (n->value & GOVD_PRIVATE) != 0)
6409 error ("iteration variable %qE should not be private",
6410 DECL_NAME (decl));
6411 else if (simd == 2 && (n->value & GOVD_LINEAR) != 0)
6412 error ("iteration variable %qE is predetermined linear",
6413 DECL_NAME (decl));
6415 return (ctx == gimplify_omp_ctxp
6416 || (ctx->region_type == ORT_COMBINED_PARALLEL
6417 && gimplify_omp_ctxp->outer_context == ctx));
6420 if (ctx->region_type != ORT_WORKSHARE
6421 && ctx->region_type != ORT_SIMD
6422 && ctx->region_type != ORT_ACC)
6423 return false;
6424 else if (ctx->outer_context)
6425 return omp_is_private (ctx->outer_context, decl, simd);
6426 return false;
6429 /* Return true if DECL is private within a parallel region
6430 that binds to the current construct's context or in parallel
6431 region's REDUCTION clause. */
6433 static bool
6434 omp_check_private (struct gimplify_omp_ctx *ctx, tree decl, bool copyprivate)
6436 splay_tree_node n;
6440 ctx = ctx->outer_context;
6441 if (ctx == NULL)
6443 if (is_global_var (decl))
6444 return false;
6446 /* References might be private, but might be shared too,
6447 when checking for copyprivate, assume they might be
6448 private, otherwise assume they might be shared. */
6449 if (copyprivate)
6450 return true;
6452 if (lang_hooks.decls.omp_privatize_by_reference (decl))
6453 return false;
6455 /* Treat C++ privatized non-static data members outside
6456 of the privatization the same. */
6457 if (omp_member_access_dummy_var (decl))
6458 return false;
6460 return true;
6463 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
6465 if ((ctx->region_type & (ORT_TARGET | ORT_TARGET_DATA)) != 0
6466 && (n == NULL || (n->value & GOVD_DATA_SHARE_CLASS) == 0))
6467 continue;
6469 if (n != NULL)
6471 if ((n->value & GOVD_LOCAL) != 0
6472 && omp_member_access_dummy_var (decl))
6473 return false;
6474 return (n->value & GOVD_SHARED) == 0;
6477 while (ctx->region_type == ORT_WORKSHARE
6478 || ctx->region_type == ORT_SIMD
6479 || ctx->region_type == ORT_ACC);
6480 return false;
6483 /* Return true if the CTX is combined with distribute and thus
6484 lastprivate can't be supported. */
6486 static bool
6487 omp_no_lastprivate (struct gimplify_omp_ctx *ctx)
6491 if (ctx->outer_context == NULL)
6492 return false;
6493 ctx = ctx->outer_context;
6494 switch (ctx->region_type)
6496 case ORT_WORKSHARE:
6497 if (!ctx->combined_loop)
6498 return false;
6499 if (ctx->distribute)
6500 return lang_GNU_Fortran ();
6501 break;
6502 case ORT_COMBINED_PARALLEL:
6503 break;
6504 case ORT_COMBINED_TEAMS:
6505 return lang_GNU_Fortran ();
6506 default:
6507 return false;
6510 while (1);
6513 /* Callback for walk_tree to find a DECL_EXPR for the given DECL. */
6515 static tree
6516 find_decl_expr (tree *tp, int *walk_subtrees, void *data)
6518 tree t = *tp;
6520 /* If this node has been visited, unmark it and keep looking. */
6521 if (TREE_CODE (t) == DECL_EXPR && DECL_EXPR_DECL (t) == (tree) data)
6522 return t;
6524 if (IS_TYPE_OR_DECL_P (t))
6525 *walk_subtrees = 0;
6526 return NULL_TREE;
6529 /* Scan the OMP clauses in *LIST_P, installing mappings into a new
6530 and previous omp contexts. */
6532 static void
6533 gimplify_scan_omp_clauses (tree *list_p, gimple_seq *pre_p,
6534 enum omp_region_type region_type,
6535 enum tree_code code)
6537 struct gimplify_omp_ctx *ctx, *outer_ctx;
6538 tree c;
6539 hash_map<tree, tree> *struct_map_to_clause = NULL;
6540 tree *prev_list_p = NULL;
6542 ctx = new_omp_context (region_type);
6543 outer_ctx = ctx->outer_context;
6544 if (code == OMP_TARGET && !lang_GNU_Fortran ())
6546 ctx->target_map_pointers_as_0len_arrays = true;
6547 /* FIXME: For Fortran we want to set this too, when
6548 the Fortran FE is updated to OpenMP 4.5. */
6549 ctx->target_map_scalars_firstprivate = true;
6551 if (!lang_GNU_Fortran ())
6552 switch (code)
6554 case OMP_TARGET:
6555 case OMP_TARGET_DATA:
6556 case OMP_TARGET_ENTER_DATA:
6557 case OMP_TARGET_EXIT_DATA:
6558 case OACC_HOST_DATA:
6559 ctx->target_firstprivatize_array_bases = true;
6560 default:
6561 break;
6564 while ((c = *list_p) != NULL)
6566 bool remove = false;
6567 bool notice_outer = true;
6568 const char *check_non_private = NULL;
6569 unsigned int flags;
6570 tree decl;
6572 switch (OMP_CLAUSE_CODE (c))
6574 case OMP_CLAUSE_PRIVATE:
6575 flags = GOVD_PRIVATE | GOVD_EXPLICIT;
6576 if (lang_hooks.decls.omp_private_outer_ref (OMP_CLAUSE_DECL (c)))
6578 flags |= GOVD_PRIVATE_OUTER_REF;
6579 OMP_CLAUSE_PRIVATE_OUTER_REF (c) = 1;
6581 else
6582 notice_outer = false;
6583 goto do_add;
6584 case OMP_CLAUSE_SHARED:
6585 flags = GOVD_SHARED | GOVD_EXPLICIT;
6586 goto do_add;
6587 case OMP_CLAUSE_FIRSTPRIVATE:
6588 flags = GOVD_FIRSTPRIVATE | GOVD_EXPLICIT;
6589 check_non_private = "firstprivate";
6590 goto do_add;
6591 case OMP_CLAUSE_LASTPRIVATE:
6592 flags = GOVD_LASTPRIVATE | GOVD_SEEN | GOVD_EXPLICIT;
6593 check_non_private = "lastprivate";
6594 decl = OMP_CLAUSE_DECL (c);
6595 if (omp_no_lastprivate (ctx))
6597 notice_outer = false;
6598 flags |= GOVD_LINEAR_LASTPRIVATE_NO_OUTER;
6600 else if (error_operand_p (decl))
6601 goto do_add;
6602 else if (outer_ctx
6603 && (outer_ctx->region_type == ORT_COMBINED_PARALLEL
6604 || outer_ctx->region_type == ORT_COMBINED_TEAMS)
6605 && splay_tree_lookup (outer_ctx->variables,
6606 (splay_tree_key) decl) == NULL)
6608 omp_add_variable (outer_ctx, decl, GOVD_SHARED | GOVD_SEEN);
6609 if (outer_ctx->outer_context)
6610 omp_notice_variable (outer_ctx->outer_context, decl, true);
6612 else if (outer_ctx
6613 && (outer_ctx->region_type & ORT_TASK) != 0
6614 && outer_ctx->combined_loop
6615 && splay_tree_lookup (outer_ctx->variables,
6616 (splay_tree_key) decl) == NULL)
6618 omp_add_variable (outer_ctx, decl, GOVD_LASTPRIVATE | GOVD_SEEN);
6619 if (outer_ctx->outer_context)
6620 omp_notice_variable (outer_ctx->outer_context, decl, true);
6622 else if (outer_ctx
6623 && (outer_ctx->region_type == ORT_WORKSHARE
6624 || outer_ctx->region_type == ORT_ACC)
6625 && outer_ctx->combined_loop
6626 && splay_tree_lookup (outer_ctx->variables,
6627 (splay_tree_key) decl) == NULL
6628 && !omp_check_private (outer_ctx, decl, false))
6630 omp_add_variable (outer_ctx, decl, GOVD_LASTPRIVATE | GOVD_SEEN);
6631 if (outer_ctx->outer_context
6632 && (outer_ctx->outer_context->region_type
6633 == ORT_COMBINED_PARALLEL)
6634 && splay_tree_lookup (outer_ctx->outer_context->variables,
6635 (splay_tree_key) decl) == NULL)
6637 struct gimplify_omp_ctx *octx = outer_ctx->outer_context;
6638 omp_add_variable (octx, decl, GOVD_SHARED | GOVD_SEEN);
6639 if (octx->outer_context)
6640 omp_notice_variable (octx->outer_context, decl, true);
6642 else if (outer_ctx->outer_context)
6643 omp_notice_variable (outer_ctx->outer_context, decl, true);
6645 goto do_add;
6646 case OMP_CLAUSE_REDUCTION:
6647 flags = GOVD_REDUCTION | GOVD_SEEN | GOVD_EXPLICIT;
6648 /* OpenACC permits reductions on private variables. */
6649 if (!(region_type & ORT_ACC))
6650 check_non_private = "reduction";
6651 decl = OMP_CLAUSE_DECL (c);
6652 if (TREE_CODE (decl) == MEM_REF)
6654 tree type = TREE_TYPE (decl);
6655 if (gimplify_expr (&TYPE_MAX_VALUE (TYPE_DOMAIN (type)), pre_p,
6656 NULL, is_gimple_val, fb_rvalue) == GS_ERROR)
6658 remove = true;
6659 break;
6661 tree v = TYPE_MAX_VALUE (TYPE_DOMAIN (type));
6662 if (DECL_P (v))
6664 omp_firstprivatize_variable (ctx, v);
6665 omp_notice_variable (ctx, v, true);
6667 decl = TREE_OPERAND (decl, 0);
6668 if (TREE_CODE (decl) == POINTER_PLUS_EXPR)
6670 if (gimplify_expr (&TREE_OPERAND (decl, 1), pre_p,
6671 NULL, is_gimple_val, fb_rvalue)
6672 == GS_ERROR)
6674 remove = true;
6675 break;
6677 v = TREE_OPERAND (decl, 1);
6678 if (DECL_P (v))
6680 omp_firstprivatize_variable (ctx, v);
6681 omp_notice_variable (ctx, v, true);
6683 decl = TREE_OPERAND (decl, 0);
6685 if (TREE_CODE (decl) == ADDR_EXPR
6686 || TREE_CODE (decl) == INDIRECT_REF)
6687 decl = TREE_OPERAND (decl, 0);
6689 goto do_add_decl;
6690 case OMP_CLAUSE_LINEAR:
6691 if (gimplify_expr (&OMP_CLAUSE_LINEAR_STEP (c), pre_p, NULL,
6692 is_gimple_val, fb_rvalue) == GS_ERROR)
6694 remove = true;
6695 break;
6697 else
6699 if (code == OMP_SIMD
6700 && !OMP_CLAUSE_LINEAR_NO_COPYIN (c))
6702 struct gimplify_omp_ctx *octx = outer_ctx;
6703 if (octx
6704 && octx->region_type == ORT_WORKSHARE
6705 && octx->combined_loop
6706 && !octx->distribute)
6708 if (octx->outer_context
6709 && (octx->outer_context->region_type
6710 == ORT_COMBINED_PARALLEL))
6711 octx = octx->outer_context->outer_context;
6712 else
6713 octx = octx->outer_context;
6715 if (octx
6716 && octx->region_type == ORT_WORKSHARE
6717 && octx->combined_loop
6718 && octx->distribute
6719 && !lang_GNU_Fortran ())
6721 error_at (OMP_CLAUSE_LOCATION (c),
6722 "%<linear%> clause for variable other than "
6723 "loop iterator specified on construct "
6724 "combined with %<distribute%>");
6725 remove = true;
6726 break;
6729 /* For combined #pragma omp parallel for simd, need to put
6730 lastprivate and perhaps firstprivate too on the
6731 parallel. Similarly for #pragma omp for simd. */
6732 struct gimplify_omp_ctx *octx = outer_ctx;
6733 decl = NULL_TREE;
6734 if (omp_no_lastprivate (ctx))
6735 OMP_CLAUSE_LINEAR_NO_COPYOUT (c) = 1;
6738 if (OMP_CLAUSE_LINEAR_NO_COPYIN (c)
6739 && OMP_CLAUSE_LINEAR_NO_COPYOUT (c))
6740 break;
6741 decl = OMP_CLAUSE_DECL (c);
6742 if (error_operand_p (decl))
6744 decl = NULL_TREE;
6745 break;
6747 flags = GOVD_SEEN;
6748 if (!OMP_CLAUSE_LINEAR_NO_COPYIN (c))
6749 flags |= GOVD_FIRSTPRIVATE;
6750 if (!OMP_CLAUSE_LINEAR_NO_COPYOUT (c))
6751 flags |= GOVD_LASTPRIVATE;
6752 if (octx
6753 && octx->region_type == ORT_WORKSHARE
6754 && octx->combined_loop)
6756 if (octx->outer_context
6757 && (octx->outer_context->region_type
6758 == ORT_COMBINED_PARALLEL))
6759 octx = octx->outer_context;
6760 else if (omp_check_private (octx, decl, false))
6761 break;
6763 else if (octx
6764 && (octx->region_type & ORT_TASK) != 0
6765 && octx->combined_loop)
6767 else if (octx
6768 && octx->region_type == ORT_COMBINED_PARALLEL
6769 && ctx->region_type == ORT_WORKSHARE
6770 && octx == outer_ctx)
6771 flags = GOVD_SEEN | GOVD_SHARED;
6772 else if (octx
6773 && octx->region_type == ORT_COMBINED_TEAMS)
6774 flags = GOVD_SEEN | GOVD_SHARED;
6775 else if (octx
6776 && octx->region_type == ORT_COMBINED_TARGET)
6778 flags &= ~GOVD_LASTPRIVATE;
6779 if (flags == GOVD_SEEN)
6780 break;
6782 else
6783 break;
6784 splay_tree_node on
6785 = splay_tree_lookup (octx->variables,
6786 (splay_tree_key) decl);
6787 if (on && (on->value & GOVD_DATA_SHARE_CLASS) != 0)
6789 octx = NULL;
6790 break;
6792 omp_add_variable (octx, decl, flags);
6793 if (octx->outer_context == NULL)
6794 break;
6795 octx = octx->outer_context;
6797 while (1);
6798 if (octx
6799 && decl
6800 && (!OMP_CLAUSE_LINEAR_NO_COPYIN (c)
6801 || !OMP_CLAUSE_LINEAR_NO_COPYOUT (c)))
6802 omp_notice_variable (octx, decl, true);
6804 flags = GOVD_LINEAR | GOVD_EXPLICIT;
6805 if (OMP_CLAUSE_LINEAR_NO_COPYIN (c)
6806 && OMP_CLAUSE_LINEAR_NO_COPYOUT (c))
6808 notice_outer = false;
6809 flags |= GOVD_LINEAR_LASTPRIVATE_NO_OUTER;
6811 goto do_add;
6813 case OMP_CLAUSE_MAP:
6814 decl = OMP_CLAUSE_DECL (c);
6815 if (error_operand_p (decl))
6816 remove = true;
6817 switch (code)
6819 case OMP_TARGET:
6820 break;
6821 case OMP_TARGET_DATA:
6822 case OMP_TARGET_ENTER_DATA:
6823 case OMP_TARGET_EXIT_DATA:
6824 case OACC_HOST_DATA:
6825 if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_FIRSTPRIVATE_POINTER
6826 || (OMP_CLAUSE_MAP_KIND (c)
6827 == GOMP_MAP_FIRSTPRIVATE_REFERENCE))
6828 /* For target {,enter ,exit }data only the array slice is
6829 mapped, but not the pointer to it. */
6830 remove = true;
6831 break;
6832 default:
6833 break;
6835 if (remove)
6836 break;
6837 if (DECL_P (decl) && outer_ctx && (region_type & ORT_ACC))
6839 struct gimplify_omp_ctx *octx;
6840 for (octx = outer_ctx; octx; octx = octx->outer_context)
6842 if (octx->region_type != ORT_ACC_HOST_DATA)
6843 break;
6844 splay_tree_node n2
6845 = splay_tree_lookup (octx->variables,
6846 (splay_tree_key) decl);
6847 if (n2)
6848 error_at (OMP_CLAUSE_LOCATION (c), "variable %qE "
6849 "declared in enclosing %<host_data%> region",
6850 DECL_NAME (decl));
6853 if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
6854 OMP_CLAUSE_SIZE (c) = DECL_P (decl) ? DECL_SIZE_UNIT (decl)
6855 : TYPE_SIZE_UNIT (TREE_TYPE (decl));
6856 if (gimplify_expr (&OMP_CLAUSE_SIZE (c), pre_p,
6857 NULL, is_gimple_val, fb_rvalue) == GS_ERROR)
6859 remove = true;
6860 break;
6862 else if ((OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_FIRSTPRIVATE_POINTER
6863 || (OMP_CLAUSE_MAP_KIND (c)
6864 == GOMP_MAP_FIRSTPRIVATE_REFERENCE))
6865 && TREE_CODE (OMP_CLAUSE_SIZE (c)) != INTEGER_CST)
6867 OMP_CLAUSE_SIZE (c)
6868 = get_initialized_tmp_var (OMP_CLAUSE_SIZE (c), pre_p, NULL);
6869 omp_add_variable (ctx, OMP_CLAUSE_SIZE (c),
6870 GOVD_FIRSTPRIVATE | GOVD_SEEN);
6872 if (!DECL_P (decl))
6874 tree d = decl, *pd;
6875 if (TREE_CODE (d) == ARRAY_REF)
6877 while (TREE_CODE (d) == ARRAY_REF)
6878 d = TREE_OPERAND (d, 0);
6879 if (TREE_CODE (d) == COMPONENT_REF
6880 && TREE_CODE (TREE_TYPE (d)) == ARRAY_TYPE)
6881 decl = d;
6883 pd = &OMP_CLAUSE_DECL (c);
6884 if (d == decl
6885 && TREE_CODE (decl) == INDIRECT_REF
6886 && TREE_CODE (TREE_OPERAND (decl, 0)) == COMPONENT_REF
6887 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (decl, 0)))
6888 == REFERENCE_TYPE))
6890 pd = &TREE_OPERAND (decl, 0);
6891 decl = TREE_OPERAND (decl, 0);
6893 if (TREE_CODE (decl) == COMPONENT_REF)
6895 while (TREE_CODE (decl) == COMPONENT_REF)
6896 decl = TREE_OPERAND (decl, 0);
6898 if (gimplify_expr (pd, pre_p, NULL, is_gimple_lvalue, fb_lvalue)
6899 == GS_ERROR)
6901 remove = true;
6902 break;
6904 if (DECL_P (decl))
6906 if (error_operand_p (decl))
6908 remove = true;
6909 break;
6912 if (TYPE_SIZE_UNIT (TREE_TYPE (decl)) == NULL
6913 || (TREE_CODE (TYPE_SIZE_UNIT (TREE_TYPE (decl)))
6914 != INTEGER_CST))
6916 error_at (OMP_CLAUSE_LOCATION (c),
6917 "mapping field %qE of variable length "
6918 "structure", OMP_CLAUSE_DECL (c));
6919 remove = true;
6920 break;
6923 if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_ALWAYS_POINTER)
6925 /* Error recovery. */
6926 if (prev_list_p == NULL)
6928 remove = true;
6929 break;
6931 if (OMP_CLAUSE_CHAIN (*prev_list_p) != c)
6933 tree ch = OMP_CLAUSE_CHAIN (*prev_list_p);
6934 if (ch == NULL_TREE || OMP_CLAUSE_CHAIN (ch) != c)
6936 remove = true;
6937 break;
6942 tree offset;
6943 HOST_WIDE_INT bitsize, bitpos;
6944 machine_mode mode;
6945 int unsignedp, reversep, volatilep = 0;
6946 tree base = OMP_CLAUSE_DECL (c);
6947 while (TREE_CODE (base) == ARRAY_REF)
6948 base = TREE_OPERAND (base, 0);
6949 if (TREE_CODE (base) == INDIRECT_REF)
6950 base = TREE_OPERAND (base, 0);
6951 base = get_inner_reference (base, &bitsize, &bitpos, &offset,
6952 &mode, &unsignedp, &reversep,
6953 &volatilep, false);
6954 gcc_assert (base == decl
6955 && (offset == NULL_TREE
6956 || TREE_CODE (offset) == INTEGER_CST));
6958 splay_tree_node n
6959 = splay_tree_lookup (ctx->variables, (splay_tree_key)decl);
6960 bool ptr = (OMP_CLAUSE_MAP_KIND (c)
6961 == GOMP_MAP_ALWAYS_POINTER);
6962 if (n == NULL || (n->value & GOVD_MAP) == 0)
6964 tree l = build_omp_clause (OMP_CLAUSE_LOCATION (c),
6965 OMP_CLAUSE_MAP);
6966 OMP_CLAUSE_SET_MAP_KIND (l, GOMP_MAP_STRUCT);
6967 OMP_CLAUSE_DECL (l) = decl;
6968 OMP_CLAUSE_SIZE (l) = size_int (1);
6969 if (struct_map_to_clause == NULL)
6970 struct_map_to_clause = new hash_map<tree, tree>;
6971 struct_map_to_clause->put (decl, l);
6972 if (ptr)
6974 enum gomp_map_kind mkind
6975 = code == OMP_TARGET_EXIT_DATA
6976 ? GOMP_MAP_RELEASE : GOMP_MAP_ALLOC;
6977 tree c2 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
6978 OMP_CLAUSE_MAP);
6979 OMP_CLAUSE_SET_MAP_KIND (c2, mkind);
6980 OMP_CLAUSE_DECL (c2)
6981 = unshare_expr (OMP_CLAUSE_DECL (c));
6982 OMP_CLAUSE_CHAIN (c2) = *prev_list_p;
6983 OMP_CLAUSE_SIZE (c2)
6984 = TYPE_SIZE_UNIT (ptr_type_node);
6985 OMP_CLAUSE_CHAIN (l) = c2;
6986 if (OMP_CLAUSE_CHAIN (*prev_list_p) != c)
6988 tree c4 = OMP_CLAUSE_CHAIN (*prev_list_p);
6989 tree c3
6990 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
6991 OMP_CLAUSE_MAP);
6992 OMP_CLAUSE_SET_MAP_KIND (c3, mkind);
6993 OMP_CLAUSE_DECL (c3)
6994 = unshare_expr (OMP_CLAUSE_DECL (c4));
6995 OMP_CLAUSE_SIZE (c3)
6996 = TYPE_SIZE_UNIT (ptr_type_node);
6997 OMP_CLAUSE_CHAIN (c3) = *prev_list_p;
6998 OMP_CLAUSE_CHAIN (c2) = c3;
7000 *prev_list_p = l;
7001 prev_list_p = NULL;
7003 else
7005 OMP_CLAUSE_CHAIN (l) = c;
7006 *list_p = l;
7007 list_p = &OMP_CLAUSE_CHAIN (l);
7009 flags = GOVD_MAP | GOVD_EXPLICIT;
7010 if (GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c)) || ptr)
7011 flags |= GOVD_SEEN;
7012 goto do_add_decl;
7014 else
7016 tree *osc = struct_map_to_clause->get (decl);
7017 tree *sc = NULL, *scp = NULL;
7018 if (GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c)) || ptr)
7019 n->value |= GOVD_SEEN;
7020 offset_int o1, o2;
7021 if (offset)
7022 o1 = wi::to_offset (offset);
7023 else
7024 o1 = 0;
7025 if (bitpos)
7026 o1 = o1 + bitpos / BITS_PER_UNIT;
7027 for (sc = &OMP_CLAUSE_CHAIN (*osc);
7028 *sc != c; sc = &OMP_CLAUSE_CHAIN (*sc))
7029 if (ptr && sc == prev_list_p)
7030 break;
7031 else if (TREE_CODE (OMP_CLAUSE_DECL (*sc))
7032 != COMPONENT_REF
7033 && (TREE_CODE (OMP_CLAUSE_DECL (*sc))
7034 != INDIRECT_REF)
7035 && (TREE_CODE (OMP_CLAUSE_DECL (*sc))
7036 != ARRAY_REF))
7037 break;
7038 else
7040 tree offset2;
7041 HOST_WIDE_INT bitsize2, bitpos2;
7042 base = OMP_CLAUSE_DECL (*sc);
7043 if (TREE_CODE (base) == ARRAY_REF)
7045 while (TREE_CODE (base) == ARRAY_REF)
7046 base = TREE_OPERAND (base, 0);
7047 if (TREE_CODE (base) != COMPONENT_REF
7048 || (TREE_CODE (TREE_TYPE (base))
7049 != ARRAY_TYPE))
7050 break;
7052 else if (TREE_CODE (base) == INDIRECT_REF
7053 && (TREE_CODE (TREE_OPERAND (base, 0))
7054 == COMPONENT_REF)
7055 && (TREE_CODE (TREE_TYPE
7056 (TREE_OPERAND (base, 0)))
7057 == REFERENCE_TYPE))
7058 base = TREE_OPERAND (base, 0);
7059 base = get_inner_reference (base, &bitsize2,
7060 &bitpos2, &offset2,
7061 &mode, &unsignedp,
7062 &reversep, &volatilep,
7063 false);
7064 if (base != decl)
7065 break;
7066 if (scp)
7067 continue;
7068 gcc_assert (offset == NULL_TREE
7069 || TREE_CODE (offset) == INTEGER_CST);
7070 tree d1 = OMP_CLAUSE_DECL (*sc);
7071 tree d2 = OMP_CLAUSE_DECL (c);
7072 while (TREE_CODE (d1) == ARRAY_REF)
7073 d1 = TREE_OPERAND (d1, 0);
7074 while (TREE_CODE (d2) == ARRAY_REF)
7075 d2 = TREE_OPERAND (d2, 0);
7076 if (TREE_CODE (d1) == INDIRECT_REF)
7077 d1 = TREE_OPERAND (d1, 0);
7078 if (TREE_CODE (d2) == INDIRECT_REF)
7079 d2 = TREE_OPERAND (d2, 0);
7080 while (TREE_CODE (d1) == COMPONENT_REF)
7081 if (TREE_CODE (d2) == COMPONENT_REF
7082 && TREE_OPERAND (d1, 1)
7083 == TREE_OPERAND (d2, 1))
7085 d1 = TREE_OPERAND (d1, 0);
7086 d2 = TREE_OPERAND (d2, 0);
7088 else
7089 break;
7090 if (d1 == d2)
7092 error_at (OMP_CLAUSE_LOCATION (c),
7093 "%qE appears more than once in map "
7094 "clauses", OMP_CLAUSE_DECL (c));
7095 remove = true;
7096 break;
7098 if (offset2)
7099 o2 = wi::to_offset (offset2);
7100 else
7101 o2 = 0;
7102 if (bitpos2)
7103 o2 = o2 + bitpos2 / BITS_PER_UNIT;
7104 if (wi::ltu_p (o1, o2)
7105 || (wi::eq_p (o1, o2) && bitpos < bitpos2))
7107 if (ptr)
7108 scp = sc;
7109 else
7110 break;
7113 if (remove)
7114 break;
7115 OMP_CLAUSE_SIZE (*osc)
7116 = size_binop (PLUS_EXPR, OMP_CLAUSE_SIZE (*osc),
7117 size_one_node);
7118 if (ptr)
7120 tree c2 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
7121 OMP_CLAUSE_MAP);
7122 tree cl = NULL_TREE;
7123 enum gomp_map_kind mkind
7124 = code == OMP_TARGET_EXIT_DATA
7125 ? GOMP_MAP_RELEASE : GOMP_MAP_ALLOC;
7126 OMP_CLAUSE_SET_MAP_KIND (c2, mkind);
7127 OMP_CLAUSE_DECL (c2)
7128 = unshare_expr (OMP_CLAUSE_DECL (c));
7129 OMP_CLAUSE_CHAIN (c2) = scp ? *scp : *prev_list_p;
7130 OMP_CLAUSE_SIZE (c2)
7131 = TYPE_SIZE_UNIT (ptr_type_node);
7132 cl = scp ? *prev_list_p : c2;
7133 if (OMP_CLAUSE_CHAIN (*prev_list_p) != c)
7135 tree c4 = OMP_CLAUSE_CHAIN (*prev_list_p);
7136 tree c3
7137 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
7138 OMP_CLAUSE_MAP);
7139 OMP_CLAUSE_SET_MAP_KIND (c3, mkind);
7140 OMP_CLAUSE_DECL (c3)
7141 = unshare_expr (OMP_CLAUSE_DECL (c4));
7142 OMP_CLAUSE_SIZE (c3)
7143 = TYPE_SIZE_UNIT (ptr_type_node);
7144 OMP_CLAUSE_CHAIN (c3) = *prev_list_p;
7145 if (!scp)
7146 OMP_CLAUSE_CHAIN (c2) = c3;
7147 else
7148 cl = c3;
7150 if (scp)
7151 *scp = c2;
7152 if (sc == prev_list_p)
7154 *sc = cl;
7155 prev_list_p = NULL;
7157 else
7159 *prev_list_p = OMP_CLAUSE_CHAIN (c);
7160 list_p = prev_list_p;
7161 prev_list_p = NULL;
7162 OMP_CLAUSE_CHAIN (c) = *sc;
7163 *sc = cl;
7164 continue;
7167 else if (*sc != c)
7169 *list_p = OMP_CLAUSE_CHAIN (c);
7170 OMP_CLAUSE_CHAIN (c) = *sc;
7171 *sc = c;
7172 continue;
7176 if (!remove
7177 && OMP_CLAUSE_MAP_KIND (c) != GOMP_MAP_ALWAYS_POINTER
7178 && OMP_CLAUSE_CHAIN (c)
7179 && OMP_CLAUSE_CODE (OMP_CLAUSE_CHAIN (c)) == OMP_CLAUSE_MAP
7180 && (OMP_CLAUSE_MAP_KIND (OMP_CLAUSE_CHAIN (c))
7181 == GOMP_MAP_ALWAYS_POINTER))
7182 prev_list_p = list_p;
7183 break;
7185 flags = GOVD_MAP | GOVD_EXPLICIT;
7186 if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_ALWAYS_TO
7187 || OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_ALWAYS_TOFROM)
7188 flags |= GOVD_MAP_ALWAYS_TO;
7189 goto do_add;
7191 case OMP_CLAUSE_DEPEND:
7192 if (OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SINK
7193 || OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SOURCE)
7195 /* Nothing to do. OMP_CLAUSE_DECL will be lowered in
7196 omp-low.c. */
7197 break;
7199 if (TREE_CODE (OMP_CLAUSE_DECL (c)) == COMPOUND_EXPR)
7201 gimplify_expr (&TREE_OPERAND (OMP_CLAUSE_DECL (c), 0), pre_p,
7202 NULL, is_gimple_val, fb_rvalue);
7203 OMP_CLAUSE_DECL (c) = TREE_OPERAND (OMP_CLAUSE_DECL (c), 1);
7205 if (error_operand_p (OMP_CLAUSE_DECL (c)))
7207 remove = true;
7208 break;
7210 OMP_CLAUSE_DECL (c) = build_fold_addr_expr (OMP_CLAUSE_DECL (c));
7211 if (gimplify_expr (&OMP_CLAUSE_DECL (c), pre_p, NULL,
7212 is_gimple_val, fb_rvalue) == GS_ERROR)
7214 remove = true;
7215 break;
7217 break;
7219 case OMP_CLAUSE_TO:
7220 case OMP_CLAUSE_FROM:
7221 case OMP_CLAUSE__CACHE_:
7222 decl = OMP_CLAUSE_DECL (c);
7223 if (error_operand_p (decl))
7225 remove = true;
7226 break;
7228 if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
7229 OMP_CLAUSE_SIZE (c) = DECL_P (decl) ? DECL_SIZE_UNIT (decl)
7230 : TYPE_SIZE_UNIT (TREE_TYPE (decl));
7231 if (gimplify_expr (&OMP_CLAUSE_SIZE (c), pre_p,
7232 NULL, is_gimple_val, fb_rvalue) == GS_ERROR)
7234 remove = true;
7235 break;
7237 if (!DECL_P (decl))
7239 if (gimplify_expr (&OMP_CLAUSE_DECL (c), pre_p,
7240 NULL, is_gimple_lvalue, fb_lvalue)
7241 == GS_ERROR)
7243 remove = true;
7244 break;
7246 break;
7248 goto do_notice;
7250 case OMP_CLAUSE_USE_DEVICE_PTR:
7251 flags = GOVD_FIRSTPRIVATE | GOVD_EXPLICIT;
7252 goto do_add;
7253 case OMP_CLAUSE_IS_DEVICE_PTR:
7254 flags = GOVD_FIRSTPRIVATE | GOVD_EXPLICIT;
7255 goto do_add;
7257 do_add:
7258 decl = OMP_CLAUSE_DECL (c);
7259 do_add_decl:
7260 if (error_operand_p (decl))
7262 remove = true;
7263 break;
7265 if (DECL_NAME (decl) == NULL_TREE && (flags & GOVD_SHARED) == 0)
7267 tree t = omp_member_access_dummy_var (decl);
7268 if (t)
7270 tree v = DECL_VALUE_EXPR (decl);
7271 DECL_NAME (decl) = DECL_NAME (TREE_OPERAND (v, 1));
7272 if (outer_ctx)
7273 omp_notice_variable (outer_ctx, t, true);
7276 omp_add_variable (ctx, decl, flags);
7277 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_REDUCTION
7278 && OMP_CLAUSE_REDUCTION_PLACEHOLDER (c))
7280 omp_add_variable (ctx, OMP_CLAUSE_REDUCTION_PLACEHOLDER (c),
7281 GOVD_LOCAL | GOVD_SEEN);
7282 if (OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c)
7283 && walk_tree (&OMP_CLAUSE_REDUCTION_INIT (c),
7284 find_decl_expr,
7285 OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c),
7286 NULL) == NULL_TREE)
7287 omp_add_variable (ctx,
7288 OMP_CLAUSE_REDUCTION_DECL_PLACEHOLDER (c),
7289 GOVD_LOCAL | GOVD_SEEN);
7290 gimplify_omp_ctxp = ctx;
7291 push_gimplify_context ();
7293 OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c) = NULL;
7294 OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c) = NULL;
7296 gimplify_and_add (OMP_CLAUSE_REDUCTION_INIT (c),
7297 &OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c));
7298 pop_gimplify_context
7299 (gimple_seq_first_stmt (OMP_CLAUSE_REDUCTION_GIMPLE_INIT (c)));
7300 push_gimplify_context ();
7301 gimplify_and_add (OMP_CLAUSE_REDUCTION_MERGE (c),
7302 &OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c));
7303 pop_gimplify_context
7304 (gimple_seq_first_stmt (OMP_CLAUSE_REDUCTION_GIMPLE_MERGE (c)));
7305 OMP_CLAUSE_REDUCTION_INIT (c) = NULL_TREE;
7306 OMP_CLAUSE_REDUCTION_MERGE (c) = NULL_TREE;
7308 gimplify_omp_ctxp = outer_ctx;
7310 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE
7311 && OMP_CLAUSE_LASTPRIVATE_STMT (c))
7313 gimplify_omp_ctxp = ctx;
7314 push_gimplify_context ();
7315 if (TREE_CODE (OMP_CLAUSE_LASTPRIVATE_STMT (c)) != BIND_EXPR)
7317 tree bind = build3 (BIND_EXPR, void_type_node, NULL,
7318 NULL, NULL);
7319 TREE_SIDE_EFFECTS (bind) = 1;
7320 BIND_EXPR_BODY (bind) = OMP_CLAUSE_LASTPRIVATE_STMT (c);
7321 OMP_CLAUSE_LASTPRIVATE_STMT (c) = bind;
7323 gimplify_and_add (OMP_CLAUSE_LASTPRIVATE_STMT (c),
7324 &OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c));
7325 pop_gimplify_context
7326 (gimple_seq_first_stmt (OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c)));
7327 OMP_CLAUSE_LASTPRIVATE_STMT (c) = NULL_TREE;
7329 gimplify_omp_ctxp = outer_ctx;
7331 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
7332 && OMP_CLAUSE_LINEAR_STMT (c))
7334 gimplify_omp_ctxp = ctx;
7335 push_gimplify_context ();
7336 if (TREE_CODE (OMP_CLAUSE_LINEAR_STMT (c)) != BIND_EXPR)
7338 tree bind = build3 (BIND_EXPR, void_type_node, NULL,
7339 NULL, NULL);
7340 TREE_SIDE_EFFECTS (bind) = 1;
7341 BIND_EXPR_BODY (bind) = OMP_CLAUSE_LINEAR_STMT (c);
7342 OMP_CLAUSE_LINEAR_STMT (c) = bind;
7344 gimplify_and_add (OMP_CLAUSE_LINEAR_STMT (c),
7345 &OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c));
7346 pop_gimplify_context
7347 (gimple_seq_first_stmt (OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c)));
7348 OMP_CLAUSE_LINEAR_STMT (c) = NULL_TREE;
7350 gimplify_omp_ctxp = outer_ctx;
7352 if (notice_outer)
7353 goto do_notice;
7354 break;
7356 case OMP_CLAUSE_COPYIN:
7357 case OMP_CLAUSE_COPYPRIVATE:
7358 decl = OMP_CLAUSE_DECL (c);
7359 if (error_operand_p (decl))
7361 remove = true;
7362 break;
7364 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_COPYPRIVATE
7365 && !remove
7366 && !omp_check_private (ctx, decl, true))
7368 remove = true;
7369 if (is_global_var (decl))
7371 if (DECL_THREAD_LOCAL_P (decl))
7372 remove = false;
7373 else if (DECL_HAS_VALUE_EXPR_P (decl))
7375 tree value = get_base_address (DECL_VALUE_EXPR (decl));
7377 if (value
7378 && DECL_P (value)
7379 && DECL_THREAD_LOCAL_P (value))
7380 remove = false;
7383 if (remove)
7384 error_at (OMP_CLAUSE_LOCATION (c),
7385 "copyprivate variable %qE is not threadprivate"
7386 " or private in outer context", DECL_NAME (decl));
7388 do_notice:
7389 if (outer_ctx)
7390 omp_notice_variable (outer_ctx, decl, true);
7391 if (check_non_private
7392 && region_type == ORT_WORKSHARE
7393 && (OMP_CLAUSE_CODE (c) != OMP_CLAUSE_REDUCTION
7394 || decl == OMP_CLAUSE_DECL (c)
7395 || (TREE_CODE (OMP_CLAUSE_DECL (c)) == MEM_REF
7396 && (TREE_CODE (TREE_OPERAND (OMP_CLAUSE_DECL (c), 0))
7397 == ADDR_EXPR
7398 || (TREE_CODE (TREE_OPERAND (OMP_CLAUSE_DECL (c), 0))
7399 == POINTER_PLUS_EXPR
7400 && (TREE_CODE (TREE_OPERAND (TREE_OPERAND
7401 (OMP_CLAUSE_DECL (c), 0), 0))
7402 == ADDR_EXPR)))))
7403 && omp_check_private (ctx, decl, false))
7405 error ("%s variable %qE is private in outer context",
7406 check_non_private, DECL_NAME (decl));
7407 remove = true;
7409 break;
7411 case OMP_CLAUSE_IF:
7412 if (OMP_CLAUSE_IF_MODIFIER (c) != ERROR_MARK
7413 && OMP_CLAUSE_IF_MODIFIER (c) != code)
7415 const char *p[2];
7416 for (int i = 0; i < 2; i++)
7417 switch (i ? OMP_CLAUSE_IF_MODIFIER (c) : code)
7419 case OMP_PARALLEL: p[i] = "parallel"; break;
7420 case OMP_TASK: p[i] = "task"; break;
7421 case OMP_TASKLOOP: p[i] = "taskloop"; break;
7422 case OMP_TARGET_DATA: p[i] = "target data"; break;
7423 case OMP_TARGET: p[i] = "target"; break;
7424 case OMP_TARGET_UPDATE: p[i] = "target update"; break;
7425 case OMP_TARGET_ENTER_DATA:
7426 p[i] = "target enter data"; break;
7427 case OMP_TARGET_EXIT_DATA: p[i] = "target exit data"; break;
7428 default: gcc_unreachable ();
7430 error_at (OMP_CLAUSE_LOCATION (c),
7431 "expected %qs %<if%> clause modifier rather than %qs",
7432 p[0], p[1]);
7433 remove = true;
7435 /* Fall through. */
7437 case OMP_CLAUSE_FINAL:
7438 OMP_CLAUSE_OPERAND (c, 0)
7439 = gimple_boolify (OMP_CLAUSE_OPERAND (c, 0));
7440 /* Fall through. */
7442 case OMP_CLAUSE_SCHEDULE:
7443 case OMP_CLAUSE_NUM_THREADS:
7444 case OMP_CLAUSE_NUM_TEAMS:
7445 case OMP_CLAUSE_THREAD_LIMIT:
7446 case OMP_CLAUSE_DIST_SCHEDULE:
7447 case OMP_CLAUSE_DEVICE:
7448 case OMP_CLAUSE_PRIORITY:
7449 case OMP_CLAUSE_GRAINSIZE:
7450 case OMP_CLAUSE_NUM_TASKS:
7451 case OMP_CLAUSE_HINT:
7452 case OMP_CLAUSE__CILK_FOR_COUNT_:
7453 case OMP_CLAUSE_ASYNC:
7454 case OMP_CLAUSE_WAIT:
7455 case OMP_CLAUSE_NUM_GANGS:
7456 case OMP_CLAUSE_NUM_WORKERS:
7457 case OMP_CLAUSE_VECTOR_LENGTH:
7458 case OMP_CLAUSE_WORKER:
7459 case OMP_CLAUSE_VECTOR:
7460 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c, 0), pre_p, NULL,
7461 is_gimple_val, fb_rvalue) == GS_ERROR)
7462 remove = true;
7463 break;
7465 case OMP_CLAUSE_GANG:
7466 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c, 0), pre_p, NULL,
7467 is_gimple_val, fb_rvalue) == GS_ERROR)
7468 remove = true;
7469 if (gimplify_expr (&OMP_CLAUSE_OPERAND (c, 1), pre_p, NULL,
7470 is_gimple_val, fb_rvalue) == GS_ERROR)
7471 remove = true;
7472 break;
7474 case OMP_CLAUSE_TILE:
7475 for (tree list = OMP_CLAUSE_TILE_LIST (c); !remove && list;
7476 list = TREE_CHAIN (list))
7478 if (gimplify_expr (&TREE_VALUE (list), pre_p, NULL,
7479 is_gimple_val, fb_rvalue) == GS_ERROR)
7480 remove = true;
7482 break;
7484 case OMP_CLAUSE_DEVICE_RESIDENT:
7485 remove = true;
7486 break;
7488 case OMP_CLAUSE_NOWAIT:
7489 case OMP_CLAUSE_ORDERED:
7490 case OMP_CLAUSE_UNTIED:
7491 case OMP_CLAUSE_COLLAPSE:
7492 case OMP_CLAUSE_AUTO:
7493 case OMP_CLAUSE_SEQ:
7494 case OMP_CLAUSE_INDEPENDENT:
7495 case OMP_CLAUSE_MERGEABLE:
7496 case OMP_CLAUSE_PROC_BIND:
7497 case OMP_CLAUSE_SAFELEN:
7498 case OMP_CLAUSE_SIMDLEN:
7499 case OMP_CLAUSE_NOGROUP:
7500 case OMP_CLAUSE_THREADS:
7501 case OMP_CLAUSE_SIMD:
7502 break;
7504 case OMP_CLAUSE_DEFAULTMAP:
7505 ctx->target_map_scalars_firstprivate = false;
7506 break;
7508 case OMP_CLAUSE_ALIGNED:
7509 decl = OMP_CLAUSE_DECL (c);
7510 if (error_operand_p (decl))
7512 remove = true;
7513 break;
7515 if (gimplify_expr (&OMP_CLAUSE_ALIGNED_ALIGNMENT (c), pre_p, NULL,
7516 is_gimple_val, fb_rvalue) == GS_ERROR)
7518 remove = true;
7519 break;
7521 if (!is_global_var (decl)
7522 && TREE_CODE (TREE_TYPE (decl)) == POINTER_TYPE)
7523 omp_add_variable (ctx, decl, GOVD_ALIGNED);
7524 break;
7526 case OMP_CLAUSE_DEFAULT:
7527 ctx->default_kind = OMP_CLAUSE_DEFAULT_KIND (c);
7528 break;
7530 default:
7531 gcc_unreachable ();
7534 if (remove)
7535 *list_p = OMP_CLAUSE_CHAIN (c);
7536 else
7537 list_p = &OMP_CLAUSE_CHAIN (c);
7540 gimplify_omp_ctxp = ctx;
7541 if (struct_map_to_clause)
7542 delete struct_map_to_clause;
7545 /* Return true if DECL is a candidate for shared to firstprivate
7546 optimization. We only consider non-addressable scalars, not
7547 too big, and not references. */
7549 static bool
7550 omp_shared_to_firstprivate_optimizable_decl_p (tree decl)
7552 if (TREE_ADDRESSABLE (decl))
7553 return false;
7554 tree type = TREE_TYPE (decl);
7555 if (!is_gimple_reg_type (type)
7556 || TREE_CODE (type) == REFERENCE_TYPE
7557 || TREE_ADDRESSABLE (type))
7558 return false;
7559 /* Don't optimize too large decls, as each thread/task will have
7560 its own. */
7561 HOST_WIDE_INT len = int_size_in_bytes (type);
7562 if (len == -1 || len > 4 * POINTER_SIZE / BITS_PER_UNIT)
7563 return false;
7564 if (lang_hooks.decls.omp_privatize_by_reference (decl))
7565 return false;
7566 return true;
7569 /* Helper function of omp_find_stores_op and gimplify_adjust_omp_clauses*.
7570 For omp_shared_to_firstprivate_optimizable_decl_p decl mark it as
7571 GOVD_WRITTEN in outer contexts. */
7573 static void
7574 omp_mark_stores (struct gimplify_omp_ctx *ctx, tree decl)
7576 for (; ctx; ctx = ctx->outer_context)
7578 splay_tree_node n = splay_tree_lookup (ctx->variables,
7579 (splay_tree_key) decl);
7580 if (n == NULL)
7581 continue;
7582 else if (n->value & GOVD_SHARED)
7584 n->value |= GOVD_WRITTEN;
7585 return;
7587 else if (n->value & GOVD_DATA_SHARE_CLASS)
7588 return;
7592 /* Helper callback for walk_gimple_seq to discover possible stores
7593 to omp_shared_to_firstprivate_optimizable_decl_p decls and set
7594 GOVD_WRITTEN if they are GOVD_SHARED in some outer context
7595 for those. */
7597 static tree
7598 omp_find_stores_op (tree *tp, int *walk_subtrees, void *data)
7600 struct walk_stmt_info *wi = (struct walk_stmt_info *) data;
7602 *walk_subtrees = 0;
7603 if (!wi->is_lhs)
7604 return NULL_TREE;
7606 tree op = *tp;
7609 if (handled_component_p (op))
7610 op = TREE_OPERAND (op, 0);
7611 else if ((TREE_CODE (op) == MEM_REF || TREE_CODE (op) == TARGET_MEM_REF)
7612 && TREE_CODE (TREE_OPERAND (op, 0)) == ADDR_EXPR)
7613 op = TREE_OPERAND (TREE_OPERAND (op, 0), 0);
7614 else
7615 break;
7617 while (1);
7618 if (!DECL_P (op) || !omp_shared_to_firstprivate_optimizable_decl_p (op))
7619 return NULL_TREE;
7621 omp_mark_stores (gimplify_omp_ctxp, op);
7622 return NULL_TREE;
7625 /* Helper callback for walk_gimple_seq to discover possible stores
7626 to omp_shared_to_firstprivate_optimizable_decl_p decls and set
7627 GOVD_WRITTEN if they are GOVD_SHARED in some outer context
7628 for those. */
7630 static tree
7631 omp_find_stores_stmt (gimple_stmt_iterator *gsi_p,
7632 bool *handled_ops_p,
7633 struct walk_stmt_info *wi)
7635 gimple *stmt = gsi_stmt (*gsi_p);
7636 switch (gimple_code (stmt))
7638 /* Don't recurse on OpenMP constructs for which
7639 gimplify_adjust_omp_clauses already handled the bodies,
7640 except handle gimple_omp_for_pre_body. */
7641 case GIMPLE_OMP_FOR:
7642 *handled_ops_p = true;
7643 if (gimple_omp_for_pre_body (stmt))
7644 walk_gimple_seq (gimple_omp_for_pre_body (stmt),
7645 omp_find_stores_stmt, omp_find_stores_op, wi);
7646 break;
7647 case GIMPLE_OMP_PARALLEL:
7648 case GIMPLE_OMP_TASK:
7649 case GIMPLE_OMP_SECTIONS:
7650 case GIMPLE_OMP_SINGLE:
7651 case GIMPLE_OMP_TARGET:
7652 case GIMPLE_OMP_TEAMS:
7653 case GIMPLE_OMP_CRITICAL:
7654 *handled_ops_p = true;
7655 break;
7656 default:
7657 break;
7659 return NULL_TREE;
7662 struct gimplify_adjust_omp_clauses_data
7664 tree *list_p;
7665 gimple_seq *pre_p;
7668 /* For all variables that were not actually used within the context,
7669 remove PRIVATE, SHARED, and FIRSTPRIVATE clauses. */
7671 static int
7672 gimplify_adjust_omp_clauses_1 (splay_tree_node n, void *data)
7674 tree *list_p = ((struct gimplify_adjust_omp_clauses_data *) data)->list_p;
7675 gimple_seq *pre_p
7676 = ((struct gimplify_adjust_omp_clauses_data *) data)->pre_p;
7677 tree decl = (tree) n->key;
7678 unsigned flags = n->value;
7679 enum omp_clause_code code;
7680 tree clause;
7681 bool private_debug;
7683 if (flags & (GOVD_EXPLICIT | GOVD_LOCAL))
7684 return 0;
7685 if ((flags & GOVD_SEEN) == 0)
7686 return 0;
7687 if (flags & GOVD_DEBUG_PRIVATE)
7689 gcc_assert ((flags & GOVD_DATA_SHARE_CLASS) == GOVD_PRIVATE);
7690 private_debug = true;
7692 else if (flags & GOVD_MAP)
7693 private_debug = false;
7694 else
7695 private_debug
7696 = lang_hooks.decls.omp_private_debug_clause (decl,
7697 !!(flags & GOVD_SHARED));
7698 if (private_debug)
7699 code = OMP_CLAUSE_PRIVATE;
7700 else if (flags & GOVD_MAP)
7701 code = OMP_CLAUSE_MAP;
7702 else if (flags & GOVD_SHARED)
7704 if (is_global_var (decl))
7706 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp->outer_context;
7707 while (ctx != NULL)
7709 splay_tree_node on
7710 = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
7711 if (on && (on->value & (GOVD_FIRSTPRIVATE | GOVD_LASTPRIVATE
7712 | GOVD_PRIVATE | GOVD_REDUCTION
7713 | GOVD_LINEAR | GOVD_MAP)) != 0)
7714 break;
7715 ctx = ctx->outer_context;
7717 if (ctx == NULL)
7718 return 0;
7720 code = OMP_CLAUSE_SHARED;
7722 else if (flags & GOVD_PRIVATE)
7723 code = OMP_CLAUSE_PRIVATE;
7724 else if (flags & GOVD_FIRSTPRIVATE)
7725 code = OMP_CLAUSE_FIRSTPRIVATE;
7726 else if (flags & GOVD_LASTPRIVATE)
7727 code = OMP_CLAUSE_LASTPRIVATE;
7728 else if (flags & GOVD_ALIGNED)
7729 return 0;
7730 else
7731 gcc_unreachable ();
7733 if (((flags & GOVD_LASTPRIVATE)
7734 || (code == OMP_CLAUSE_SHARED && (flags & GOVD_WRITTEN)))
7735 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
7736 omp_mark_stores (gimplify_omp_ctxp->outer_context, decl);
7738 clause = build_omp_clause (input_location, code);
7739 OMP_CLAUSE_DECL (clause) = decl;
7740 OMP_CLAUSE_CHAIN (clause) = *list_p;
7741 if (private_debug)
7742 OMP_CLAUSE_PRIVATE_DEBUG (clause) = 1;
7743 else if (code == OMP_CLAUSE_PRIVATE && (flags & GOVD_PRIVATE_OUTER_REF))
7744 OMP_CLAUSE_PRIVATE_OUTER_REF (clause) = 1;
7745 else if (code == OMP_CLAUSE_SHARED
7746 && (flags & GOVD_WRITTEN) == 0
7747 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
7748 OMP_CLAUSE_SHARED_READONLY (clause) = 1;
7749 else if (code == OMP_CLAUSE_FIRSTPRIVATE && (flags & GOVD_EXPLICIT) == 0)
7750 OMP_CLAUSE_FIRSTPRIVATE_IMPLICIT (clause) = 1;
7751 else if (code == OMP_CLAUSE_MAP && (flags & GOVD_MAP_0LEN_ARRAY) != 0)
7753 tree nc = build_omp_clause (input_location, OMP_CLAUSE_MAP);
7754 OMP_CLAUSE_DECL (nc) = decl;
7755 if (TREE_CODE (TREE_TYPE (decl)) == REFERENCE_TYPE
7756 && TREE_CODE (TREE_TYPE (TREE_TYPE (decl))) == POINTER_TYPE)
7757 OMP_CLAUSE_DECL (clause)
7758 = build_simple_mem_ref_loc (input_location, decl);
7759 OMP_CLAUSE_DECL (clause)
7760 = build2 (MEM_REF, char_type_node, OMP_CLAUSE_DECL (clause),
7761 build_int_cst (build_pointer_type (char_type_node), 0));
7762 OMP_CLAUSE_SIZE (clause) = size_zero_node;
7763 OMP_CLAUSE_SIZE (nc) = size_zero_node;
7764 OMP_CLAUSE_SET_MAP_KIND (clause, GOMP_MAP_ALLOC);
7765 OMP_CLAUSE_MAP_MAYBE_ZERO_LENGTH_ARRAY_SECTION (clause) = 1;
7766 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_FIRSTPRIVATE_POINTER);
7767 OMP_CLAUSE_CHAIN (nc) = *list_p;
7768 OMP_CLAUSE_CHAIN (clause) = nc;
7769 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
7770 gimplify_omp_ctxp = ctx->outer_context;
7771 gimplify_expr (&TREE_OPERAND (OMP_CLAUSE_DECL (clause), 0),
7772 pre_p, NULL, is_gimple_val, fb_rvalue);
7773 gimplify_omp_ctxp = ctx;
7775 else if (code == OMP_CLAUSE_MAP)
7777 int kind = (flags & GOVD_MAP_TO_ONLY
7778 ? GOMP_MAP_TO
7779 : GOMP_MAP_TOFROM);
7780 if (flags & GOVD_MAP_FORCE)
7781 kind |= GOMP_MAP_FLAG_FORCE;
7782 OMP_CLAUSE_SET_MAP_KIND (clause, kind);
7783 if (DECL_SIZE (decl)
7784 && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
7786 tree decl2 = DECL_VALUE_EXPR (decl);
7787 gcc_assert (TREE_CODE (decl2) == INDIRECT_REF);
7788 decl2 = TREE_OPERAND (decl2, 0);
7789 gcc_assert (DECL_P (decl2));
7790 tree mem = build_simple_mem_ref (decl2);
7791 OMP_CLAUSE_DECL (clause) = mem;
7792 OMP_CLAUSE_SIZE (clause) = TYPE_SIZE_UNIT (TREE_TYPE (decl));
7793 if (gimplify_omp_ctxp->outer_context)
7795 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp->outer_context;
7796 omp_notice_variable (ctx, decl2, true);
7797 omp_notice_variable (ctx, OMP_CLAUSE_SIZE (clause), true);
7799 tree nc = build_omp_clause (OMP_CLAUSE_LOCATION (clause),
7800 OMP_CLAUSE_MAP);
7801 OMP_CLAUSE_DECL (nc) = decl;
7802 OMP_CLAUSE_SIZE (nc) = size_zero_node;
7803 if (gimplify_omp_ctxp->target_firstprivatize_array_bases)
7804 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_FIRSTPRIVATE_POINTER);
7805 else
7806 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_POINTER);
7807 OMP_CLAUSE_CHAIN (nc) = OMP_CLAUSE_CHAIN (clause);
7808 OMP_CLAUSE_CHAIN (clause) = nc;
7810 else if (gimplify_omp_ctxp->target_firstprivatize_array_bases
7811 && lang_hooks.decls.omp_privatize_by_reference (decl))
7813 OMP_CLAUSE_DECL (clause) = build_simple_mem_ref (decl);
7814 OMP_CLAUSE_SIZE (clause)
7815 = unshare_expr (TYPE_SIZE_UNIT (TREE_TYPE (TREE_TYPE (decl))));
7816 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
7817 gimplify_omp_ctxp = ctx->outer_context;
7818 gimplify_expr (&OMP_CLAUSE_SIZE (clause),
7819 pre_p, NULL, is_gimple_val, fb_rvalue);
7820 gimplify_omp_ctxp = ctx;
7821 tree nc = build_omp_clause (OMP_CLAUSE_LOCATION (clause),
7822 OMP_CLAUSE_MAP);
7823 OMP_CLAUSE_DECL (nc) = decl;
7824 OMP_CLAUSE_SIZE (nc) = size_zero_node;
7825 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_FIRSTPRIVATE_REFERENCE);
7826 OMP_CLAUSE_CHAIN (nc) = OMP_CLAUSE_CHAIN (clause);
7827 OMP_CLAUSE_CHAIN (clause) = nc;
7829 else
7830 OMP_CLAUSE_SIZE (clause) = DECL_SIZE_UNIT (decl);
7832 if (code == OMP_CLAUSE_FIRSTPRIVATE && (flags & GOVD_LASTPRIVATE) != 0)
7834 tree nc = build_omp_clause (input_location, OMP_CLAUSE_LASTPRIVATE);
7835 OMP_CLAUSE_DECL (nc) = decl;
7836 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (nc) = 1;
7837 OMP_CLAUSE_CHAIN (nc) = *list_p;
7838 OMP_CLAUSE_CHAIN (clause) = nc;
7839 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
7840 gimplify_omp_ctxp = ctx->outer_context;
7841 lang_hooks.decls.omp_finish_clause (nc, pre_p);
7842 gimplify_omp_ctxp = ctx;
7844 *list_p = clause;
7845 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
7846 gimplify_omp_ctxp = ctx->outer_context;
7847 lang_hooks.decls.omp_finish_clause (clause, pre_p);
7848 gimplify_omp_ctxp = ctx;
7849 return 0;
7852 static void
7853 gimplify_adjust_omp_clauses (gimple_seq *pre_p, gimple_seq body, tree *list_p,
7854 enum tree_code code)
7856 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
7857 tree c, decl;
7859 if (body)
7861 struct gimplify_omp_ctx *octx;
7862 for (octx = ctx; octx; octx = octx->outer_context)
7863 if ((octx->region_type & (ORT_PARALLEL | ORT_TASK | ORT_TEAMS)) != 0)
7864 break;
7865 if (octx)
7867 struct walk_stmt_info wi;
7868 memset (&wi, 0, sizeof (wi));
7869 walk_gimple_seq (body, omp_find_stores_stmt,
7870 omp_find_stores_op, &wi);
7873 while ((c = *list_p) != NULL)
7875 splay_tree_node n;
7876 bool remove = false;
7878 switch (OMP_CLAUSE_CODE (c))
7880 case OMP_CLAUSE_PRIVATE:
7881 case OMP_CLAUSE_SHARED:
7882 case OMP_CLAUSE_FIRSTPRIVATE:
7883 case OMP_CLAUSE_LINEAR:
7884 decl = OMP_CLAUSE_DECL (c);
7885 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
7886 remove = !(n->value & GOVD_SEEN);
7887 if (! remove)
7889 bool shared = OMP_CLAUSE_CODE (c) == OMP_CLAUSE_SHARED;
7890 if ((n->value & GOVD_DEBUG_PRIVATE)
7891 || lang_hooks.decls.omp_private_debug_clause (decl, shared))
7893 gcc_assert ((n->value & GOVD_DEBUG_PRIVATE) == 0
7894 || ((n->value & GOVD_DATA_SHARE_CLASS)
7895 == GOVD_PRIVATE));
7896 OMP_CLAUSE_SET_CODE (c, OMP_CLAUSE_PRIVATE);
7897 OMP_CLAUSE_PRIVATE_DEBUG (c) = 1;
7899 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_SHARED
7900 && (n->value & GOVD_WRITTEN) == 0
7901 && DECL_P (decl)
7902 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
7903 OMP_CLAUSE_SHARED_READONLY (c) = 1;
7904 else if (DECL_P (decl)
7905 && ((OMP_CLAUSE_CODE (c) == OMP_CLAUSE_SHARED
7906 && (n->value & GOVD_WRITTEN) != 1)
7907 || (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
7908 && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c)))
7909 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
7910 omp_mark_stores (gimplify_omp_ctxp->outer_context, decl);
7912 break;
7914 case OMP_CLAUSE_LASTPRIVATE:
7915 /* Make sure OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE is set to
7916 accurately reflect the presence of a FIRSTPRIVATE clause. */
7917 decl = OMP_CLAUSE_DECL (c);
7918 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
7919 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c)
7920 = (n->value & GOVD_FIRSTPRIVATE) != 0;
7921 if (omp_no_lastprivate (ctx))
7923 if (OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c))
7924 remove = true;
7925 else
7926 OMP_CLAUSE_CODE (c) = OMP_CLAUSE_PRIVATE;
7928 else if (code == OMP_DISTRIBUTE
7929 && OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c))
7931 remove = true;
7932 error_at (OMP_CLAUSE_LOCATION (c),
7933 "same variable used in %<firstprivate%> and "
7934 "%<lastprivate%> clauses on %<distribute%> "
7935 "construct");
7937 if (!remove
7938 && OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE
7939 && DECL_P (decl)
7940 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
7941 omp_mark_stores (gimplify_omp_ctxp->outer_context, decl);
7942 break;
7944 case OMP_CLAUSE_ALIGNED:
7945 decl = OMP_CLAUSE_DECL (c);
7946 if (!is_global_var (decl))
7948 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
7949 remove = n == NULL || !(n->value & GOVD_SEEN);
7950 if (!remove && TREE_CODE (TREE_TYPE (decl)) == POINTER_TYPE)
7952 struct gimplify_omp_ctx *octx;
7953 if (n != NULL
7954 && (n->value & (GOVD_DATA_SHARE_CLASS
7955 & ~GOVD_FIRSTPRIVATE)))
7956 remove = true;
7957 else
7958 for (octx = ctx->outer_context; octx;
7959 octx = octx->outer_context)
7961 n = splay_tree_lookup (octx->variables,
7962 (splay_tree_key) decl);
7963 if (n == NULL)
7964 continue;
7965 if (n->value & GOVD_LOCAL)
7966 break;
7967 /* We have to avoid assigning a shared variable
7968 to itself when trying to add
7969 __builtin_assume_aligned. */
7970 if (n->value & GOVD_SHARED)
7972 remove = true;
7973 break;
7978 else if (TREE_CODE (TREE_TYPE (decl)) == ARRAY_TYPE)
7980 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
7981 if (n != NULL && (n->value & GOVD_DATA_SHARE_CLASS) != 0)
7982 remove = true;
7984 break;
7986 case OMP_CLAUSE_MAP:
7987 if (code == OMP_TARGET_EXIT_DATA
7988 && OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_ALWAYS_POINTER)
7990 remove = true;
7991 break;
7993 decl = OMP_CLAUSE_DECL (c);
7994 /* Data clasues associated with acc parallel reductions must be
7995 compatible with present_or_copy. Warn and adjust the clause
7996 if that is not the case. */
7997 if (ctx->region_type == ORT_ACC_PARALLEL)
7999 tree t = DECL_P (decl) ? decl : TREE_OPERAND (decl, 0);
8000 n = NULL;
8002 if (DECL_P (t))
8003 n = splay_tree_lookup (ctx->variables, (splay_tree_key) t);
8005 if (n && (n->value & GOVD_REDUCTION))
8007 enum gomp_map_kind kind = OMP_CLAUSE_MAP_KIND (c);
8009 OMP_CLAUSE_MAP_IN_REDUCTION (c) = 1;
8010 if ((kind & GOMP_MAP_TOFROM) != GOMP_MAP_TOFROM
8011 && kind != GOMP_MAP_FORCE_PRESENT
8012 && kind != GOMP_MAP_POINTER)
8014 warning_at (OMP_CLAUSE_LOCATION (c), 0,
8015 "incompatible data clause with reduction "
8016 "on %qE; promoting to present_or_copy",
8017 DECL_NAME (t));
8018 OMP_CLAUSE_SET_MAP_KIND (c, GOMP_MAP_TOFROM);
8022 if (!DECL_P (decl))
8024 if ((ctx->region_type & ORT_TARGET) != 0
8025 && OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_FIRSTPRIVATE_POINTER)
8027 if (TREE_CODE (decl) == INDIRECT_REF
8028 && TREE_CODE (TREE_OPERAND (decl, 0)) == COMPONENT_REF
8029 && (TREE_CODE (TREE_TYPE (TREE_OPERAND (decl, 0)))
8030 == REFERENCE_TYPE))
8031 decl = TREE_OPERAND (decl, 0);
8032 if (TREE_CODE (decl) == COMPONENT_REF)
8034 while (TREE_CODE (decl) == COMPONENT_REF)
8035 decl = TREE_OPERAND (decl, 0);
8036 if (DECL_P (decl))
8038 n = splay_tree_lookup (ctx->variables,
8039 (splay_tree_key) decl);
8040 if (!(n->value & GOVD_SEEN))
8041 remove = true;
8045 break;
8047 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
8048 if ((ctx->region_type & ORT_TARGET) != 0
8049 && !(n->value & GOVD_SEEN)
8050 && GOMP_MAP_ALWAYS_P (OMP_CLAUSE_MAP_KIND (c)) == 0
8051 && !lookup_attribute ("omp declare target link",
8052 DECL_ATTRIBUTES (decl)))
8054 remove = true;
8055 /* For struct element mapping, if struct is never referenced
8056 in target block and none of the mapping has always modifier,
8057 remove all the struct element mappings, which immediately
8058 follow the GOMP_MAP_STRUCT map clause. */
8059 if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_STRUCT)
8061 HOST_WIDE_INT cnt = tree_to_shwi (OMP_CLAUSE_SIZE (c));
8062 while (cnt--)
8063 OMP_CLAUSE_CHAIN (c)
8064 = OMP_CLAUSE_CHAIN (OMP_CLAUSE_CHAIN (c));
8067 else if (OMP_CLAUSE_MAP_KIND (c) == GOMP_MAP_STRUCT
8068 && code == OMP_TARGET_EXIT_DATA)
8069 remove = true;
8070 else if (DECL_SIZE (decl)
8071 && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST
8072 && OMP_CLAUSE_MAP_KIND (c) != GOMP_MAP_POINTER
8073 && OMP_CLAUSE_MAP_KIND (c) != GOMP_MAP_FIRSTPRIVATE_POINTER
8074 && (OMP_CLAUSE_MAP_KIND (c)
8075 != GOMP_MAP_FIRSTPRIVATE_REFERENCE))
8077 /* For GOMP_MAP_FORCE_DEVICEPTR, we'll never enter here, because
8078 for these, TREE_CODE (DECL_SIZE (decl)) will always be
8079 INTEGER_CST. */
8080 gcc_assert (OMP_CLAUSE_MAP_KIND (c) != GOMP_MAP_FORCE_DEVICEPTR);
8082 tree decl2 = DECL_VALUE_EXPR (decl);
8083 gcc_assert (TREE_CODE (decl2) == INDIRECT_REF);
8084 decl2 = TREE_OPERAND (decl2, 0);
8085 gcc_assert (DECL_P (decl2));
8086 tree mem = build_simple_mem_ref (decl2);
8087 OMP_CLAUSE_DECL (c) = mem;
8088 OMP_CLAUSE_SIZE (c) = TYPE_SIZE_UNIT (TREE_TYPE (decl));
8089 if (ctx->outer_context)
8091 omp_notice_variable (ctx->outer_context, decl2, true);
8092 omp_notice_variable (ctx->outer_context,
8093 OMP_CLAUSE_SIZE (c), true);
8095 if (((ctx->region_type & ORT_TARGET) != 0
8096 || !ctx->target_firstprivatize_array_bases)
8097 && ((n->value & GOVD_SEEN) == 0
8098 || (n->value & (GOVD_PRIVATE | GOVD_FIRSTPRIVATE)) == 0))
8100 tree nc = build_omp_clause (OMP_CLAUSE_LOCATION (c),
8101 OMP_CLAUSE_MAP);
8102 OMP_CLAUSE_DECL (nc) = decl;
8103 OMP_CLAUSE_SIZE (nc) = size_zero_node;
8104 if (ctx->target_firstprivatize_array_bases)
8105 OMP_CLAUSE_SET_MAP_KIND (nc,
8106 GOMP_MAP_FIRSTPRIVATE_POINTER);
8107 else
8108 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_POINTER);
8109 OMP_CLAUSE_CHAIN (nc) = OMP_CLAUSE_CHAIN (c);
8110 OMP_CLAUSE_CHAIN (c) = nc;
8111 c = nc;
8114 else
8116 if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
8117 OMP_CLAUSE_SIZE (c) = DECL_SIZE_UNIT (decl);
8118 gcc_assert ((n->value & GOVD_SEEN) == 0
8119 || ((n->value & (GOVD_PRIVATE | GOVD_FIRSTPRIVATE))
8120 == 0));
8122 break;
8124 case OMP_CLAUSE_TO:
8125 case OMP_CLAUSE_FROM:
8126 case OMP_CLAUSE__CACHE_:
8127 decl = OMP_CLAUSE_DECL (c);
8128 if (!DECL_P (decl))
8129 break;
8130 if (DECL_SIZE (decl)
8131 && TREE_CODE (DECL_SIZE (decl)) != INTEGER_CST)
8133 tree decl2 = DECL_VALUE_EXPR (decl);
8134 gcc_assert (TREE_CODE (decl2) == INDIRECT_REF);
8135 decl2 = TREE_OPERAND (decl2, 0);
8136 gcc_assert (DECL_P (decl2));
8137 tree mem = build_simple_mem_ref (decl2);
8138 OMP_CLAUSE_DECL (c) = mem;
8139 OMP_CLAUSE_SIZE (c) = TYPE_SIZE_UNIT (TREE_TYPE (decl));
8140 if (ctx->outer_context)
8142 omp_notice_variable (ctx->outer_context, decl2, true);
8143 omp_notice_variable (ctx->outer_context,
8144 OMP_CLAUSE_SIZE (c), true);
8147 else if (OMP_CLAUSE_SIZE (c) == NULL_TREE)
8148 OMP_CLAUSE_SIZE (c) = DECL_SIZE_UNIT (decl);
8149 break;
8151 case OMP_CLAUSE_REDUCTION:
8152 decl = OMP_CLAUSE_DECL (c);
8153 /* OpenACC reductions need a present_or_copy data clause.
8154 Add one if necessary. Error is the reduction is private. */
8155 if (ctx->region_type == ORT_ACC_PARALLEL)
8157 n = splay_tree_lookup (ctx->variables, (splay_tree_key) decl);
8158 if (n->value & (GOVD_PRIVATE | GOVD_FIRSTPRIVATE))
8159 error_at (OMP_CLAUSE_LOCATION (c), "invalid private "
8160 "reduction on %qE", DECL_NAME (decl));
8161 else if ((n->value & GOVD_MAP) == 0)
8163 tree next = OMP_CLAUSE_CHAIN (c);
8164 tree nc = build_omp_clause (UNKNOWN_LOCATION, OMP_CLAUSE_MAP);
8165 OMP_CLAUSE_SET_MAP_KIND (nc, GOMP_MAP_TOFROM);
8166 OMP_CLAUSE_DECL (nc) = decl;
8167 OMP_CLAUSE_CHAIN (c) = nc;
8168 lang_hooks.decls.omp_finish_clause (nc, pre_p);
8169 while (1)
8171 OMP_CLAUSE_MAP_IN_REDUCTION (nc) = 1;
8172 if (OMP_CLAUSE_CHAIN (nc) == NULL)
8173 break;
8174 nc = OMP_CLAUSE_CHAIN (nc);
8176 OMP_CLAUSE_CHAIN (nc) = next;
8177 n->value |= GOVD_MAP;
8180 if (DECL_P (decl)
8181 && omp_shared_to_firstprivate_optimizable_decl_p (decl))
8182 omp_mark_stores (gimplify_omp_ctxp->outer_context, decl);
8183 break;
8184 case OMP_CLAUSE_COPYIN:
8185 case OMP_CLAUSE_COPYPRIVATE:
8186 case OMP_CLAUSE_IF:
8187 case OMP_CLAUSE_NUM_THREADS:
8188 case OMP_CLAUSE_NUM_TEAMS:
8189 case OMP_CLAUSE_THREAD_LIMIT:
8190 case OMP_CLAUSE_DIST_SCHEDULE:
8191 case OMP_CLAUSE_DEVICE:
8192 case OMP_CLAUSE_SCHEDULE:
8193 case OMP_CLAUSE_NOWAIT:
8194 case OMP_CLAUSE_ORDERED:
8195 case OMP_CLAUSE_DEFAULT:
8196 case OMP_CLAUSE_UNTIED:
8197 case OMP_CLAUSE_COLLAPSE:
8198 case OMP_CLAUSE_FINAL:
8199 case OMP_CLAUSE_MERGEABLE:
8200 case OMP_CLAUSE_PROC_BIND:
8201 case OMP_CLAUSE_SAFELEN:
8202 case OMP_CLAUSE_SIMDLEN:
8203 case OMP_CLAUSE_DEPEND:
8204 case OMP_CLAUSE_PRIORITY:
8205 case OMP_CLAUSE_GRAINSIZE:
8206 case OMP_CLAUSE_NUM_TASKS:
8207 case OMP_CLAUSE_NOGROUP:
8208 case OMP_CLAUSE_THREADS:
8209 case OMP_CLAUSE_SIMD:
8210 case OMP_CLAUSE_HINT:
8211 case OMP_CLAUSE_DEFAULTMAP:
8212 case OMP_CLAUSE_USE_DEVICE_PTR:
8213 case OMP_CLAUSE_IS_DEVICE_PTR:
8214 case OMP_CLAUSE__CILK_FOR_COUNT_:
8215 case OMP_CLAUSE_ASYNC:
8216 case OMP_CLAUSE_WAIT:
8217 case OMP_CLAUSE_DEVICE_RESIDENT:
8218 case OMP_CLAUSE_INDEPENDENT:
8219 case OMP_CLAUSE_NUM_GANGS:
8220 case OMP_CLAUSE_NUM_WORKERS:
8221 case OMP_CLAUSE_VECTOR_LENGTH:
8222 case OMP_CLAUSE_GANG:
8223 case OMP_CLAUSE_WORKER:
8224 case OMP_CLAUSE_VECTOR:
8225 case OMP_CLAUSE_AUTO:
8226 case OMP_CLAUSE_SEQ:
8227 case OMP_CLAUSE_TILE:
8228 break;
8230 default:
8231 gcc_unreachable ();
8234 if (remove)
8235 *list_p = OMP_CLAUSE_CHAIN (c);
8236 else
8237 list_p = &OMP_CLAUSE_CHAIN (c);
8240 /* Add in any implicit data sharing. */
8241 struct gimplify_adjust_omp_clauses_data data;
8242 data.list_p = list_p;
8243 data.pre_p = pre_p;
8244 splay_tree_foreach (ctx->variables, gimplify_adjust_omp_clauses_1, &data);
8246 gimplify_omp_ctxp = ctx->outer_context;
8247 delete_omp_context (ctx);
8250 /* Gimplify OACC_CACHE. */
8252 static void
8253 gimplify_oacc_cache (tree *expr_p, gimple_seq *pre_p)
8255 tree expr = *expr_p;
8257 gimplify_scan_omp_clauses (&OACC_CACHE_CLAUSES (expr), pre_p, ORT_ACC,
8258 OACC_CACHE);
8259 gimplify_adjust_omp_clauses (pre_p, NULL, &OACC_CACHE_CLAUSES (expr),
8260 OACC_CACHE);
8262 /* TODO: Do something sensible with this information. */
8264 *expr_p = NULL_TREE;
8267 /* Helper function of gimplify_oacc_declare. The helper's purpose is to,
8268 if required, translate 'kind' in CLAUSE into an 'entry' kind and 'exit'
8269 kind. The entry kind will replace the one in CLAUSE, while the exit
8270 kind will be used in a new omp_clause and returned to the caller. */
8272 static tree
8273 gimplify_oacc_declare_1 (tree clause)
8275 HOST_WIDE_INT kind, new_op;
8276 bool ret = false;
8277 tree c = NULL;
8279 kind = OMP_CLAUSE_MAP_KIND (clause);
8281 switch (kind)
8283 case GOMP_MAP_ALLOC:
8284 case GOMP_MAP_FORCE_ALLOC:
8285 case GOMP_MAP_FORCE_TO:
8286 new_op = GOMP_MAP_DELETE;
8287 ret = true;
8288 break;
8290 case GOMP_MAP_FORCE_FROM:
8291 OMP_CLAUSE_SET_MAP_KIND (clause, GOMP_MAP_FORCE_ALLOC);
8292 new_op = GOMP_MAP_FORCE_FROM;
8293 ret = true;
8294 break;
8296 case GOMP_MAP_FORCE_TOFROM:
8297 OMP_CLAUSE_SET_MAP_KIND (clause, GOMP_MAP_FORCE_TO);
8298 new_op = GOMP_MAP_FORCE_FROM;
8299 ret = true;
8300 break;
8302 case GOMP_MAP_FROM:
8303 OMP_CLAUSE_SET_MAP_KIND (clause, GOMP_MAP_FORCE_ALLOC);
8304 new_op = GOMP_MAP_FROM;
8305 ret = true;
8306 break;
8308 case GOMP_MAP_TOFROM:
8309 OMP_CLAUSE_SET_MAP_KIND (clause, GOMP_MAP_TO);
8310 new_op = GOMP_MAP_FROM;
8311 ret = true;
8312 break;
8314 case GOMP_MAP_DEVICE_RESIDENT:
8315 case GOMP_MAP_FORCE_DEVICEPTR:
8316 case GOMP_MAP_FORCE_PRESENT:
8317 case GOMP_MAP_LINK:
8318 case GOMP_MAP_POINTER:
8319 case GOMP_MAP_TO:
8320 break;
8322 default:
8323 gcc_unreachable ();
8324 break;
8327 if (ret)
8329 c = build_omp_clause (OMP_CLAUSE_LOCATION (clause), OMP_CLAUSE_MAP);
8330 OMP_CLAUSE_SET_MAP_KIND (c, new_op);
8331 OMP_CLAUSE_DECL (c) = OMP_CLAUSE_DECL (clause);
8334 return c;
8337 /* Gimplify OACC_DECLARE. */
8339 static void
8340 gimplify_oacc_declare (tree *expr_p, gimple_seq *pre_p)
8342 tree expr = *expr_p;
8343 gomp_target *stmt;
8344 tree clauses, t;
8346 clauses = OACC_DECLARE_CLAUSES (expr);
8348 gimplify_scan_omp_clauses (&clauses, pre_p, ORT_TARGET_DATA, OACC_DECLARE);
8350 for (t = clauses; t; t = OMP_CLAUSE_CHAIN (t))
8352 tree decl = OMP_CLAUSE_DECL (t);
8354 if (TREE_CODE (decl) == MEM_REF)
8355 continue;
8357 if (TREE_CODE (decl) == VAR_DECL
8358 && !is_global_var (decl)
8359 && DECL_CONTEXT (decl) == current_function_decl)
8361 tree c = gimplify_oacc_declare_1 (t);
8362 if (c)
8364 if (oacc_declare_returns == NULL)
8365 oacc_declare_returns = new hash_map<tree, tree>;
8367 oacc_declare_returns->put (decl, c);
8371 omp_add_variable (gimplify_omp_ctxp, decl, GOVD_SEEN);
8374 stmt = gimple_build_omp_target (NULL, GF_OMP_TARGET_KIND_OACC_DECLARE,
8375 clauses);
8377 gimplify_seq_add_stmt (pre_p, stmt);
8379 *expr_p = NULL_TREE;
8382 /* Gimplify the contents of an OMP_PARALLEL statement. This involves
8383 gimplification of the body, as well as scanning the body for used
8384 variables. We need to do this scan now, because variable-sized
8385 decls will be decomposed during gimplification. */
8387 static void
8388 gimplify_omp_parallel (tree *expr_p, gimple_seq *pre_p)
8390 tree expr = *expr_p;
8391 gimple *g;
8392 gimple_seq body = NULL;
8394 gimplify_scan_omp_clauses (&OMP_PARALLEL_CLAUSES (expr), pre_p,
8395 OMP_PARALLEL_COMBINED (expr)
8396 ? ORT_COMBINED_PARALLEL
8397 : ORT_PARALLEL, OMP_PARALLEL);
8399 push_gimplify_context ();
8401 g = gimplify_and_return_first (OMP_PARALLEL_BODY (expr), &body);
8402 if (gimple_code (g) == GIMPLE_BIND)
8403 pop_gimplify_context (g);
8404 else
8405 pop_gimplify_context (NULL);
8407 gimplify_adjust_omp_clauses (pre_p, body, &OMP_PARALLEL_CLAUSES (expr),
8408 OMP_PARALLEL);
8410 g = gimple_build_omp_parallel (body,
8411 OMP_PARALLEL_CLAUSES (expr),
8412 NULL_TREE, NULL_TREE);
8413 if (OMP_PARALLEL_COMBINED (expr))
8414 gimple_omp_set_subcode (g, GF_OMP_PARALLEL_COMBINED);
8415 gimplify_seq_add_stmt (pre_p, g);
8416 *expr_p = NULL_TREE;
8419 /* Gimplify the contents of an OMP_TASK statement. This involves
8420 gimplification of the body, as well as scanning the body for used
8421 variables. We need to do this scan now, because variable-sized
8422 decls will be decomposed during gimplification. */
8424 static void
8425 gimplify_omp_task (tree *expr_p, gimple_seq *pre_p)
8427 tree expr = *expr_p;
8428 gimple *g;
8429 gimple_seq body = NULL;
8431 gimplify_scan_omp_clauses (&OMP_TASK_CLAUSES (expr), pre_p,
8432 find_omp_clause (OMP_TASK_CLAUSES (expr),
8433 OMP_CLAUSE_UNTIED)
8434 ? ORT_UNTIED_TASK : ORT_TASK, OMP_TASK);
8436 push_gimplify_context ();
8438 g = gimplify_and_return_first (OMP_TASK_BODY (expr), &body);
8439 if (gimple_code (g) == GIMPLE_BIND)
8440 pop_gimplify_context (g);
8441 else
8442 pop_gimplify_context (NULL);
8444 gimplify_adjust_omp_clauses (pre_p, body, &OMP_TASK_CLAUSES (expr),
8445 OMP_TASK);
8447 g = gimple_build_omp_task (body,
8448 OMP_TASK_CLAUSES (expr),
8449 NULL_TREE, NULL_TREE,
8450 NULL_TREE, NULL_TREE, NULL_TREE);
8451 gimplify_seq_add_stmt (pre_p, g);
8452 *expr_p = NULL_TREE;
8455 /* Helper function of gimplify_omp_for, find OMP_FOR resp. OMP_SIMD
8456 with non-NULL OMP_FOR_INIT. */
8458 static tree
8459 find_combined_omp_for (tree *tp, int *walk_subtrees, void *)
8461 *walk_subtrees = 0;
8462 switch (TREE_CODE (*tp))
8464 case OMP_FOR:
8465 *walk_subtrees = 1;
8466 /* FALLTHRU */
8467 case OMP_SIMD:
8468 if (OMP_FOR_INIT (*tp) != NULL_TREE)
8469 return *tp;
8470 break;
8471 case BIND_EXPR:
8472 case STATEMENT_LIST:
8473 case OMP_PARALLEL:
8474 *walk_subtrees = 1;
8475 break;
8476 default:
8477 break;
8479 return NULL_TREE;
8482 /* Gimplify the gross structure of an OMP_FOR statement. */
8484 static enum gimplify_status
8485 gimplify_omp_for (tree *expr_p, gimple_seq *pre_p)
8487 tree for_stmt, orig_for_stmt, inner_for_stmt = NULL_TREE, decl, var, t;
8488 enum gimplify_status ret = GS_ALL_DONE;
8489 enum gimplify_status tret;
8490 gomp_for *gfor;
8491 gimple_seq for_body, for_pre_body;
8492 int i;
8493 bitmap has_decl_expr = NULL;
8494 enum omp_region_type ort = ORT_WORKSHARE;
8496 orig_for_stmt = for_stmt = *expr_p;
8498 switch (TREE_CODE (for_stmt))
8500 case OMP_FOR:
8501 case CILK_FOR:
8502 case OMP_DISTRIBUTE:
8503 break;
8504 case OACC_LOOP:
8505 ort = ORT_ACC;
8506 break;
8507 case OMP_TASKLOOP:
8508 if (find_omp_clause (OMP_FOR_CLAUSES (for_stmt), OMP_CLAUSE_UNTIED))
8509 ort = ORT_UNTIED_TASK;
8510 else
8511 ort = ORT_TASK;
8512 break;
8513 case OMP_SIMD:
8514 case CILK_SIMD:
8515 ort = ORT_SIMD;
8516 break;
8517 default:
8518 gcc_unreachable ();
8521 /* Set OMP_CLAUSE_LINEAR_NO_COPYIN flag on explicit linear
8522 clause for the IV. */
8523 if (ort == ORT_SIMD && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) == 1)
8525 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), 0);
8526 gcc_assert (TREE_CODE (t) == MODIFY_EXPR);
8527 decl = TREE_OPERAND (t, 0);
8528 for (tree c = OMP_FOR_CLAUSES (for_stmt); c; c = OMP_CLAUSE_CHAIN (c))
8529 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
8530 && OMP_CLAUSE_DECL (c) == decl)
8532 OMP_CLAUSE_LINEAR_NO_COPYIN (c) = 1;
8533 break;
8537 if (OMP_FOR_INIT (for_stmt) == NULL_TREE)
8539 gcc_assert (TREE_CODE (for_stmt) != OACC_LOOP);
8540 inner_for_stmt = walk_tree (&OMP_FOR_BODY (for_stmt),
8541 find_combined_omp_for, NULL, NULL);
8542 if (inner_for_stmt == NULL_TREE)
8544 gcc_assert (seen_error ());
8545 *expr_p = NULL_TREE;
8546 return GS_ERROR;
8550 if (TREE_CODE (for_stmt) != OMP_TASKLOOP)
8551 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (for_stmt), pre_p, ort,
8552 TREE_CODE (for_stmt));
8554 if (TREE_CODE (for_stmt) == OMP_DISTRIBUTE)
8555 gimplify_omp_ctxp->distribute = true;
8557 /* Handle OMP_FOR_INIT. */
8558 for_pre_body = NULL;
8559 if (ort == ORT_SIMD && OMP_FOR_PRE_BODY (for_stmt))
8561 has_decl_expr = BITMAP_ALLOC (NULL);
8562 if (TREE_CODE (OMP_FOR_PRE_BODY (for_stmt)) == DECL_EXPR
8563 && TREE_CODE (DECL_EXPR_DECL (OMP_FOR_PRE_BODY (for_stmt)))
8564 == VAR_DECL)
8566 t = OMP_FOR_PRE_BODY (for_stmt);
8567 bitmap_set_bit (has_decl_expr, DECL_UID (DECL_EXPR_DECL (t)));
8569 else if (TREE_CODE (OMP_FOR_PRE_BODY (for_stmt)) == STATEMENT_LIST)
8571 tree_stmt_iterator si;
8572 for (si = tsi_start (OMP_FOR_PRE_BODY (for_stmt)); !tsi_end_p (si);
8573 tsi_next (&si))
8575 t = tsi_stmt (si);
8576 if (TREE_CODE (t) == DECL_EXPR
8577 && TREE_CODE (DECL_EXPR_DECL (t)) == VAR_DECL)
8578 bitmap_set_bit (has_decl_expr, DECL_UID (DECL_EXPR_DECL (t)));
8582 if (OMP_FOR_PRE_BODY (for_stmt))
8584 if (TREE_CODE (for_stmt) != OMP_TASKLOOP || gimplify_omp_ctxp)
8585 gimplify_and_add (OMP_FOR_PRE_BODY (for_stmt), &for_pre_body);
8586 else
8588 struct gimplify_omp_ctx ctx;
8589 memset (&ctx, 0, sizeof (ctx));
8590 ctx.region_type = ORT_NONE;
8591 gimplify_omp_ctxp = &ctx;
8592 gimplify_and_add (OMP_FOR_PRE_BODY (for_stmt), &for_pre_body);
8593 gimplify_omp_ctxp = NULL;
8596 OMP_FOR_PRE_BODY (for_stmt) = NULL_TREE;
8598 if (OMP_FOR_INIT (for_stmt) == NULL_TREE)
8599 for_stmt = inner_for_stmt;
8601 /* For taskloop, need to gimplify the start, end and step before the
8602 taskloop, outside of the taskloop omp context. */
8603 if (TREE_CODE (orig_for_stmt) == OMP_TASKLOOP)
8605 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
8607 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
8608 if (!is_gimple_constant (TREE_OPERAND (t, 1)))
8610 TREE_OPERAND (t, 1)
8611 = get_initialized_tmp_var (TREE_OPERAND (t, 1),
8612 pre_p, NULL);
8613 tree c = build_omp_clause (input_location,
8614 OMP_CLAUSE_FIRSTPRIVATE);
8615 OMP_CLAUSE_DECL (c) = TREE_OPERAND (t, 1);
8616 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (orig_for_stmt);
8617 OMP_FOR_CLAUSES (orig_for_stmt) = c;
8620 /* Handle OMP_FOR_COND. */
8621 t = TREE_VEC_ELT (OMP_FOR_COND (for_stmt), i);
8622 if (!is_gimple_constant (TREE_OPERAND (t, 1)))
8624 TREE_OPERAND (t, 1)
8625 = get_initialized_tmp_var (TREE_OPERAND (t, 1),
8626 gimple_seq_empty_p (for_pre_body)
8627 ? pre_p : &for_pre_body, NULL);
8628 tree c = build_omp_clause (input_location,
8629 OMP_CLAUSE_FIRSTPRIVATE);
8630 OMP_CLAUSE_DECL (c) = TREE_OPERAND (t, 1);
8631 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (orig_for_stmt);
8632 OMP_FOR_CLAUSES (orig_for_stmt) = c;
8635 /* Handle OMP_FOR_INCR. */
8636 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
8637 if (TREE_CODE (t) == MODIFY_EXPR)
8639 decl = TREE_OPERAND (t, 0);
8640 t = TREE_OPERAND (t, 1);
8641 tree *tp = &TREE_OPERAND (t, 1);
8642 if (TREE_CODE (t) == PLUS_EXPR && *tp == decl)
8643 tp = &TREE_OPERAND (t, 0);
8645 if (!is_gimple_constant (*tp))
8647 gimple_seq *seq = gimple_seq_empty_p (for_pre_body)
8648 ? pre_p : &for_pre_body;
8649 *tp = get_initialized_tmp_var (*tp, seq, NULL);
8650 tree c = build_omp_clause (input_location,
8651 OMP_CLAUSE_FIRSTPRIVATE);
8652 OMP_CLAUSE_DECL (c) = *tp;
8653 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (orig_for_stmt);
8654 OMP_FOR_CLAUSES (orig_for_stmt) = c;
8659 gimplify_scan_omp_clauses (&OMP_FOR_CLAUSES (orig_for_stmt), pre_p, ort,
8660 OMP_TASKLOOP);
8663 if (orig_for_stmt != for_stmt)
8664 gimplify_omp_ctxp->combined_loop = true;
8666 for_body = NULL;
8667 gcc_assert (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt))
8668 == TREE_VEC_LENGTH (OMP_FOR_COND (for_stmt)));
8669 gcc_assert (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt))
8670 == TREE_VEC_LENGTH (OMP_FOR_INCR (for_stmt)));
8672 tree c = find_omp_clause (OMP_FOR_CLAUSES (for_stmt), OMP_CLAUSE_ORDERED);
8673 bool is_doacross = false;
8674 if (c && OMP_CLAUSE_ORDERED_EXPR (c))
8676 is_doacross = true;
8677 gimplify_omp_ctxp->loop_iter_var.create (TREE_VEC_LENGTH
8678 (OMP_FOR_INIT (for_stmt))
8679 * 2);
8681 int collapse = 1;
8682 c = find_omp_clause (OMP_FOR_CLAUSES (for_stmt), OMP_CLAUSE_COLLAPSE);
8683 if (c)
8684 collapse = tree_to_shwi (OMP_CLAUSE_COLLAPSE_EXPR (c));
8685 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
8687 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
8688 gcc_assert (TREE_CODE (t) == MODIFY_EXPR);
8689 decl = TREE_OPERAND (t, 0);
8690 gcc_assert (DECL_P (decl));
8691 gcc_assert (INTEGRAL_TYPE_P (TREE_TYPE (decl))
8692 || POINTER_TYPE_P (TREE_TYPE (decl)));
8693 if (is_doacross)
8695 if (TREE_CODE (for_stmt) == OMP_FOR && OMP_FOR_ORIG_DECLS (for_stmt))
8696 gimplify_omp_ctxp->loop_iter_var.quick_push
8697 (TREE_VEC_ELT (OMP_FOR_ORIG_DECLS (for_stmt), i));
8698 else
8699 gimplify_omp_ctxp->loop_iter_var.quick_push (decl);
8700 gimplify_omp_ctxp->loop_iter_var.quick_push (decl);
8703 /* Make sure the iteration variable is private. */
8704 tree c = NULL_TREE;
8705 tree c2 = NULL_TREE;
8706 if (orig_for_stmt != for_stmt)
8707 /* Do this only on innermost construct for combined ones. */;
8708 else if (ort == ORT_SIMD)
8710 splay_tree_node n = splay_tree_lookup (gimplify_omp_ctxp->variables,
8711 (splay_tree_key) decl);
8712 omp_is_private (gimplify_omp_ctxp, decl,
8713 1 + (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt))
8714 != 1));
8715 if (n != NULL && (n->value & GOVD_DATA_SHARE_CLASS) != 0)
8716 omp_notice_variable (gimplify_omp_ctxp, decl, true);
8717 else if (TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) == 1)
8719 c = build_omp_clause (input_location, OMP_CLAUSE_LINEAR);
8720 OMP_CLAUSE_LINEAR_NO_COPYIN (c) = 1;
8721 unsigned int flags = GOVD_LINEAR | GOVD_EXPLICIT | GOVD_SEEN;
8722 if ((has_decl_expr
8723 && bitmap_bit_p (has_decl_expr, DECL_UID (decl)))
8724 || omp_no_lastprivate (gimplify_omp_ctxp))
8726 OMP_CLAUSE_LINEAR_NO_COPYOUT (c) = 1;
8727 flags |= GOVD_LINEAR_LASTPRIVATE_NO_OUTER;
8729 struct gimplify_omp_ctx *outer
8730 = gimplify_omp_ctxp->outer_context;
8731 if (outer && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c))
8733 if (outer->region_type == ORT_WORKSHARE
8734 && outer->combined_loop)
8736 n = splay_tree_lookup (outer->variables,
8737 (splay_tree_key)decl);
8738 if (n != NULL && (n->value & GOVD_LOCAL) != 0)
8740 OMP_CLAUSE_LINEAR_NO_COPYOUT (c) = 1;
8741 flags |= GOVD_LINEAR_LASTPRIVATE_NO_OUTER;
8743 else
8745 struct gimplify_omp_ctx *octx = outer->outer_context;
8746 if (octx
8747 && octx->region_type == ORT_COMBINED_PARALLEL
8748 && octx->outer_context
8749 && (octx->outer_context->region_type
8750 == ORT_WORKSHARE)
8751 && octx->outer_context->combined_loop)
8753 octx = octx->outer_context;
8754 n = splay_tree_lookup (octx->variables,
8755 (splay_tree_key)decl);
8756 if (n != NULL && (n->value & GOVD_LOCAL) != 0)
8758 OMP_CLAUSE_LINEAR_NO_COPYOUT (c) = 1;
8759 flags |= GOVD_LINEAR_LASTPRIVATE_NO_OUTER;
8766 OMP_CLAUSE_DECL (c) = decl;
8767 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (for_stmt);
8768 OMP_FOR_CLAUSES (for_stmt) = c;
8769 omp_add_variable (gimplify_omp_ctxp, decl, flags);
8770 if (outer && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c))
8772 if (outer->region_type == ORT_WORKSHARE
8773 && outer->combined_loop)
8775 if (outer->outer_context
8776 && (outer->outer_context->region_type
8777 == ORT_COMBINED_PARALLEL))
8778 outer = outer->outer_context;
8779 else if (omp_check_private (outer, decl, false))
8780 outer = NULL;
8782 else if (((outer->region_type & ORT_TASK) != 0)
8783 && outer->combined_loop
8784 && !omp_check_private (gimplify_omp_ctxp,
8785 decl, false))
8787 else if (outer->region_type != ORT_COMBINED_PARALLEL)
8789 omp_notice_variable (outer, decl, true);
8790 outer = NULL;
8792 if (outer)
8794 n = splay_tree_lookup (outer->variables,
8795 (splay_tree_key)decl);
8796 if (n == NULL || (n->value & GOVD_DATA_SHARE_CLASS) == 0)
8798 omp_add_variable (outer, decl,
8799 GOVD_LASTPRIVATE | GOVD_SEEN);
8800 if (outer->region_type == ORT_COMBINED_PARALLEL
8801 && outer->outer_context
8802 && (outer->outer_context->region_type
8803 == ORT_WORKSHARE)
8804 && outer->outer_context->combined_loop)
8806 outer = outer->outer_context;
8807 n = splay_tree_lookup (outer->variables,
8808 (splay_tree_key)decl);
8809 if (omp_check_private (outer, decl, false))
8810 outer = NULL;
8811 else if (n == NULL
8812 || ((n->value & GOVD_DATA_SHARE_CLASS)
8813 == 0))
8814 omp_add_variable (outer, decl,
8815 GOVD_LASTPRIVATE
8816 | GOVD_SEEN);
8817 else
8818 outer = NULL;
8820 if (outer && outer->outer_context
8821 && (outer->outer_context->region_type
8822 == ORT_COMBINED_TEAMS))
8824 outer = outer->outer_context;
8825 n = splay_tree_lookup (outer->variables,
8826 (splay_tree_key)decl);
8827 if (n == NULL
8828 || (n->value & GOVD_DATA_SHARE_CLASS) == 0)
8829 omp_add_variable (outer, decl,
8830 GOVD_SHARED | GOVD_SEEN);
8831 else
8832 outer = NULL;
8834 if (outer && outer->outer_context)
8835 omp_notice_variable (outer->outer_context, decl,
8836 true);
8841 else
8843 bool lastprivate
8844 = (!has_decl_expr
8845 || !bitmap_bit_p (has_decl_expr, DECL_UID (decl)))
8846 && !omp_no_lastprivate (gimplify_omp_ctxp);
8847 struct gimplify_omp_ctx *outer
8848 = gimplify_omp_ctxp->outer_context;
8849 if (outer && lastprivate)
8851 if (outer->region_type == ORT_WORKSHARE
8852 && outer->combined_loop)
8854 n = splay_tree_lookup (outer->variables,
8855 (splay_tree_key)decl);
8856 if (n != NULL && (n->value & GOVD_LOCAL) != 0)
8858 lastprivate = false;
8859 outer = NULL;
8861 else if (outer->outer_context
8862 && (outer->outer_context->region_type
8863 == ORT_COMBINED_PARALLEL))
8864 outer = outer->outer_context;
8865 else if (omp_check_private (outer, decl, false))
8866 outer = NULL;
8868 else if (((outer->region_type & ORT_TASK) != 0)
8869 && outer->combined_loop
8870 && !omp_check_private (gimplify_omp_ctxp,
8871 decl, false))
8873 else if (outer->region_type != ORT_COMBINED_PARALLEL)
8875 omp_notice_variable (outer, decl, true);
8876 outer = NULL;
8878 if (outer)
8880 n = splay_tree_lookup (outer->variables,
8881 (splay_tree_key)decl);
8882 if (n == NULL || (n->value & GOVD_DATA_SHARE_CLASS) == 0)
8884 omp_add_variable (outer, decl,
8885 GOVD_LASTPRIVATE | GOVD_SEEN);
8886 if (outer->region_type == ORT_COMBINED_PARALLEL
8887 && outer->outer_context
8888 && (outer->outer_context->region_type
8889 == ORT_WORKSHARE)
8890 && outer->outer_context->combined_loop)
8892 outer = outer->outer_context;
8893 n = splay_tree_lookup (outer->variables,
8894 (splay_tree_key)decl);
8895 if (omp_check_private (outer, decl, false))
8896 outer = NULL;
8897 else if (n == NULL
8898 || ((n->value & GOVD_DATA_SHARE_CLASS)
8899 == 0))
8900 omp_add_variable (outer, decl,
8901 GOVD_LASTPRIVATE
8902 | GOVD_SEEN);
8903 else
8904 outer = NULL;
8906 if (outer && outer->outer_context
8907 && (outer->outer_context->region_type
8908 == ORT_COMBINED_TEAMS))
8910 outer = outer->outer_context;
8911 n = splay_tree_lookup (outer->variables,
8912 (splay_tree_key)decl);
8913 if (n == NULL
8914 || (n->value & GOVD_DATA_SHARE_CLASS) == 0)
8915 omp_add_variable (outer, decl,
8916 GOVD_SHARED | GOVD_SEEN);
8917 else
8918 outer = NULL;
8920 if (outer && outer->outer_context)
8921 omp_notice_variable (outer->outer_context, decl,
8922 true);
8927 c = build_omp_clause (input_location,
8928 lastprivate ? OMP_CLAUSE_LASTPRIVATE
8929 : OMP_CLAUSE_PRIVATE);
8930 OMP_CLAUSE_DECL (c) = decl;
8931 OMP_CLAUSE_CHAIN (c) = OMP_FOR_CLAUSES (for_stmt);
8932 OMP_FOR_CLAUSES (for_stmt) = c;
8933 omp_add_variable (gimplify_omp_ctxp, decl,
8934 (lastprivate ? GOVD_LASTPRIVATE : GOVD_PRIVATE)
8935 | GOVD_EXPLICIT | GOVD_SEEN);
8936 c = NULL_TREE;
8939 else if (omp_is_private (gimplify_omp_ctxp, decl, 0))
8940 omp_notice_variable (gimplify_omp_ctxp, decl, true);
8941 else
8942 omp_add_variable (gimplify_omp_ctxp, decl, GOVD_PRIVATE | GOVD_SEEN);
8944 /* If DECL is not a gimple register, create a temporary variable to act
8945 as an iteration counter. This is valid, since DECL cannot be
8946 modified in the body of the loop. Similarly for any iteration vars
8947 in simd with collapse > 1 where the iterator vars must be
8948 lastprivate. */
8949 if (orig_for_stmt != for_stmt)
8950 var = decl;
8951 else if (!is_gimple_reg (decl)
8952 || (ort == ORT_SIMD
8953 && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) > 1))
8955 var = create_tmp_var (TREE_TYPE (decl), get_name (decl));
8956 TREE_OPERAND (t, 0) = var;
8958 gimplify_seq_add_stmt (&for_body, gimple_build_assign (decl, var));
8960 if (ort == ORT_SIMD
8961 && TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)) == 1)
8963 c2 = build_omp_clause (input_location, OMP_CLAUSE_LINEAR);
8964 OMP_CLAUSE_LINEAR_NO_COPYIN (c2) = 1;
8965 OMP_CLAUSE_LINEAR_NO_COPYOUT (c2) = 1;
8966 OMP_CLAUSE_DECL (c2) = var;
8967 OMP_CLAUSE_CHAIN (c2) = OMP_FOR_CLAUSES (for_stmt);
8968 OMP_FOR_CLAUSES (for_stmt) = c2;
8969 omp_add_variable (gimplify_omp_ctxp, var,
8970 GOVD_LINEAR | GOVD_EXPLICIT | GOVD_SEEN);
8971 if (c == NULL_TREE)
8973 c = c2;
8974 c2 = NULL_TREE;
8977 else
8978 omp_add_variable (gimplify_omp_ctxp, var,
8979 GOVD_PRIVATE | GOVD_SEEN);
8981 else
8982 var = decl;
8984 tret = gimplify_expr (&TREE_OPERAND (t, 1), &for_pre_body, NULL,
8985 is_gimple_val, fb_rvalue);
8986 ret = MIN (ret, tret);
8987 if (ret == GS_ERROR)
8988 return ret;
8990 /* Handle OMP_FOR_COND. */
8991 t = TREE_VEC_ELT (OMP_FOR_COND (for_stmt), i);
8992 gcc_assert (COMPARISON_CLASS_P (t));
8993 gcc_assert (TREE_OPERAND (t, 0) == decl);
8995 tret = gimplify_expr (&TREE_OPERAND (t, 1), &for_pre_body, NULL,
8996 is_gimple_val, fb_rvalue);
8997 ret = MIN (ret, tret);
8999 /* Handle OMP_FOR_INCR. */
9000 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
9001 switch (TREE_CODE (t))
9003 case PREINCREMENT_EXPR:
9004 case POSTINCREMENT_EXPR:
9006 tree decl = TREE_OPERAND (t, 0);
9007 /* c_omp_for_incr_canonicalize_ptr() should have been
9008 called to massage things appropriately. */
9009 gcc_assert (!POINTER_TYPE_P (TREE_TYPE (decl)));
9011 if (orig_for_stmt != for_stmt)
9012 break;
9013 t = build_int_cst (TREE_TYPE (decl), 1);
9014 if (c)
9015 OMP_CLAUSE_LINEAR_STEP (c) = t;
9016 t = build2 (PLUS_EXPR, TREE_TYPE (decl), var, t);
9017 t = build2 (MODIFY_EXPR, TREE_TYPE (var), var, t);
9018 TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i) = t;
9019 break;
9022 case PREDECREMENT_EXPR:
9023 case POSTDECREMENT_EXPR:
9024 /* c_omp_for_incr_canonicalize_ptr() should have been
9025 called to massage things appropriately. */
9026 gcc_assert (!POINTER_TYPE_P (TREE_TYPE (decl)));
9027 if (orig_for_stmt != for_stmt)
9028 break;
9029 t = build_int_cst (TREE_TYPE (decl), -1);
9030 if (c)
9031 OMP_CLAUSE_LINEAR_STEP (c) = t;
9032 t = build2 (PLUS_EXPR, TREE_TYPE (decl), var, t);
9033 t = build2 (MODIFY_EXPR, TREE_TYPE (var), var, t);
9034 TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i) = t;
9035 break;
9037 case MODIFY_EXPR:
9038 gcc_assert (TREE_OPERAND (t, 0) == decl);
9039 TREE_OPERAND (t, 0) = var;
9041 t = TREE_OPERAND (t, 1);
9042 switch (TREE_CODE (t))
9044 case PLUS_EXPR:
9045 if (TREE_OPERAND (t, 1) == decl)
9047 TREE_OPERAND (t, 1) = TREE_OPERAND (t, 0);
9048 TREE_OPERAND (t, 0) = var;
9049 break;
9052 /* Fallthru. */
9053 case MINUS_EXPR:
9054 case POINTER_PLUS_EXPR:
9055 gcc_assert (TREE_OPERAND (t, 0) == decl);
9056 TREE_OPERAND (t, 0) = var;
9057 break;
9058 default:
9059 gcc_unreachable ();
9062 tret = gimplify_expr (&TREE_OPERAND (t, 1), &for_pre_body, NULL,
9063 is_gimple_val, fb_rvalue);
9064 ret = MIN (ret, tret);
9065 if (c)
9067 tree step = TREE_OPERAND (t, 1);
9068 tree stept = TREE_TYPE (decl);
9069 if (POINTER_TYPE_P (stept))
9070 stept = sizetype;
9071 step = fold_convert (stept, step);
9072 if (TREE_CODE (t) == MINUS_EXPR)
9073 step = fold_build1 (NEGATE_EXPR, stept, step);
9074 OMP_CLAUSE_LINEAR_STEP (c) = step;
9075 if (step != TREE_OPERAND (t, 1))
9077 tret = gimplify_expr (&OMP_CLAUSE_LINEAR_STEP (c),
9078 &for_pre_body, NULL,
9079 is_gimple_val, fb_rvalue);
9080 ret = MIN (ret, tret);
9083 break;
9085 default:
9086 gcc_unreachable ();
9089 if (c2)
9091 gcc_assert (c);
9092 OMP_CLAUSE_LINEAR_STEP (c2) = OMP_CLAUSE_LINEAR_STEP (c);
9095 if ((var != decl || collapse > 1) && orig_for_stmt == for_stmt)
9097 for (c = OMP_FOR_CLAUSES (for_stmt); c ; c = OMP_CLAUSE_CHAIN (c))
9098 if (((OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE
9099 && OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c) == NULL)
9100 || (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LINEAR
9101 && !OMP_CLAUSE_LINEAR_NO_COPYOUT (c)
9102 && OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c) == NULL))
9103 && OMP_CLAUSE_DECL (c) == decl)
9105 if (is_doacross && (collapse == 1 || i >= collapse))
9106 t = var;
9107 else
9109 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
9110 gcc_assert (TREE_CODE (t) == MODIFY_EXPR);
9111 gcc_assert (TREE_OPERAND (t, 0) == var);
9112 t = TREE_OPERAND (t, 1);
9113 gcc_assert (TREE_CODE (t) == PLUS_EXPR
9114 || TREE_CODE (t) == MINUS_EXPR
9115 || TREE_CODE (t) == POINTER_PLUS_EXPR);
9116 gcc_assert (TREE_OPERAND (t, 0) == var);
9117 t = build2 (TREE_CODE (t), TREE_TYPE (decl),
9118 is_doacross ? var : decl,
9119 TREE_OPERAND (t, 1));
9121 gimple_seq *seq;
9122 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_LASTPRIVATE)
9123 seq = &OMP_CLAUSE_LASTPRIVATE_GIMPLE_SEQ (c);
9124 else
9125 seq = &OMP_CLAUSE_LINEAR_GIMPLE_SEQ (c);
9126 gimplify_assign (decl, t, seq);
9131 BITMAP_FREE (has_decl_expr);
9133 if (TREE_CODE (orig_for_stmt) == OMP_TASKLOOP)
9135 push_gimplify_context ();
9136 if (TREE_CODE (OMP_FOR_BODY (orig_for_stmt)) != BIND_EXPR)
9138 OMP_FOR_BODY (orig_for_stmt)
9139 = build3 (BIND_EXPR, void_type_node, NULL,
9140 OMP_FOR_BODY (orig_for_stmt), NULL);
9141 TREE_SIDE_EFFECTS (OMP_FOR_BODY (orig_for_stmt)) = 1;
9145 gimple *g = gimplify_and_return_first (OMP_FOR_BODY (orig_for_stmt),
9146 &for_body);
9148 if (TREE_CODE (orig_for_stmt) == OMP_TASKLOOP)
9150 if (gimple_code (g) == GIMPLE_BIND)
9151 pop_gimplify_context (g);
9152 else
9153 pop_gimplify_context (NULL);
9156 if (orig_for_stmt != for_stmt)
9157 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
9159 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
9160 decl = TREE_OPERAND (t, 0);
9161 struct gimplify_omp_ctx *ctx = gimplify_omp_ctxp;
9162 if (TREE_CODE (orig_for_stmt) == OMP_TASKLOOP)
9163 gimplify_omp_ctxp = ctx->outer_context;
9164 var = create_tmp_var (TREE_TYPE (decl), get_name (decl));
9165 gimplify_omp_ctxp = ctx;
9166 omp_add_variable (gimplify_omp_ctxp, var, GOVD_PRIVATE | GOVD_SEEN);
9167 TREE_OPERAND (t, 0) = var;
9168 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
9169 TREE_OPERAND (t, 1) = copy_node (TREE_OPERAND (t, 1));
9170 TREE_OPERAND (TREE_OPERAND (t, 1), 0) = var;
9173 gimplify_adjust_omp_clauses (pre_p, for_body,
9174 &OMP_FOR_CLAUSES (orig_for_stmt),
9175 TREE_CODE (orig_for_stmt));
9177 int kind;
9178 switch (TREE_CODE (orig_for_stmt))
9180 case OMP_FOR: kind = GF_OMP_FOR_KIND_FOR; break;
9181 case OMP_SIMD: kind = GF_OMP_FOR_KIND_SIMD; break;
9182 case CILK_SIMD: kind = GF_OMP_FOR_KIND_CILKSIMD; break;
9183 case CILK_FOR: kind = GF_OMP_FOR_KIND_CILKFOR; break;
9184 case OMP_DISTRIBUTE: kind = GF_OMP_FOR_KIND_DISTRIBUTE; break;
9185 case OMP_TASKLOOP: kind = GF_OMP_FOR_KIND_TASKLOOP; break;
9186 case OACC_LOOP: kind = GF_OMP_FOR_KIND_OACC_LOOP; break;
9187 default:
9188 gcc_unreachable ();
9190 gfor = gimple_build_omp_for (for_body, kind, OMP_FOR_CLAUSES (orig_for_stmt),
9191 TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)),
9192 for_pre_body);
9193 if (orig_for_stmt != for_stmt)
9194 gimple_omp_for_set_combined_p (gfor, true);
9195 if (gimplify_omp_ctxp
9196 && (gimplify_omp_ctxp->combined_loop
9197 || (gimplify_omp_ctxp->region_type == ORT_COMBINED_PARALLEL
9198 && gimplify_omp_ctxp->outer_context
9199 && gimplify_omp_ctxp->outer_context->combined_loop)))
9201 gimple_omp_for_set_combined_into_p (gfor, true);
9202 if (gimplify_omp_ctxp->combined_loop)
9203 gcc_assert (TREE_CODE (orig_for_stmt) == OMP_SIMD);
9204 else
9205 gcc_assert (TREE_CODE (orig_for_stmt) == OMP_FOR);
9208 for (i = 0; i < TREE_VEC_LENGTH (OMP_FOR_INIT (for_stmt)); i++)
9210 t = TREE_VEC_ELT (OMP_FOR_INIT (for_stmt), i);
9211 gimple_omp_for_set_index (gfor, i, TREE_OPERAND (t, 0));
9212 gimple_omp_for_set_initial (gfor, i, TREE_OPERAND (t, 1));
9213 t = TREE_VEC_ELT (OMP_FOR_COND (for_stmt), i);
9214 gimple_omp_for_set_cond (gfor, i, TREE_CODE (t));
9215 gimple_omp_for_set_final (gfor, i, TREE_OPERAND (t, 1));
9216 t = TREE_VEC_ELT (OMP_FOR_INCR (for_stmt), i);
9217 gimple_omp_for_set_incr (gfor, i, TREE_OPERAND (t, 1));
9220 /* OMP_TASKLOOP is gimplified as two GIMPLE_OMP_FOR taskloop
9221 constructs with GIMPLE_OMP_TASK sandwiched in between them.
9222 The outer taskloop stands for computing the number of iterations,
9223 counts for collapsed loops and holding taskloop specific clauses.
9224 The task construct stands for the effect of data sharing on the
9225 explicit task it creates and the inner taskloop stands for expansion
9226 of the static loop inside of the explicit task construct. */
9227 if (TREE_CODE (orig_for_stmt) == OMP_TASKLOOP)
9229 tree *gfor_clauses_ptr = gimple_omp_for_clauses_ptr (gfor);
9230 tree task_clauses = NULL_TREE;
9231 tree c = *gfor_clauses_ptr;
9232 tree *gtask_clauses_ptr = &task_clauses;
9233 tree outer_for_clauses = NULL_TREE;
9234 tree *gforo_clauses_ptr = &outer_for_clauses;
9235 for (; c; c = OMP_CLAUSE_CHAIN (c))
9236 switch (OMP_CLAUSE_CODE (c))
9238 /* These clauses are allowed on task, move them there. */
9239 case OMP_CLAUSE_SHARED:
9240 case OMP_CLAUSE_FIRSTPRIVATE:
9241 case OMP_CLAUSE_DEFAULT:
9242 case OMP_CLAUSE_IF:
9243 case OMP_CLAUSE_UNTIED:
9244 case OMP_CLAUSE_FINAL:
9245 case OMP_CLAUSE_MERGEABLE:
9246 case OMP_CLAUSE_PRIORITY:
9247 *gtask_clauses_ptr = c;
9248 gtask_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9249 break;
9250 case OMP_CLAUSE_PRIVATE:
9251 if (OMP_CLAUSE_PRIVATE_TASKLOOP_IV (c))
9253 /* We want private on outer for and firstprivate
9254 on task. */
9255 *gtask_clauses_ptr
9256 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
9257 OMP_CLAUSE_FIRSTPRIVATE);
9258 OMP_CLAUSE_DECL (*gtask_clauses_ptr) = OMP_CLAUSE_DECL (c);
9259 lang_hooks.decls.omp_finish_clause (*gtask_clauses_ptr, NULL);
9260 gtask_clauses_ptr = &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr);
9261 *gforo_clauses_ptr = c;
9262 gforo_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9264 else
9266 *gtask_clauses_ptr = c;
9267 gtask_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9269 break;
9270 /* These clauses go into outer taskloop clauses. */
9271 case OMP_CLAUSE_GRAINSIZE:
9272 case OMP_CLAUSE_NUM_TASKS:
9273 case OMP_CLAUSE_NOGROUP:
9274 *gforo_clauses_ptr = c;
9275 gforo_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9276 break;
9277 /* Taskloop clause we duplicate on both taskloops. */
9278 case OMP_CLAUSE_COLLAPSE:
9279 *gfor_clauses_ptr = c;
9280 gfor_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9281 *gforo_clauses_ptr = copy_node (c);
9282 gforo_clauses_ptr = &OMP_CLAUSE_CHAIN (*gforo_clauses_ptr);
9283 break;
9284 /* For lastprivate, keep the clause on inner taskloop, and add
9285 a shared clause on task. If the same decl is also firstprivate,
9286 add also firstprivate clause on the inner taskloop. */
9287 case OMP_CLAUSE_LASTPRIVATE:
9288 if (OMP_CLAUSE_LASTPRIVATE_TASKLOOP_IV (c))
9290 /* For taskloop C++ lastprivate IVs, we want:
9291 1) private on outer taskloop
9292 2) firstprivate and shared on task
9293 3) lastprivate on inner taskloop */
9294 *gtask_clauses_ptr
9295 = build_omp_clause (OMP_CLAUSE_LOCATION (c),
9296 OMP_CLAUSE_FIRSTPRIVATE);
9297 OMP_CLAUSE_DECL (*gtask_clauses_ptr) = OMP_CLAUSE_DECL (c);
9298 lang_hooks.decls.omp_finish_clause (*gtask_clauses_ptr, NULL);
9299 gtask_clauses_ptr = &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr);
9300 OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c) = 1;
9301 *gforo_clauses_ptr = build_omp_clause (OMP_CLAUSE_LOCATION (c),
9302 OMP_CLAUSE_PRIVATE);
9303 OMP_CLAUSE_DECL (*gforo_clauses_ptr) = OMP_CLAUSE_DECL (c);
9304 OMP_CLAUSE_PRIVATE_TASKLOOP_IV (*gforo_clauses_ptr) = 1;
9305 TREE_TYPE (*gforo_clauses_ptr) = TREE_TYPE (c);
9306 gforo_clauses_ptr = &OMP_CLAUSE_CHAIN (*gforo_clauses_ptr);
9308 *gfor_clauses_ptr = c;
9309 gfor_clauses_ptr = &OMP_CLAUSE_CHAIN (c);
9310 *gtask_clauses_ptr
9311 = build_omp_clause (OMP_CLAUSE_LOCATION (c), OMP_CLAUSE_SHARED);
9312 OMP_CLAUSE_DECL (*gtask_clauses_ptr) = OMP_CLAUSE_DECL (c);
9313 if (OMP_CLAUSE_LASTPRIVATE_FIRSTPRIVATE (c))
9314 OMP_CLAUSE_SHARED_FIRSTPRIVATE (*gtask_clauses_ptr) = 1;
9315 gtask_clauses_ptr
9316 = &OMP_CLAUSE_CHAIN (*gtask_clauses_ptr);
9317 break;
9318 default:
9319 gcc_unreachable ();
9321 *gfor_clauses_ptr = NULL_TREE;
9322 *gtask_clauses_ptr = NULL_TREE;
9323 *gforo_clauses_ptr = NULL_TREE;
9324 g = gimple_build_bind (NULL_TREE, gfor, NULL_TREE);
9325 g = gimple_build_omp_task (g, task_clauses, NULL_TREE, NULL_TREE,
9326 NULL_TREE, NULL_TREE, NULL_TREE);
9327 gimple_omp_task_set_taskloop_p (g, true);
9328 g = gimple_build_bind (NULL_TREE, g, NULL_TREE);
9329 gomp_for *gforo
9330 = gimple_build_omp_for (g, GF_OMP_FOR_KIND_TASKLOOP, outer_for_clauses,
9331 gimple_omp_for_collapse (gfor),
9332 gimple_omp_for_pre_body (gfor));
9333 gimple_omp_for_set_pre_body (gfor, NULL);
9334 gimple_omp_for_set_combined_p (gforo, true);
9335 gimple_omp_for_set_combined_into_p (gfor, true);
9336 for (i = 0; i < (int) gimple_omp_for_collapse (gfor); i++)
9338 t = unshare_expr (gimple_omp_for_index (gfor, i));
9339 gimple_omp_for_set_index (gforo, i, t);
9340 t = unshare_expr (gimple_omp_for_initial (gfor, i));
9341 gimple_omp_for_set_initial (gforo, i, t);
9342 gimple_omp_for_set_cond (gforo, i,
9343 gimple_omp_for_cond (gfor, i));
9344 t = unshare_expr (gimple_omp_for_final (gfor, i));
9345 gimple_omp_for_set_final (gforo, i, t);
9346 t = unshare_expr (gimple_omp_for_incr (gfor, i));
9347 gimple_omp_for_set_incr (gforo, i, t);
9349 gimplify_seq_add_stmt (pre_p, gforo);
9351 else
9352 gimplify_seq_add_stmt (pre_p, gfor);
9353 if (ret != GS_ALL_DONE)
9354 return GS_ERROR;
9355 *expr_p = NULL_TREE;
9356 return GS_ALL_DONE;
9359 /* Helper function of optimize_target_teams, find OMP_TEAMS inside
9360 of OMP_TARGET's body. */
9362 static tree
9363 find_omp_teams (tree *tp, int *walk_subtrees, void *)
9365 *walk_subtrees = 0;
9366 switch (TREE_CODE (*tp))
9368 case OMP_TEAMS:
9369 return *tp;
9370 case BIND_EXPR:
9371 case STATEMENT_LIST:
9372 *walk_subtrees = 1;
9373 break;
9374 default:
9375 break;
9377 return NULL_TREE;
9380 /* Helper function of optimize_target_teams, determine if the expression
9381 can be computed safely before the target construct on the host. */
9383 static tree
9384 computable_teams_clause (tree *tp, int *walk_subtrees, void *)
9386 splay_tree_node n;
9388 if (TYPE_P (*tp))
9390 *walk_subtrees = 0;
9391 return NULL_TREE;
9393 switch (TREE_CODE (*tp))
9395 case VAR_DECL:
9396 case PARM_DECL:
9397 case RESULT_DECL:
9398 *walk_subtrees = 0;
9399 if (error_operand_p (*tp)
9400 || !INTEGRAL_TYPE_P (TREE_TYPE (*tp))
9401 || DECL_HAS_VALUE_EXPR_P (*tp)
9402 || DECL_THREAD_LOCAL_P (*tp)
9403 || TREE_SIDE_EFFECTS (*tp)
9404 || TREE_THIS_VOLATILE (*tp))
9405 return *tp;
9406 if (is_global_var (*tp)
9407 && (lookup_attribute ("omp declare target", DECL_ATTRIBUTES (*tp))
9408 || lookup_attribute ("omp declare target link",
9409 DECL_ATTRIBUTES (*tp))))
9410 return *tp;
9411 n = splay_tree_lookup (gimplify_omp_ctxp->variables,
9412 (splay_tree_key) *tp);
9413 if (n == NULL)
9415 if (gimplify_omp_ctxp->target_map_scalars_firstprivate)
9416 return NULL_TREE;
9417 return *tp;
9419 else if (n->value & GOVD_LOCAL)
9420 return *tp;
9421 else if (n->value & GOVD_FIRSTPRIVATE)
9422 return NULL_TREE;
9423 else if ((n->value & (GOVD_MAP | GOVD_MAP_ALWAYS_TO))
9424 == (GOVD_MAP | GOVD_MAP_ALWAYS_TO))
9425 return NULL_TREE;
9426 return *tp;
9427 case INTEGER_CST:
9428 if (!INTEGRAL_TYPE_P (TREE_TYPE (*tp)))
9429 return *tp;
9430 return NULL_TREE;
9431 case TARGET_EXPR:
9432 if (TARGET_EXPR_INITIAL (*tp)
9433 || TREE_CODE (TARGET_EXPR_SLOT (*tp)) != VAR_DECL)
9434 return *tp;
9435 return computable_teams_clause (&TARGET_EXPR_SLOT (*tp),
9436 walk_subtrees, NULL);
9437 /* Allow some reasonable subset of integral arithmetics. */
9438 case PLUS_EXPR:
9439 case MINUS_EXPR:
9440 case MULT_EXPR:
9441 case TRUNC_DIV_EXPR:
9442 case CEIL_DIV_EXPR:
9443 case FLOOR_DIV_EXPR:
9444 case ROUND_DIV_EXPR:
9445 case TRUNC_MOD_EXPR:
9446 case CEIL_MOD_EXPR:
9447 case FLOOR_MOD_EXPR:
9448 case ROUND_MOD_EXPR:
9449 case RDIV_EXPR:
9450 case EXACT_DIV_EXPR:
9451 case MIN_EXPR:
9452 case MAX_EXPR:
9453 case LSHIFT_EXPR:
9454 case RSHIFT_EXPR:
9455 case BIT_IOR_EXPR:
9456 case BIT_XOR_EXPR:
9457 case BIT_AND_EXPR:
9458 case NEGATE_EXPR:
9459 case ABS_EXPR:
9460 case BIT_NOT_EXPR:
9461 case NON_LVALUE_EXPR:
9462 CASE_CONVERT:
9463 if (!INTEGRAL_TYPE_P (TREE_TYPE (*tp)))
9464 return *tp;
9465 return NULL_TREE;
9466 /* And disallow anything else, except for comparisons. */
9467 default:
9468 if (COMPARISON_CLASS_P (*tp))
9469 return NULL_TREE;
9470 return *tp;
9474 /* Try to determine if the num_teams and/or thread_limit expressions
9475 can have their values determined already before entering the
9476 target construct.
9477 INTEGER_CSTs trivially are,
9478 integral decls that are firstprivate (explicitly or implicitly)
9479 or explicitly map(always, to:) or map(always, tofrom:) on the target
9480 region too, and expressions involving simple arithmetics on those
9481 too, function calls are not ok, dereferencing something neither etc.
9482 Add NUM_TEAMS and THREAD_LIMIT clauses to the OMP_CLAUSES of
9483 EXPR based on what we find:
9484 0 stands for clause not specified at all, use implementation default
9485 -1 stands for value that can't be determined easily before entering
9486 the target construct.
9487 If teams construct is not present at all, use 1 for num_teams
9488 and 0 for thread_limit (only one team is involved, and the thread
9489 limit is implementation defined. */
9491 static void
9492 optimize_target_teams (tree target, gimple_seq *pre_p)
9494 tree body = OMP_BODY (target);
9495 tree teams = walk_tree (&body, find_omp_teams, NULL, NULL);
9496 tree num_teams = integer_zero_node;
9497 tree thread_limit = integer_zero_node;
9498 location_t num_teams_loc = EXPR_LOCATION (target);
9499 location_t thread_limit_loc = EXPR_LOCATION (target);
9500 tree c, *p, expr;
9501 struct gimplify_omp_ctx *target_ctx = gimplify_omp_ctxp;
9503 if (teams == NULL_TREE)
9504 num_teams = integer_one_node;
9505 else
9506 for (c = OMP_TEAMS_CLAUSES (teams); c; c = OMP_CLAUSE_CHAIN (c))
9508 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_NUM_TEAMS)
9510 p = &num_teams;
9511 num_teams_loc = OMP_CLAUSE_LOCATION (c);
9513 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_THREAD_LIMIT)
9515 p = &thread_limit;
9516 thread_limit_loc = OMP_CLAUSE_LOCATION (c);
9518 else
9519 continue;
9520 expr = OMP_CLAUSE_OPERAND (c, 0);
9521 if (TREE_CODE (expr) == INTEGER_CST)
9523 *p = expr;
9524 continue;
9526 if (walk_tree (&expr, computable_teams_clause, NULL, NULL))
9528 *p = integer_minus_one_node;
9529 continue;
9531 *p = expr;
9532 gimplify_omp_ctxp = gimplify_omp_ctxp->outer_context;
9533 if (gimplify_expr (p, pre_p, NULL, is_gimple_val, fb_rvalue)
9534 == GS_ERROR)
9536 gimplify_omp_ctxp = target_ctx;
9537 *p = integer_minus_one_node;
9538 continue;
9540 gimplify_omp_ctxp = target_ctx;
9541 if (!DECL_P (expr) && TREE_CODE (expr) != TARGET_EXPR)
9542 OMP_CLAUSE_OPERAND (c, 0) = *p;
9544 c = build_omp_clause (thread_limit_loc, OMP_CLAUSE_THREAD_LIMIT);
9545 OMP_CLAUSE_THREAD_LIMIT_EXPR (c) = thread_limit;
9546 OMP_CLAUSE_CHAIN (c) = OMP_TARGET_CLAUSES (target);
9547 OMP_TARGET_CLAUSES (target) = c;
9548 c = build_omp_clause (num_teams_loc, OMP_CLAUSE_NUM_TEAMS);
9549 OMP_CLAUSE_NUM_TEAMS_EXPR (c) = num_teams;
9550 OMP_CLAUSE_CHAIN (c) = OMP_TARGET_CLAUSES (target);
9551 OMP_TARGET_CLAUSES (target) = c;
9554 /* Gimplify the gross structure of several OMP constructs. */
9556 static void
9557 gimplify_omp_workshare (tree *expr_p, gimple_seq *pre_p)
9559 tree expr = *expr_p;
9560 gimple *stmt;
9561 gimple_seq body = NULL;
9562 enum omp_region_type ort;
9564 switch (TREE_CODE (expr))
9566 case OMP_SECTIONS:
9567 case OMP_SINGLE:
9568 ort = ORT_WORKSHARE;
9569 break;
9570 case OMP_TARGET:
9571 ort = OMP_TARGET_COMBINED (expr) ? ORT_COMBINED_TARGET : ORT_TARGET;
9572 break;
9573 case OACC_KERNELS:
9574 ort = ORT_ACC_KERNELS;
9575 break;
9576 case OACC_PARALLEL:
9577 ort = ORT_ACC_PARALLEL;
9578 break;
9579 case OACC_DATA:
9580 ort = ORT_ACC_DATA;
9581 break;
9582 case OMP_TARGET_DATA:
9583 ort = ORT_TARGET_DATA;
9584 break;
9585 case OMP_TEAMS:
9586 ort = OMP_TEAMS_COMBINED (expr) ? ORT_COMBINED_TEAMS : ORT_TEAMS;
9587 break;
9588 case OACC_HOST_DATA:
9589 ort = ORT_ACC_HOST_DATA;
9590 break;
9591 default:
9592 gcc_unreachable ();
9594 gimplify_scan_omp_clauses (&OMP_CLAUSES (expr), pre_p, ort,
9595 TREE_CODE (expr));
9596 if (TREE_CODE (expr) == OMP_TARGET)
9597 optimize_target_teams (expr, pre_p);
9598 if ((ort & (ORT_TARGET | ORT_TARGET_DATA)) != 0)
9600 push_gimplify_context ();
9601 gimple *g = gimplify_and_return_first (OMP_BODY (expr), &body);
9602 if (gimple_code (g) == GIMPLE_BIND)
9603 pop_gimplify_context (g);
9604 else
9605 pop_gimplify_context (NULL);
9606 if ((ort & ORT_TARGET_DATA) != 0)
9608 enum built_in_function end_ix;
9609 switch (TREE_CODE (expr))
9611 case OACC_DATA:
9612 case OACC_HOST_DATA:
9613 end_ix = BUILT_IN_GOACC_DATA_END;
9614 break;
9615 case OMP_TARGET_DATA:
9616 end_ix = BUILT_IN_GOMP_TARGET_END_DATA;
9617 break;
9618 default:
9619 gcc_unreachable ();
9621 tree fn = builtin_decl_explicit (end_ix);
9622 g = gimple_build_call (fn, 0);
9623 gimple_seq cleanup = NULL;
9624 gimple_seq_add_stmt (&cleanup, g);
9625 g = gimple_build_try (body, cleanup, GIMPLE_TRY_FINALLY);
9626 body = NULL;
9627 gimple_seq_add_stmt (&body, g);
9630 else
9631 gimplify_and_add (OMP_BODY (expr), &body);
9632 gimplify_adjust_omp_clauses (pre_p, body, &OMP_CLAUSES (expr),
9633 TREE_CODE (expr));
9635 switch (TREE_CODE (expr))
9637 case OACC_DATA:
9638 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_DATA,
9639 OMP_CLAUSES (expr));
9640 break;
9641 case OACC_KERNELS:
9642 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_KERNELS,
9643 OMP_CLAUSES (expr));
9644 break;
9645 case OACC_HOST_DATA:
9646 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_HOST_DATA,
9647 OMP_CLAUSES (expr));
9648 break;
9649 case OACC_PARALLEL:
9650 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_OACC_PARALLEL,
9651 OMP_CLAUSES (expr));
9652 break;
9653 case OMP_SECTIONS:
9654 stmt = gimple_build_omp_sections (body, OMP_CLAUSES (expr));
9655 break;
9656 case OMP_SINGLE:
9657 stmt = gimple_build_omp_single (body, OMP_CLAUSES (expr));
9658 break;
9659 case OMP_TARGET:
9660 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_REGION,
9661 OMP_CLAUSES (expr));
9662 break;
9663 case OMP_TARGET_DATA:
9664 stmt = gimple_build_omp_target (body, GF_OMP_TARGET_KIND_DATA,
9665 OMP_CLAUSES (expr));
9666 break;
9667 case OMP_TEAMS:
9668 stmt = gimple_build_omp_teams (body, OMP_CLAUSES (expr));
9669 break;
9670 default:
9671 gcc_unreachable ();
9674 gimplify_seq_add_stmt (pre_p, stmt);
9675 *expr_p = NULL_TREE;
9678 /* Gimplify the gross structure of OpenACC enter/exit data, update, and OpenMP
9679 target update constructs. */
9681 static void
9682 gimplify_omp_target_update (tree *expr_p, gimple_seq *pre_p)
9684 tree expr = *expr_p;
9685 int kind;
9686 gomp_target *stmt;
9687 enum omp_region_type ort = ORT_WORKSHARE;
9689 switch (TREE_CODE (expr))
9691 case OACC_ENTER_DATA:
9692 case OACC_EXIT_DATA:
9693 kind = GF_OMP_TARGET_KIND_OACC_ENTER_EXIT_DATA;
9694 ort = ORT_ACC;
9695 break;
9696 case OACC_UPDATE:
9697 kind = GF_OMP_TARGET_KIND_OACC_UPDATE;
9698 ort = ORT_ACC;
9699 break;
9700 case OMP_TARGET_UPDATE:
9701 kind = GF_OMP_TARGET_KIND_UPDATE;
9702 break;
9703 case OMP_TARGET_ENTER_DATA:
9704 kind = GF_OMP_TARGET_KIND_ENTER_DATA;
9705 break;
9706 case OMP_TARGET_EXIT_DATA:
9707 kind = GF_OMP_TARGET_KIND_EXIT_DATA;
9708 break;
9709 default:
9710 gcc_unreachable ();
9712 gimplify_scan_omp_clauses (&OMP_STANDALONE_CLAUSES (expr), pre_p,
9713 ort, TREE_CODE (expr));
9714 gimplify_adjust_omp_clauses (pre_p, NULL, &OMP_STANDALONE_CLAUSES (expr),
9715 TREE_CODE (expr));
9716 stmt = gimple_build_omp_target (NULL, kind, OMP_STANDALONE_CLAUSES (expr));
9718 gimplify_seq_add_stmt (pre_p, stmt);
9719 *expr_p = NULL_TREE;
9722 /* A subroutine of gimplify_omp_atomic. The front end is supposed to have
9723 stabilized the lhs of the atomic operation as *ADDR. Return true if
9724 EXPR is this stabilized form. */
9726 static bool
9727 goa_lhs_expr_p (tree expr, tree addr)
9729 /* Also include casts to other type variants. The C front end is fond
9730 of adding these for e.g. volatile variables. This is like
9731 STRIP_TYPE_NOPS but includes the main variant lookup. */
9732 STRIP_USELESS_TYPE_CONVERSION (expr);
9734 if (TREE_CODE (expr) == INDIRECT_REF)
9736 expr = TREE_OPERAND (expr, 0);
9737 while (expr != addr
9738 && (CONVERT_EXPR_P (expr)
9739 || TREE_CODE (expr) == NON_LVALUE_EXPR)
9740 && TREE_CODE (expr) == TREE_CODE (addr)
9741 && types_compatible_p (TREE_TYPE (expr), TREE_TYPE (addr)))
9743 expr = TREE_OPERAND (expr, 0);
9744 addr = TREE_OPERAND (addr, 0);
9746 if (expr == addr)
9747 return true;
9748 return (TREE_CODE (addr) == ADDR_EXPR
9749 && TREE_CODE (expr) == ADDR_EXPR
9750 && TREE_OPERAND (addr, 0) == TREE_OPERAND (expr, 0));
9752 if (TREE_CODE (addr) == ADDR_EXPR && expr == TREE_OPERAND (addr, 0))
9753 return true;
9754 return false;
9757 /* Walk *EXPR_P and replace appearances of *LHS_ADDR with LHS_VAR. If an
9758 expression does not involve the lhs, evaluate it into a temporary.
9759 Return 1 if the lhs appeared as a subexpression, 0 if it did not,
9760 or -1 if an error was encountered. */
9762 static int
9763 goa_stabilize_expr (tree *expr_p, gimple_seq *pre_p, tree lhs_addr,
9764 tree lhs_var)
9766 tree expr = *expr_p;
9767 int saw_lhs;
9769 if (goa_lhs_expr_p (expr, lhs_addr))
9771 *expr_p = lhs_var;
9772 return 1;
9774 if (is_gimple_val (expr))
9775 return 0;
9777 saw_lhs = 0;
9778 switch (TREE_CODE_CLASS (TREE_CODE (expr)))
9780 case tcc_binary:
9781 case tcc_comparison:
9782 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 1), pre_p, lhs_addr,
9783 lhs_var);
9784 case tcc_unary:
9785 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 0), pre_p, lhs_addr,
9786 lhs_var);
9787 break;
9788 case tcc_expression:
9789 switch (TREE_CODE (expr))
9791 case TRUTH_ANDIF_EXPR:
9792 case TRUTH_ORIF_EXPR:
9793 case TRUTH_AND_EXPR:
9794 case TRUTH_OR_EXPR:
9795 case TRUTH_XOR_EXPR:
9796 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 1), pre_p,
9797 lhs_addr, lhs_var);
9798 case TRUTH_NOT_EXPR:
9799 saw_lhs |= goa_stabilize_expr (&TREE_OPERAND (expr, 0), pre_p,
9800 lhs_addr, lhs_var);
9801 break;
9802 case COMPOUND_EXPR:
9803 /* Break out any preevaluations from cp_build_modify_expr. */
9804 for (; TREE_CODE (expr) == COMPOUND_EXPR;
9805 expr = TREE_OPERAND (expr, 1))
9806 gimplify_stmt (&TREE_OPERAND (expr, 0), pre_p);
9807 *expr_p = expr;
9808 return goa_stabilize_expr (expr_p, pre_p, lhs_addr, lhs_var);
9809 default:
9810 break;
9812 break;
9813 default:
9814 break;
9817 if (saw_lhs == 0)
9819 enum gimplify_status gs;
9820 gs = gimplify_expr (expr_p, pre_p, NULL, is_gimple_val, fb_rvalue);
9821 if (gs != GS_ALL_DONE)
9822 saw_lhs = -1;
9825 return saw_lhs;
9828 /* Gimplify an OMP_ATOMIC statement. */
9830 static enum gimplify_status
9831 gimplify_omp_atomic (tree *expr_p, gimple_seq *pre_p)
9833 tree addr = TREE_OPERAND (*expr_p, 0);
9834 tree rhs = TREE_CODE (*expr_p) == OMP_ATOMIC_READ
9835 ? NULL : TREE_OPERAND (*expr_p, 1);
9836 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (addr)));
9837 tree tmp_load;
9838 gomp_atomic_load *loadstmt;
9839 gomp_atomic_store *storestmt;
9841 tmp_load = create_tmp_reg (type);
9842 if (rhs && goa_stabilize_expr (&rhs, pre_p, addr, tmp_load) < 0)
9843 return GS_ERROR;
9845 if (gimplify_expr (&addr, pre_p, NULL, is_gimple_val, fb_rvalue)
9846 != GS_ALL_DONE)
9847 return GS_ERROR;
9849 loadstmt = gimple_build_omp_atomic_load (tmp_load, addr);
9850 gimplify_seq_add_stmt (pre_p, loadstmt);
9851 if (rhs && gimplify_expr (&rhs, pre_p, NULL, is_gimple_val, fb_rvalue)
9852 != GS_ALL_DONE)
9853 return GS_ERROR;
9855 if (TREE_CODE (*expr_p) == OMP_ATOMIC_READ)
9856 rhs = tmp_load;
9857 storestmt = gimple_build_omp_atomic_store (rhs);
9858 gimplify_seq_add_stmt (pre_p, storestmt);
9859 if (OMP_ATOMIC_SEQ_CST (*expr_p))
9861 gimple_omp_atomic_set_seq_cst (loadstmt);
9862 gimple_omp_atomic_set_seq_cst (storestmt);
9864 switch (TREE_CODE (*expr_p))
9866 case OMP_ATOMIC_READ:
9867 case OMP_ATOMIC_CAPTURE_OLD:
9868 *expr_p = tmp_load;
9869 gimple_omp_atomic_set_need_value (loadstmt);
9870 break;
9871 case OMP_ATOMIC_CAPTURE_NEW:
9872 *expr_p = rhs;
9873 gimple_omp_atomic_set_need_value (storestmt);
9874 break;
9875 default:
9876 *expr_p = NULL;
9877 break;
9880 return GS_ALL_DONE;
9883 /* Gimplify a TRANSACTION_EXPR. This involves gimplification of the
9884 body, and adding some EH bits. */
9886 static enum gimplify_status
9887 gimplify_transaction (tree *expr_p, gimple_seq *pre_p)
9889 tree expr = *expr_p, temp, tbody = TRANSACTION_EXPR_BODY (expr);
9890 gimple *body_stmt;
9891 gtransaction *trans_stmt;
9892 gimple_seq body = NULL;
9893 int subcode = 0;
9895 /* Wrap the transaction body in a BIND_EXPR so we have a context
9896 where to put decls for OMP. */
9897 if (TREE_CODE (tbody) != BIND_EXPR)
9899 tree bind = build3 (BIND_EXPR, void_type_node, NULL, tbody, NULL);
9900 TREE_SIDE_EFFECTS (bind) = 1;
9901 SET_EXPR_LOCATION (bind, EXPR_LOCATION (tbody));
9902 TRANSACTION_EXPR_BODY (expr) = bind;
9905 push_gimplify_context ();
9906 temp = voidify_wrapper_expr (*expr_p, NULL);
9908 body_stmt = gimplify_and_return_first (TRANSACTION_EXPR_BODY (expr), &body);
9909 pop_gimplify_context (body_stmt);
9911 trans_stmt = gimple_build_transaction (body);
9912 if (TRANSACTION_EXPR_OUTER (expr))
9913 subcode = GTMA_IS_OUTER;
9914 else if (TRANSACTION_EXPR_RELAXED (expr))
9915 subcode = GTMA_IS_RELAXED;
9916 gimple_transaction_set_subcode (trans_stmt, subcode);
9918 gimplify_seq_add_stmt (pre_p, trans_stmt);
9920 if (temp)
9922 *expr_p = temp;
9923 return GS_OK;
9926 *expr_p = NULL_TREE;
9927 return GS_ALL_DONE;
9930 /* Gimplify an OMP_ORDERED construct. EXPR is the tree version. BODY
9931 is the OMP_BODY of the original EXPR (which has already been
9932 gimplified so it's not present in the EXPR).
9934 Return the gimplified GIMPLE_OMP_ORDERED tuple. */
9936 static gimple *
9937 gimplify_omp_ordered (tree expr, gimple_seq body)
9939 tree c, decls;
9940 int failures = 0;
9941 unsigned int i;
9942 tree source_c = NULL_TREE;
9943 tree sink_c = NULL_TREE;
9945 if (gimplify_omp_ctxp)
9947 for (c = OMP_ORDERED_CLAUSES (expr); c; c = OMP_CLAUSE_CHAIN (c))
9948 if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_DEPEND
9949 && gimplify_omp_ctxp->loop_iter_var.is_empty ()
9950 && (OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SINK
9951 || OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SOURCE))
9953 error_at (OMP_CLAUSE_LOCATION (c),
9954 "%<ordered%> construct with %<depend%> clause must be "
9955 "closely nested inside a loop with %<ordered%> clause "
9956 "with a parameter");
9957 failures++;
9959 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_DEPEND
9960 && OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SINK)
9962 bool fail = false;
9963 for (decls = OMP_CLAUSE_DECL (c), i = 0;
9964 decls && TREE_CODE (decls) == TREE_LIST;
9965 decls = TREE_CHAIN (decls), ++i)
9966 if (i >= gimplify_omp_ctxp->loop_iter_var.length () / 2)
9967 continue;
9968 else if (TREE_VALUE (decls)
9969 != gimplify_omp_ctxp->loop_iter_var[2 * i])
9971 error_at (OMP_CLAUSE_LOCATION (c),
9972 "variable %qE is not an iteration "
9973 "of outermost loop %d, expected %qE",
9974 TREE_VALUE (decls), i + 1,
9975 gimplify_omp_ctxp->loop_iter_var[2 * i]);
9976 fail = true;
9977 failures++;
9979 else
9980 TREE_VALUE (decls)
9981 = gimplify_omp_ctxp->loop_iter_var[2 * i + 1];
9982 if (!fail && i != gimplify_omp_ctxp->loop_iter_var.length () / 2)
9984 error_at (OMP_CLAUSE_LOCATION (c),
9985 "number of variables in %<depend(sink)%> "
9986 "clause does not match number of "
9987 "iteration variables");
9988 failures++;
9990 sink_c = c;
9992 else if (OMP_CLAUSE_CODE (c) == OMP_CLAUSE_DEPEND
9993 && OMP_CLAUSE_DEPEND_KIND (c) == OMP_CLAUSE_DEPEND_SOURCE)
9995 if (source_c)
9997 error_at (OMP_CLAUSE_LOCATION (c),
9998 "more than one %<depend(source)%> clause on an "
9999 "%<ordered%> construct");
10000 failures++;
10002 else
10003 source_c = c;
10006 if (source_c && sink_c)
10008 error_at (OMP_CLAUSE_LOCATION (source_c),
10009 "%<depend(source)%> clause specified together with "
10010 "%<depend(sink:)%> clauses on the same construct");
10011 failures++;
10014 if (failures)
10015 return gimple_build_nop ();
10016 return gimple_build_omp_ordered (body, OMP_ORDERED_CLAUSES (expr));
10019 /* Convert the GENERIC expression tree *EXPR_P to GIMPLE. If the
10020 expression produces a value to be used as an operand inside a GIMPLE
10021 statement, the value will be stored back in *EXPR_P. This value will
10022 be a tree of class tcc_declaration, tcc_constant, tcc_reference or
10023 an SSA_NAME. The corresponding sequence of GIMPLE statements is
10024 emitted in PRE_P and POST_P.
10026 Additionally, this process may overwrite parts of the input
10027 expression during gimplification. Ideally, it should be
10028 possible to do non-destructive gimplification.
10030 EXPR_P points to the GENERIC expression to convert to GIMPLE. If
10031 the expression needs to evaluate to a value to be used as
10032 an operand in a GIMPLE statement, this value will be stored in
10033 *EXPR_P on exit. This happens when the caller specifies one
10034 of fb_lvalue or fb_rvalue fallback flags.
10036 PRE_P will contain the sequence of GIMPLE statements corresponding
10037 to the evaluation of EXPR and all the side-effects that must
10038 be executed before the main expression. On exit, the last
10039 statement of PRE_P is the core statement being gimplified. For
10040 instance, when gimplifying 'if (++a)' the last statement in
10041 PRE_P will be 'if (t.1)' where t.1 is the result of
10042 pre-incrementing 'a'.
10044 POST_P will contain the sequence of GIMPLE statements corresponding
10045 to the evaluation of all the side-effects that must be executed
10046 after the main expression. If this is NULL, the post
10047 side-effects are stored at the end of PRE_P.
10049 The reason why the output is split in two is to handle post
10050 side-effects explicitly. In some cases, an expression may have
10051 inner and outer post side-effects which need to be emitted in
10052 an order different from the one given by the recursive
10053 traversal. For instance, for the expression (*p--)++ the post
10054 side-effects of '--' must actually occur *after* the post
10055 side-effects of '++'. However, gimplification will first visit
10056 the inner expression, so if a separate POST sequence was not
10057 used, the resulting sequence would be:
10059 1 t.1 = *p
10060 2 p = p - 1
10061 3 t.2 = t.1 + 1
10062 4 *p = t.2
10064 However, the post-decrement operation in line #2 must not be
10065 evaluated until after the store to *p at line #4, so the
10066 correct sequence should be:
10068 1 t.1 = *p
10069 2 t.2 = t.1 + 1
10070 3 *p = t.2
10071 4 p = p - 1
10073 So, by specifying a separate post queue, it is possible
10074 to emit the post side-effects in the correct order.
10075 If POST_P is NULL, an internal queue will be used. Before
10076 returning to the caller, the sequence POST_P is appended to
10077 the main output sequence PRE_P.
10079 GIMPLE_TEST_F points to a function that takes a tree T and
10080 returns nonzero if T is in the GIMPLE form requested by the
10081 caller. The GIMPLE predicates are in gimple.c.
10083 FALLBACK tells the function what sort of a temporary we want if
10084 gimplification cannot produce an expression that complies with
10085 GIMPLE_TEST_F.
10087 fb_none means that no temporary should be generated
10088 fb_rvalue means that an rvalue is OK to generate
10089 fb_lvalue means that an lvalue is OK to generate
10090 fb_either means that either is OK, but an lvalue is preferable.
10091 fb_mayfail means that gimplification may fail (in which case
10092 GS_ERROR will be returned)
10094 The return value is either GS_ERROR or GS_ALL_DONE, since this
10095 function iterates until EXPR is completely gimplified or an error
10096 occurs. */
10098 enum gimplify_status
10099 gimplify_expr (tree *expr_p, gimple_seq *pre_p, gimple_seq *post_p,
10100 bool (*gimple_test_f) (tree), fallback_t fallback)
10102 tree tmp;
10103 gimple_seq internal_pre = NULL;
10104 gimple_seq internal_post = NULL;
10105 tree save_expr;
10106 bool is_statement;
10107 location_t saved_location;
10108 enum gimplify_status ret;
10109 gimple_stmt_iterator pre_last_gsi, post_last_gsi;
10111 save_expr = *expr_p;
10112 if (save_expr == NULL_TREE)
10113 return GS_ALL_DONE;
10115 /* If we are gimplifying a top-level statement, PRE_P must be valid. */
10116 is_statement = gimple_test_f == is_gimple_stmt;
10117 if (is_statement)
10118 gcc_assert (pre_p);
10120 /* Consistency checks. */
10121 if (gimple_test_f == is_gimple_reg)
10122 gcc_assert (fallback & (fb_rvalue | fb_lvalue));
10123 else if (gimple_test_f == is_gimple_val
10124 || gimple_test_f == is_gimple_call_addr
10125 || gimple_test_f == is_gimple_condexpr
10126 || gimple_test_f == is_gimple_mem_rhs
10127 || gimple_test_f == is_gimple_mem_rhs_or_call
10128 || gimple_test_f == is_gimple_reg_rhs
10129 || gimple_test_f == is_gimple_reg_rhs_or_call
10130 || gimple_test_f == is_gimple_asm_val
10131 || gimple_test_f == is_gimple_mem_ref_addr)
10132 gcc_assert (fallback & fb_rvalue);
10133 else if (gimple_test_f == is_gimple_min_lval
10134 || gimple_test_f == is_gimple_lvalue)
10135 gcc_assert (fallback & fb_lvalue);
10136 else if (gimple_test_f == is_gimple_addressable)
10137 gcc_assert (fallback & fb_either);
10138 else if (gimple_test_f == is_gimple_stmt)
10139 gcc_assert (fallback == fb_none);
10140 else
10142 /* We should have recognized the GIMPLE_TEST_F predicate to
10143 know what kind of fallback to use in case a temporary is
10144 needed to hold the value or address of *EXPR_P. */
10145 gcc_unreachable ();
10148 /* We used to check the predicate here and return immediately if it
10149 succeeds. This is wrong; the design is for gimplification to be
10150 idempotent, and for the predicates to only test for valid forms, not
10151 whether they are fully simplified. */
10152 if (pre_p == NULL)
10153 pre_p = &internal_pre;
10155 if (post_p == NULL)
10156 post_p = &internal_post;
10158 /* Remember the last statements added to PRE_P and POST_P. Every
10159 new statement added by the gimplification helpers needs to be
10160 annotated with location information. To centralize the
10161 responsibility, we remember the last statement that had been
10162 added to both queues before gimplifying *EXPR_P. If
10163 gimplification produces new statements in PRE_P and POST_P, those
10164 statements will be annotated with the same location information
10165 as *EXPR_P. */
10166 pre_last_gsi = gsi_last (*pre_p);
10167 post_last_gsi = gsi_last (*post_p);
10169 saved_location = input_location;
10170 if (save_expr != error_mark_node
10171 && EXPR_HAS_LOCATION (*expr_p))
10172 input_location = EXPR_LOCATION (*expr_p);
10174 /* Loop over the specific gimplifiers until the toplevel node
10175 remains the same. */
10178 /* Strip away as many useless type conversions as possible
10179 at the toplevel. */
10180 STRIP_USELESS_TYPE_CONVERSION (*expr_p);
10182 /* Remember the expr. */
10183 save_expr = *expr_p;
10185 /* Die, die, die, my darling. */
10186 if (save_expr == error_mark_node
10187 || (TREE_TYPE (save_expr)
10188 && TREE_TYPE (save_expr) == error_mark_node))
10190 ret = GS_ERROR;
10191 break;
10194 /* Do any language-specific gimplification. */
10195 ret = ((enum gimplify_status)
10196 lang_hooks.gimplify_expr (expr_p, pre_p, post_p));
10197 if (ret == GS_OK)
10199 if (*expr_p == NULL_TREE)
10200 break;
10201 if (*expr_p != save_expr)
10202 continue;
10204 else if (ret != GS_UNHANDLED)
10205 break;
10207 /* Make sure that all the cases set 'ret' appropriately. */
10208 ret = GS_UNHANDLED;
10209 switch (TREE_CODE (*expr_p))
10211 /* First deal with the special cases. */
10213 case POSTINCREMENT_EXPR:
10214 case POSTDECREMENT_EXPR:
10215 case PREINCREMENT_EXPR:
10216 case PREDECREMENT_EXPR:
10217 ret = gimplify_self_mod_expr (expr_p, pre_p, post_p,
10218 fallback != fb_none,
10219 TREE_TYPE (*expr_p));
10220 break;
10222 case VIEW_CONVERT_EXPR:
10223 if (is_gimple_reg_type (TREE_TYPE (*expr_p))
10224 && is_gimple_reg_type (TREE_TYPE (TREE_OPERAND (*expr_p, 0))))
10226 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
10227 post_p, is_gimple_val, fb_rvalue);
10228 recalculate_side_effects (*expr_p);
10229 break;
10231 /* Fallthru. */
10233 case ARRAY_REF:
10234 case ARRAY_RANGE_REF:
10235 case REALPART_EXPR:
10236 case IMAGPART_EXPR:
10237 case COMPONENT_REF:
10238 ret = gimplify_compound_lval (expr_p, pre_p, post_p,
10239 fallback ? fallback : fb_rvalue);
10240 break;
10242 case COND_EXPR:
10243 ret = gimplify_cond_expr (expr_p, pre_p, fallback);
10245 /* C99 code may assign to an array in a structure value of a
10246 conditional expression, and this has undefined behavior
10247 only on execution, so create a temporary if an lvalue is
10248 required. */
10249 if (fallback == fb_lvalue)
10251 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
10252 mark_addressable (*expr_p);
10253 ret = GS_OK;
10255 break;
10257 case CALL_EXPR:
10258 ret = gimplify_call_expr (expr_p, pre_p, fallback != fb_none);
10260 /* C99 code may assign to an array in a structure returned
10261 from a function, and this has undefined behavior only on
10262 execution, so create a temporary if an lvalue is
10263 required. */
10264 if (fallback == fb_lvalue)
10266 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
10267 mark_addressable (*expr_p);
10268 ret = GS_OK;
10270 break;
10272 case TREE_LIST:
10273 gcc_unreachable ();
10275 case COMPOUND_EXPR:
10276 ret = gimplify_compound_expr (expr_p, pre_p, fallback != fb_none);
10277 break;
10279 case COMPOUND_LITERAL_EXPR:
10280 ret = gimplify_compound_literal_expr (expr_p, pre_p,
10281 gimple_test_f, fallback);
10282 break;
10284 case MODIFY_EXPR:
10285 case INIT_EXPR:
10286 ret = gimplify_modify_expr (expr_p, pre_p, post_p,
10287 fallback != fb_none);
10288 break;
10290 case TRUTH_ANDIF_EXPR:
10291 case TRUTH_ORIF_EXPR:
10293 /* Preserve the original type of the expression and the
10294 source location of the outer expression. */
10295 tree org_type = TREE_TYPE (*expr_p);
10296 *expr_p = gimple_boolify (*expr_p);
10297 *expr_p = build3_loc (input_location, COND_EXPR,
10298 org_type, *expr_p,
10299 fold_convert_loc
10300 (input_location,
10301 org_type, boolean_true_node),
10302 fold_convert_loc
10303 (input_location,
10304 org_type, boolean_false_node));
10305 ret = GS_OK;
10306 break;
10309 case TRUTH_NOT_EXPR:
10311 tree type = TREE_TYPE (*expr_p);
10312 /* The parsers are careful to generate TRUTH_NOT_EXPR
10313 only with operands that are always zero or one.
10314 We do not fold here but handle the only interesting case
10315 manually, as fold may re-introduce the TRUTH_NOT_EXPR. */
10316 *expr_p = gimple_boolify (*expr_p);
10317 if (TYPE_PRECISION (TREE_TYPE (*expr_p)) == 1)
10318 *expr_p = build1_loc (input_location, BIT_NOT_EXPR,
10319 TREE_TYPE (*expr_p),
10320 TREE_OPERAND (*expr_p, 0));
10321 else
10322 *expr_p = build2_loc (input_location, BIT_XOR_EXPR,
10323 TREE_TYPE (*expr_p),
10324 TREE_OPERAND (*expr_p, 0),
10325 build_int_cst (TREE_TYPE (*expr_p), 1));
10326 if (!useless_type_conversion_p (type, TREE_TYPE (*expr_p)))
10327 *expr_p = fold_convert_loc (input_location, type, *expr_p);
10328 ret = GS_OK;
10329 break;
10332 case ADDR_EXPR:
10333 ret = gimplify_addr_expr (expr_p, pre_p, post_p);
10334 break;
10336 case ANNOTATE_EXPR:
10338 tree cond = TREE_OPERAND (*expr_p, 0);
10339 tree kind = TREE_OPERAND (*expr_p, 1);
10340 tree type = TREE_TYPE (cond);
10341 if (!INTEGRAL_TYPE_P (type))
10343 *expr_p = cond;
10344 ret = GS_OK;
10345 break;
10347 tree tmp = create_tmp_var (type);
10348 gimplify_arg (&cond, pre_p, EXPR_LOCATION (*expr_p));
10349 gcall *call
10350 = gimple_build_call_internal (IFN_ANNOTATE, 2, cond, kind);
10351 gimple_call_set_lhs (call, tmp);
10352 gimplify_seq_add_stmt (pre_p, call);
10353 *expr_p = tmp;
10354 ret = GS_ALL_DONE;
10355 break;
10358 case VA_ARG_EXPR:
10359 ret = gimplify_va_arg_expr (expr_p, pre_p, post_p);
10360 break;
10362 CASE_CONVERT:
10363 if (IS_EMPTY_STMT (*expr_p))
10365 ret = GS_ALL_DONE;
10366 break;
10369 if (VOID_TYPE_P (TREE_TYPE (*expr_p))
10370 || fallback == fb_none)
10372 /* Just strip a conversion to void (or in void context) and
10373 try again. */
10374 *expr_p = TREE_OPERAND (*expr_p, 0);
10375 ret = GS_OK;
10376 break;
10379 ret = gimplify_conversion (expr_p);
10380 if (ret == GS_ERROR)
10381 break;
10382 if (*expr_p != save_expr)
10383 break;
10384 /* FALLTHRU */
10386 case FIX_TRUNC_EXPR:
10387 /* unary_expr: ... | '(' cast ')' val | ... */
10388 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
10389 is_gimple_val, fb_rvalue);
10390 recalculate_side_effects (*expr_p);
10391 break;
10393 case INDIRECT_REF:
10395 bool volatilep = TREE_THIS_VOLATILE (*expr_p);
10396 bool notrap = TREE_THIS_NOTRAP (*expr_p);
10397 tree saved_ptr_type = TREE_TYPE (TREE_OPERAND (*expr_p, 0));
10399 *expr_p = fold_indirect_ref_loc (input_location, *expr_p);
10400 if (*expr_p != save_expr)
10402 ret = GS_OK;
10403 break;
10406 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
10407 is_gimple_reg, fb_rvalue);
10408 if (ret == GS_ERROR)
10409 break;
10411 recalculate_side_effects (*expr_p);
10412 *expr_p = fold_build2_loc (input_location, MEM_REF,
10413 TREE_TYPE (*expr_p),
10414 TREE_OPERAND (*expr_p, 0),
10415 build_int_cst (saved_ptr_type, 0));
10416 TREE_THIS_VOLATILE (*expr_p) = volatilep;
10417 TREE_THIS_NOTRAP (*expr_p) = notrap;
10418 ret = GS_OK;
10419 break;
10422 /* We arrive here through the various re-gimplifcation paths. */
10423 case MEM_REF:
10424 /* First try re-folding the whole thing. */
10425 tmp = fold_binary (MEM_REF, TREE_TYPE (*expr_p),
10426 TREE_OPERAND (*expr_p, 0),
10427 TREE_OPERAND (*expr_p, 1));
10428 if (tmp)
10430 REF_REVERSE_STORAGE_ORDER (tmp)
10431 = REF_REVERSE_STORAGE_ORDER (*expr_p);
10432 *expr_p = tmp;
10433 recalculate_side_effects (*expr_p);
10434 ret = GS_OK;
10435 break;
10437 /* Avoid re-gimplifying the address operand if it is already
10438 in suitable form. Re-gimplifying would mark the address
10439 operand addressable. Always gimplify when not in SSA form
10440 as we still may have to gimplify decls with value-exprs. */
10441 if (!gimplify_ctxp || !gimplify_ctxp->into_ssa
10442 || !is_gimple_mem_ref_addr (TREE_OPERAND (*expr_p, 0)))
10444 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
10445 is_gimple_mem_ref_addr, fb_rvalue);
10446 if (ret == GS_ERROR)
10447 break;
10449 recalculate_side_effects (*expr_p);
10450 ret = GS_ALL_DONE;
10451 break;
10453 /* Constants need not be gimplified. */
10454 case INTEGER_CST:
10455 case REAL_CST:
10456 case FIXED_CST:
10457 case STRING_CST:
10458 case COMPLEX_CST:
10459 case VECTOR_CST:
10460 /* Drop the overflow flag on constants, we do not want
10461 that in the GIMPLE IL. */
10462 if (TREE_OVERFLOW_P (*expr_p))
10463 *expr_p = drop_tree_overflow (*expr_p);
10464 ret = GS_ALL_DONE;
10465 break;
10467 case CONST_DECL:
10468 /* If we require an lvalue, such as for ADDR_EXPR, retain the
10469 CONST_DECL node. Otherwise the decl is replaceable by its
10470 value. */
10471 /* ??? Should be == fb_lvalue, but ADDR_EXPR passes fb_either. */
10472 if (fallback & fb_lvalue)
10473 ret = GS_ALL_DONE;
10474 else
10476 *expr_p = DECL_INITIAL (*expr_p);
10477 ret = GS_OK;
10479 break;
10481 case DECL_EXPR:
10482 ret = gimplify_decl_expr (expr_p, pre_p);
10483 break;
10485 case BIND_EXPR:
10486 ret = gimplify_bind_expr (expr_p, pre_p);
10487 break;
10489 case LOOP_EXPR:
10490 ret = gimplify_loop_expr (expr_p, pre_p);
10491 break;
10493 case SWITCH_EXPR:
10494 ret = gimplify_switch_expr (expr_p, pre_p);
10495 break;
10497 case EXIT_EXPR:
10498 ret = gimplify_exit_expr (expr_p);
10499 break;
10501 case GOTO_EXPR:
10502 /* If the target is not LABEL, then it is a computed jump
10503 and the target needs to be gimplified. */
10504 if (TREE_CODE (GOTO_DESTINATION (*expr_p)) != LABEL_DECL)
10506 ret = gimplify_expr (&GOTO_DESTINATION (*expr_p), pre_p,
10507 NULL, is_gimple_val, fb_rvalue);
10508 if (ret == GS_ERROR)
10509 break;
10511 gimplify_seq_add_stmt (pre_p,
10512 gimple_build_goto (GOTO_DESTINATION (*expr_p)));
10513 ret = GS_ALL_DONE;
10514 break;
10516 case PREDICT_EXPR:
10517 gimplify_seq_add_stmt (pre_p,
10518 gimple_build_predict (PREDICT_EXPR_PREDICTOR (*expr_p),
10519 PREDICT_EXPR_OUTCOME (*expr_p)));
10520 ret = GS_ALL_DONE;
10521 break;
10523 case LABEL_EXPR:
10524 ret = GS_ALL_DONE;
10525 gcc_assert (decl_function_context (LABEL_EXPR_LABEL (*expr_p))
10526 == current_function_decl);
10527 gimplify_seq_add_stmt (pre_p,
10528 gimple_build_label (LABEL_EXPR_LABEL (*expr_p)));
10529 break;
10531 case CASE_LABEL_EXPR:
10532 ret = gimplify_case_label_expr (expr_p, pre_p);
10533 break;
10535 case RETURN_EXPR:
10536 ret = gimplify_return_expr (*expr_p, pre_p);
10537 break;
10539 case CONSTRUCTOR:
10540 /* Don't reduce this in place; let gimplify_init_constructor work its
10541 magic. Buf if we're just elaborating this for side effects, just
10542 gimplify any element that has side-effects. */
10543 if (fallback == fb_none)
10545 unsigned HOST_WIDE_INT ix;
10546 tree val;
10547 tree temp = NULL_TREE;
10548 FOR_EACH_CONSTRUCTOR_VALUE (CONSTRUCTOR_ELTS (*expr_p), ix, val)
10549 if (TREE_SIDE_EFFECTS (val))
10550 append_to_statement_list (val, &temp);
10552 *expr_p = temp;
10553 ret = temp ? GS_OK : GS_ALL_DONE;
10555 /* C99 code may assign to an array in a constructed
10556 structure or union, and this has undefined behavior only
10557 on execution, so create a temporary if an lvalue is
10558 required. */
10559 else if (fallback == fb_lvalue)
10561 *expr_p = get_initialized_tmp_var (*expr_p, pre_p, post_p);
10562 mark_addressable (*expr_p);
10563 ret = GS_OK;
10565 else
10566 ret = GS_ALL_DONE;
10567 break;
10569 /* The following are special cases that are not handled by the
10570 original GIMPLE grammar. */
10572 /* SAVE_EXPR nodes are converted into a GIMPLE identifier and
10573 eliminated. */
10574 case SAVE_EXPR:
10575 ret = gimplify_save_expr (expr_p, pre_p, post_p);
10576 break;
10578 case BIT_FIELD_REF:
10579 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
10580 post_p, is_gimple_lvalue, fb_either);
10581 recalculate_side_effects (*expr_p);
10582 break;
10584 case TARGET_MEM_REF:
10586 enum gimplify_status r0 = GS_ALL_DONE, r1 = GS_ALL_DONE;
10588 if (TMR_BASE (*expr_p))
10589 r0 = gimplify_expr (&TMR_BASE (*expr_p), pre_p,
10590 post_p, is_gimple_mem_ref_addr, fb_either);
10591 if (TMR_INDEX (*expr_p))
10592 r1 = gimplify_expr (&TMR_INDEX (*expr_p), pre_p,
10593 post_p, is_gimple_val, fb_rvalue);
10594 if (TMR_INDEX2 (*expr_p))
10595 r1 = gimplify_expr (&TMR_INDEX2 (*expr_p), pre_p,
10596 post_p, is_gimple_val, fb_rvalue);
10597 /* TMR_STEP and TMR_OFFSET are always integer constants. */
10598 ret = MIN (r0, r1);
10600 break;
10602 case NON_LVALUE_EXPR:
10603 /* This should have been stripped above. */
10604 gcc_unreachable ();
10606 case ASM_EXPR:
10607 ret = gimplify_asm_expr (expr_p, pre_p, post_p);
10608 break;
10610 case TRY_FINALLY_EXPR:
10611 case TRY_CATCH_EXPR:
10613 gimple_seq eval, cleanup;
10614 gtry *try_;
10616 /* Calls to destructors are generated automatically in FINALLY/CATCH
10617 block. They should have location as UNKNOWN_LOCATION. However,
10618 gimplify_call_expr will reset these call stmts to input_location
10619 if it finds stmt's location is unknown. To prevent resetting for
10620 destructors, we set the input_location to unknown.
10621 Note that this only affects the destructor calls in FINALLY/CATCH
10622 block, and will automatically reset to its original value by the
10623 end of gimplify_expr. */
10624 input_location = UNKNOWN_LOCATION;
10625 eval = cleanup = NULL;
10626 gimplify_and_add (TREE_OPERAND (*expr_p, 0), &eval);
10627 gimplify_and_add (TREE_OPERAND (*expr_p, 1), &cleanup);
10628 /* Don't create bogus GIMPLE_TRY with empty cleanup. */
10629 if (gimple_seq_empty_p (cleanup))
10631 gimple_seq_add_seq (pre_p, eval);
10632 ret = GS_ALL_DONE;
10633 break;
10635 try_ = gimple_build_try (eval, cleanup,
10636 TREE_CODE (*expr_p) == TRY_FINALLY_EXPR
10637 ? GIMPLE_TRY_FINALLY
10638 : GIMPLE_TRY_CATCH);
10639 if (EXPR_HAS_LOCATION (save_expr))
10640 gimple_set_location (try_, EXPR_LOCATION (save_expr));
10641 else if (LOCATION_LOCUS (saved_location) != UNKNOWN_LOCATION)
10642 gimple_set_location (try_, saved_location);
10643 if (TREE_CODE (*expr_p) == TRY_CATCH_EXPR)
10644 gimple_try_set_catch_is_cleanup (try_,
10645 TRY_CATCH_IS_CLEANUP (*expr_p));
10646 gimplify_seq_add_stmt (pre_p, try_);
10647 ret = GS_ALL_DONE;
10648 break;
10651 case CLEANUP_POINT_EXPR:
10652 ret = gimplify_cleanup_point_expr (expr_p, pre_p);
10653 break;
10655 case TARGET_EXPR:
10656 ret = gimplify_target_expr (expr_p, pre_p, post_p);
10657 break;
10659 case CATCH_EXPR:
10661 gimple *c;
10662 gimple_seq handler = NULL;
10663 gimplify_and_add (CATCH_BODY (*expr_p), &handler);
10664 c = gimple_build_catch (CATCH_TYPES (*expr_p), handler);
10665 gimplify_seq_add_stmt (pre_p, c);
10666 ret = GS_ALL_DONE;
10667 break;
10670 case EH_FILTER_EXPR:
10672 gimple *ehf;
10673 gimple_seq failure = NULL;
10675 gimplify_and_add (EH_FILTER_FAILURE (*expr_p), &failure);
10676 ehf = gimple_build_eh_filter (EH_FILTER_TYPES (*expr_p), failure);
10677 gimple_set_no_warning (ehf, TREE_NO_WARNING (*expr_p));
10678 gimplify_seq_add_stmt (pre_p, ehf);
10679 ret = GS_ALL_DONE;
10680 break;
10683 case OBJ_TYPE_REF:
10685 enum gimplify_status r0, r1;
10686 r0 = gimplify_expr (&OBJ_TYPE_REF_OBJECT (*expr_p), pre_p,
10687 post_p, is_gimple_val, fb_rvalue);
10688 r1 = gimplify_expr (&OBJ_TYPE_REF_EXPR (*expr_p), pre_p,
10689 post_p, is_gimple_val, fb_rvalue);
10690 TREE_SIDE_EFFECTS (*expr_p) = 0;
10691 ret = MIN (r0, r1);
10693 break;
10695 case LABEL_DECL:
10696 /* We get here when taking the address of a label. We mark
10697 the label as "forced"; meaning it can never be removed and
10698 it is a potential target for any computed goto. */
10699 FORCED_LABEL (*expr_p) = 1;
10700 ret = GS_ALL_DONE;
10701 break;
10703 case STATEMENT_LIST:
10704 ret = gimplify_statement_list (expr_p, pre_p);
10705 break;
10707 case WITH_SIZE_EXPR:
10709 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
10710 post_p == &internal_post ? NULL : post_p,
10711 gimple_test_f, fallback);
10712 gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
10713 is_gimple_val, fb_rvalue);
10714 ret = GS_ALL_DONE;
10716 break;
10718 case VAR_DECL:
10719 case PARM_DECL:
10720 ret = gimplify_var_or_parm_decl (expr_p);
10721 break;
10723 case RESULT_DECL:
10724 /* When within an OMP context, notice uses of variables. */
10725 if (gimplify_omp_ctxp)
10726 omp_notice_variable (gimplify_omp_ctxp, *expr_p, true);
10727 ret = GS_ALL_DONE;
10728 break;
10730 case SSA_NAME:
10731 /* Allow callbacks into the gimplifier during optimization. */
10732 ret = GS_ALL_DONE;
10733 break;
10735 case OMP_PARALLEL:
10736 gimplify_omp_parallel (expr_p, pre_p);
10737 ret = GS_ALL_DONE;
10738 break;
10740 case OMP_TASK:
10741 gimplify_omp_task (expr_p, pre_p);
10742 ret = GS_ALL_DONE;
10743 break;
10745 case OMP_FOR:
10746 case OMP_SIMD:
10747 case CILK_SIMD:
10748 case CILK_FOR:
10749 case OMP_DISTRIBUTE:
10750 case OMP_TASKLOOP:
10751 case OACC_LOOP:
10752 ret = gimplify_omp_for (expr_p, pre_p);
10753 break;
10755 case OACC_CACHE:
10756 gimplify_oacc_cache (expr_p, pre_p);
10757 ret = GS_ALL_DONE;
10758 break;
10760 case OACC_DECLARE:
10761 gimplify_oacc_declare (expr_p, pre_p);
10762 ret = GS_ALL_DONE;
10763 break;
10765 case OACC_HOST_DATA:
10766 case OACC_DATA:
10767 case OACC_KERNELS:
10768 case OACC_PARALLEL:
10769 case OMP_SECTIONS:
10770 case OMP_SINGLE:
10771 case OMP_TARGET:
10772 case OMP_TARGET_DATA:
10773 case OMP_TEAMS:
10774 gimplify_omp_workshare (expr_p, pre_p);
10775 ret = GS_ALL_DONE;
10776 break;
10778 case OACC_ENTER_DATA:
10779 case OACC_EXIT_DATA:
10780 case OACC_UPDATE:
10781 case OMP_TARGET_UPDATE:
10782 case OMP_TARGET_ENTER_DATA:
10783 case OMP_TARGET_EXIT_DATA:
10784 gimplify_omp_target_update (expr_p, pre_p);
10785 ret = GS_ALL_DONE;
10786 break;
10788 case OMP_SECTION:
10789 case OMP_MASTER:
10790 case OMP_TASKGROUP:
10791 case OMP_ORDERED:
10792 case OMP_CRITICAL:
10794 gimple_seq body = NULL;
10795 gimple *g;
10797 gimplify_and_add (OMP_BODY (*expr_p), &body);
10798 switch (TREE_CODE (*expr_p))
10800 case OMP_SECTION:
10801 g = gimple_build_omp_section (body);
10802 break;
10803 case OMP_MASTER:
10804 g = gimple_build_omp_master (body);
10805 break;
10806 case OMP_TASKGROUP:
10808 gimple_seq cleanup = NULL;
10809 tree fn
10810 = builtin_decl_explicit (BUILT_IN_GOMP_TASKGROUP_END);
10811 g = gimple_build_call (fn, 0);
10812 gimple_seq_add_stmt (&cleanup, g);
10813 g = gimple_build_try (body, cleanup, GIMPLE_TRY_FINALLY);
10814 body = NULL;
10815 gimple_seq_add_stmt (&body, g);
10816 g = gimple_build_omp_taskgroup (body);
10818 break;
10819 case OMP_ORDERED:
10820 g = gimplify_omp_ordered (*expr_p, body);
10821 break;
10822 case OMP_CRITICAL:
10823 gimplify_scan_omp_clauses (&OMP_CRITICAL_CLAUSES (*expr_p),
10824 pre_p, ORT_WORKSHARE, OMP_CRITICAL);
10825 gimplify_adjust_omp_clauses (pre_p, body,
10826 &OMP_CRITICAL_CLAUSES (*expr_p),
10827 OMP_CRITICAL);
10828 g = gimple_build_omp_critical (body,
10829 OMP_CRITICAL_NAME (*expr_p),
10830 OMP_CRITICAL_CLAUSES (*expr_p));
10831 break;
10832 default:
10833 gcc_unreachable ();
10835 gimplify_seq_add_stmt (pre_p, g);
10836 ret = GS_ALL_DONE;
10837 break;
10840 case OMP_ATOMIC:
10841 case OMP_ATOMIC_READ:
10842 case OMP_ATOMIC_CAPTURE_OLD:
10843 case OMP_ATOMIC_CAPTURE_NEW:
10844 ret = gimplify_omp_atomic (expr_p, pre_p);
10845 break;
10847 case TRANSACTION_EXPR:
10848 ret = gimplify_transaction (expr_p, pre_p);
10849 break;
10851 case TRUTH_AND_EXPR:
10852 case TRUTH_OR_EXPR:
10853 case TRUTH_XOR_EXPR:
10855 tree orig_type = TREE_TYPE (*expr_p);
10856 tree new_type, xop0, xop1;
10857 *expr_p = gimple_boolify (*expr_p);
10858 new_type = TREE_TYPE (*expr_p);
10859 if (!useless_type_conversion_p (orig_type, new_type))
10861 *expr_p = fold_convert_loc (input_location, orig_type, *expr_p);
10862 ret = GS_OK;
10863 break;
10866 /* Boolified binary truth expressions are semantically equivalent
10867 to bitwise binary expressions. Canonicalize them to the
10868 bitwise variant. */
10869 switch (TREE_CODE (*expr_p))
10871 case TRUTH_AND_EXPR:
10872 TREE_SET_CODE (*expr_p, BIT_AND_EXPR);
10873 break;
10874 case TRUTH_OR_EXPR:
10875 TREE_SET_CODE (*expr_p, BIT_IOR_EXPR);
10876 break;
10877 case TRUTH_XOR_EXPR:
10878 TREE_SET_CODE (*expr_p, BIT_XOR_EXPR);
10879 break;
10880 default:
10881 break;
10883 /* Now make sure that operands have compatible type to
10884 expression's new_type. */
10885 xop0 = TREE_OPERAND (*expr_p, 0);
10886 xop1 = TREE_OPERAND (*expr_p, 1);
10887 if (!useless_type_conversion_p (new_type, TREE_TYPE (xop0)))
10888 TREE_OPERAND (*expr_p, 0) = fold_convert_loc (input_location,
10889 new_type,
10890 xop0);
10891 if (!useless_type_conversion_p (new_type, TREE_TYPE (xop1)))
10892 TREE_OPERAND (*expr_p, 1) = fold_convert_loc (input_location,
10893 new_type,
10894 xop1);
10895 /* Continue classified as tcc_binary. */
10896 goto expr_2;
10899 case VEC_COND_EXPR:
10901 enum gimplify_status r0, r1, r2;
10903 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
10904 post_p, is_gimple_condexpr, fb_rvalue);
10905 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
10906 post_p, is_gimple_val, fb_rvalue);
10907 r2 = gimplify_expr (&TREE_OPERAND (*expr_p, 2), pre_p,
10908 post_p, is_gimple_val, fb_rvalue);
10910 ret = MIN (MIN (r0, r1), r2);
10911 recalculate_side_effects (*expr_p);
10913 break;
10915 case FMA_EXPR:
10916 case VEC_PERM_EXPR:
10917 /* Classified as tcc_expression. */
10918 goto expr_3;
10920 case POINTER_PLUS_EXPR:
10922 enum gimplify_status r0, r1;
10923 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
10924 post_p, is_gimple_val, fb_rvalue);
10925 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
10926 post_p, is_gimple_val, fb_rvalue);
10927 recalculate_side_effects (*expr_p);
10928 ret = MIN (r0, r1);
10929 break;
10932 case CILK_SYNC_STMT:
10934 if (!fn_contains_cilk_spawn_p (cfun))
10936 error_at (EXPR_LOCATION (*expr_p),
10937 "expected %<_Cilk_spawn%> before %<_Cilk_sync%>");
10938 ret = GS_ERROR;
10940 else
10942 gimplify_cilk_sync (expr_p, pre_p);
10943 ret = GS_ALL_DONE;
10945 break;
10948 default:
10949 switch (TREE_CODE_CLASS (TREE_CODE (*expr_p)))
10951 case tcc_comparison:
10952 /* Handle comparison of objects of non scalar mode aggregates
10953 with a call to memcmp. It would be nice to only have to do
10954 this for variable-sized objects, but then we'd have to allow
10955 the same nest of reference nodes we allow for MODIFY_EXPR and
10956 that's too complex.
10958 Compare scalar mode aggregates as scalar mode values. Using
10959 memcmp for them would be very inefficient at best, and is
10960 plain wrong if bitfields are involved. */
10962 tree type = TREE_TYPE (TREE_OPERAND (*expr_p, 1));
10964 /* Vector comparisons need no boolification. */
10965 if (TREE_CODE (type) == VECTOR_TYPE)
10966 goto expr_2;
10967 else if (!AGGREGATE_TYPE_P (type))
10969 tree org_type = TREE_TYPE (*expr_p);
10970 *expr_p = gimple_boolify (*expr_p);
10971 if (!useless_type_conversion_p (org_type,
10972 TREE_TYPE (*expr_p)))
10974 *expr_p = fold_convert_loc (input_location,
10975 org_type, *expr_p);
10976 ret = GS_OK;
10978 else
10979 goto expr_2;
10981 else if (TYPE_MODE (type) != BLKmode)
10982 ret = gimplify_scalar_mode_aggregate_compare (expr_p);
10983 else
10984 ret = gimplify_variable_sized_compare (expr_p);
10986 break;
10989 /* If *EXPR_P does not need to be special-cased, handle it
10990 according to its class. */
10991 case tcc_unary:
10992 ret = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
10993 post_p, is_gimple_val, fb_rvalue);
10994 break;
10996 case tcc_binary:
10997 expr_2:
10999 enum gimplify_status r0, r1;
11001 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
11002 post_p, is_gimple_val, fb_rvalue);
11003 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
11004 post_p, is_gimple_val, fb_rvalue);
11006 ret = MIN (r0, r1);
11007 break;
11010 expr_3:
11012 enum gimplify_status r0, r1, r2;
11014 r0 = gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p,
11015 post_p, is_gimple_val, fb_rvalue);
11016 r1 = gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p,
11017 post_p, is_gimple_val, fb_rvalue);
11018 r2 = gimplify_expr (&TREE_OPERAND (*expr_p, 2), pre_p,
11019 post_p, is_gimple_val, fb_rvalue);
11021 ret = MIN (MIN (r0, r1), r2);
11022 break;
11025 case tcc_declaration:
11026 case tcc_constant:
11027 ret = GS_ALL_DONE;
11028 goto dont_recalculate;
11030 default:
11031 gcc_unreachable ();
11034 recalculate_side_effects (*expr_p);
11036 dont_recalculate:
11037 break;
11040 gcc_assert (*expr_p || ret != GS_OK);
11042 while (ret == GS_OK);
11044 /* If we encountered an error_mark somewhere nested inside, either
11045 stub out the statement or propagate the error back out. */
11046 if (ret == GS_ERROR)
11048 if (is_statement)
11049 *expr_p = NULL;
11050 goto out;
11053 /* This was only valid as a return value from the langhook, which
11054 we handled. Make sure it doesn't escape from any other context. */
11055 gcc_assert (ret != GS_UNHANDLED);
11057 if (fallback == fb_none && *expr_p && !is_gimple_stmt (*expr_p))
11059 /* We aren't looking for a value, and we don't have a valid
11060 statement. If it doesn't have side-effects, throw it away. */
11061 if (!TREE_SIDE_EFFECTS (*expr_p))
11062 *expr_p = NULL;
11063 else if (!TREE_THIS_VOLATILE (*expr_p))
11065 /* This is probably a _REF that contains something nested that
11066 has side effects. Recurse through the operands to find it. */
11067 enum tree_code code = TREE_CODE (*expr_p);
11069 switch (code)
11071 case COMPONENT_REF:
11072 case REALPART_EXPR:
11073 case IMAGPART_EXPR:
11074 case VIEW_CONVERT_EXPR:
11075 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
11076 gimple_test_f, fallback);
11077 break;
11079 case ARRAY_REF:
11080 case ARRAY_RANGE_REF:
11081 gimplify_expr (&TREE_OPERAND (*expr_p, 0), pre_p, post_p,
11082 gimple_test_f, fallback);
11083 gimplify_expr (&TREE_OPERAND (*expr_p, 1), pre_p, post_p,
11084 gimple_test_f, fallback);
11085 break;
11087 default:
11088 /* Anything else with side-effects must be converted to
11089 a valid statement before we get here. */
11090 gcc_unreachable ();
11093 *expr_p = NULL;
11095 else if (COMPLETE_TYPE_P (TREE_TYPE (*expr_p))
11096 && TYPE_MODE (TREE_TYPE (*expr_p)) != BLKmode)
11098 /* Historically, the compiler has treated a bare reference
11099 to a non-BLKmode volatile lvalue as forcing a load. */
11100 tree type = TYPE_MAIN_VARIANT (TREE_TYPE (*expr_p));
11102 /* Normally, we do not want to create a temporary for a
11103 TREE_ADDRESSABLE type because such a type should not be
11104 copied by bitwise-assignment. However, we make an
11105 exception here, as all we are doing here is ensuring that
11106 we read the bytes that make up the type. We use
11107 create_tmp_var_raw because create_tmp_var will abort when
11108 given a TREE_ADDRESSABLE type. */
11109 tree tmp = create_tmp_var_raw (type, "vol");
11110 gimple_add_tmp_var (tmp);
11111 gimplify_assign (tmp, *expr_p, pre_p);
11112 *expr_p = NULL;
11114 else
11115 /* We can't do anything useful with a volatile reference to
11116 an incomplete type, so just throw it away. Likewise for
11117 a BLKmode type, since any implicit inner load should
11118 already have been turned into an explicit one by the
11119 gimplification process. */
11120 *expr_p = NULL;
11123 /* If we are gimplifying at the statement level, we're done. Tack
11124 everything together and return. */
11125 if (fallback == fb_none || is_statement)
11127 /* Since *EXPR_P has been converted into a GIMPLE tuple, clear
11128 it out for GC to reclaim it. */
11129 *expr_p = NULL_TREE;
11131 if (!gimple_seq_empty_p (internal_pre)
11132 || !gimple_seq_empty_p (internal_post))
11134 gimplify_seq_add_seq (&internal_pre, internal_post);
11135 gimplify_seq_add_seq (pre_p, internal_pre);
11138 /* The result of gimplifying *EXPR_P is going to be the last few
11139 statements in *PRE_P and *POST_P. Add location information
11140 to all the statements that were added by the gimplification
11141 helpers. */
11142 if (!gimple_seq_empty_p (*pre_p))
11143 annotate_all_with_location_after (*pre_p, pre_last_gsi, input_location);
11145 if (!gimple_seq_empty_p (*post_p))
11146 annotate_all_with_location_after (*post_p, post_last_gsi,
11147 input_location);
11149 goto out;
11152 #ifdef ENABLE_GIMPLE_CHECKING
11153 if (*expr_p)
11155 enum tree_code code = TREE_CODE (*expr_p);
11156 /* These expressions should already be in gimple IR form. */
11157 gcc_assert (code != MODIFY_EXPR
11158 && code != ASM_EXPR
11159 && code != BIND_EXPR
11160 && code != CATCH_EXPR
11161 && (code != COND_EXPR || gimplify_ctxp->allow_rhs_cond_expr)
11162 && code != EH_FILTER_EXPR
11163 && code != GOTO_EXPR
11164 && code != LABEL_EXPR
11165 && code != LOOP_EXPR
11166 && code != SWITCH_EXPR
11167 && code != TRY_FINALLY_EXPR
11168 && code != OACC_PARALLEL
11169 && code != OACC_KERNELS
11170 && code != OACC_DATA
11171 && code != OACC_HOST_DATA
11172 && code != OACC_DECLARE
11173 && code != OACC_UPDATE
11174 && code != OACC_ENTER_DATA
11175 && code != OACC_EXIT_DATA
11176 && code != OACC_CACHE
11177 && code != OMP_CRITICAL
11178 && code != OMP_FOR
11179 && code != OACC_LOOP
11180 && code != OMP_MASTER
11181 && code != OMP_TASKGROUP
11182 && code != OMP_ORDERED
11183 && code != OMP_PARALLEL
11184 && code != OMP_SECTIONS
11185 && code != OMP_SECTION
11186 && code != OMP_SINGLE);
11188 #endif
11190 /* Otherwise we're gimplifying a subexpression, so the resulting
11191 value is interesting. If it's a valid operand that matches
11192 GIMPLE_TEST_F, we're done. Unless we are handling some
11193 post-effects internally; if that's the case, we need to copy into
11194 a temporary before adding the post-effects to POST_P. */
11195 if (gimple_seq_empty_p (internal_post) && (*gimple_test_f) (*expr_p))
11196 goto out;
11198 /* Otherwise, we need to create a new temporary for the gimplified
11199 expression. */
11201 /* We can't return an lvalue if we have an internal postqueue. The
11202 object the lvalue refers to would (probably) be modified by the
11203 postqueue; we need to copy the value out first, which means an
11204 rvalue. */
11205 if ((fallback & fb_lvalue)
11206 && gimple_seq_empty_p (internal_post)
11207 && is_gimple_addressable (*expr_p))
11209 /* An lvalue will do. Take the address of the expression, store it
11210 in a temporary, and replace the expression with an INDIRECT_REF of
11211 that temporary. */
11212 tmp = build_fold_addr_expr_loc (input_location, *expr_p);
11213 gimplify_expr (&tmp, pre_p, post_p, is_gimple_reg, fb_rvalue);
11214 *expr_p = build_simple_mem_ref (tmp);
11216 else if ((fallback & fb_rvalue) && is_gimple_reg_rhs_or_call (*expr_p))
11218 /* An rvalue will do. Assign the gimplified expression into a
11219 new temporary TMP and replace the original expression with
11220 TMP. First, make sure that the expression has a type so that
11221 it can be assigned into a temporary. */
11222 gcc_assert (!VOID_TYPE_P (TREE_TYPE (*expr_p)));
11223 *expr_p = get_formal_tmp_var (*expr_p, pre_p);
11225 else
11227 #ifdef ENABLE_GIMPLE_CHECKING
11228 if (!(fallback & fb_mayfail))
11230 fprintf (stderr, "gimplification failed:\n");
11231 print_generic_expr (stderr, *expr_p, 0);
11232 debug_tree (*expr_p);
11233 internal_error ("gimplification failed");
11235 #endif
11236 gcc_assert (fallback & fb_mayfail);
11238 /* If this is an asm statement, and the user asked for the
11239 impossible, don't die. Fail and let gimplify_asm_expr
11240 issue an error. */
11241 ret = GS_ERROR;
11242 goto out;
11245 /* Make sure the temporary matches our predicate. */
11246 gcc_assert ((*gimple_test_f) (*expr_p));
11248 if (!gimple_seq_empty_p (internal_post))
11250 annotate_all_with_location (internal_post, input_location);
11251 gimplify_seq_add_seq (pre_p, internal_post);
11254 out:
11255 input_location = saved_location;
11256 return ret;
11259 /* Look through TYPE for variable-sized objects and gimplify each such
11260 size that we find. Add to LIST_P any statements generated. */
11262 void
11263 gimplify_type_sizes (tree type, gimple_seq *list_p)
11265 tree field, t;
11267 if (type == NULL || type == error_mark_node)
11268 return;
11270 /* We first do the main variant, then copy into any other variants. */
11271 type = TYPE_MAIN_VARIANT (type);
11273 /* Avoid infinite recursion. */
11274 if (TYPE_SIZES_GIMPLIFIED (type))
11275 return;
11277 TYPE_SIZES_GIMPLIFIED (type) = 1;
11279 switch (TREE_CODE (type))
11281 case INTEGER_TYPE:
11282 case ENUMERAL_TYPE:
11283 case BOOLEAN_TYPE:
11284 case REAL_TYPE:
11285 case FIXED_POINT_TYPE:
11286 gimplify_one_sizepos (&TYPE_MIN_VALUE (type), list_p);
11287 gimplify_one_sizepos (&TYPE_MAX_VALUE (type), list_p);
11289 for (t = TYPE_NEXT_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
11291 TYPE_MIN_VALUE (t) = TYPE_MIN_VALUE (type);
11292 TYPE_MAX_VALUE (t) = TYPE_MAX_VALUE (type);
11294 break;
11296 case ARRAY_TYPE:
11297 /* These types may not have declarations, so handle them here. */
11298 gimplify_type_sizes (TREE_TYPE (type), list_p);
11299 gimplify_type_sizes (TYPE_DOMAIN (type), list_p);
11300 /* Ensure VLA bounds aren't removed, for -O0 they should be variables
11301 with assigned stack slots, for -O1+ -g they should be tracked
11302 by VTA. */
11303 if (!(TYPE_NAME (type)
11304 && TREE_CODE (TYPE_NAME (type)) == TYPE_DECL
11305 && DECL_IGNORED_P (TYPE_NAME (type)))
11306 && TYPE_DOMAIN (type)
11307 && INTEGRAL_TYPE_P (TYPE_DOMAIN (type)))
11309 t = TYPE_MIN_VALUE (TYPE_DOMAIN (type));
11310 if (t && TREE_CODE (t) == VAR_DECL && DECL_ARTIFICIAL (t))
11311 DECL_IGNORED_P (t) = 0;
11312 t = TYPE_MAX_VALUE (TYPE_DOMAIN (type));
11313 if (t && TREE_CODE (t) == VAR_DECL && DECL_ARTIFICIAL (t))
11314 DECL_IGNORED_P (t) = 0;
11316 break;
11318 case RECORD_TYPE:
11319 case UNION_TYPE:
11320 case QUAL_UNION_TYPE:
11321 for (field = TYPE_FIELDS (type); field; field = DECL_CHAIN (field))
11322 if (TREE_CODE (field) == FIELD_DECL)
11324 gimplify_one_sizepos (&DECL_FIELD_OFFSET (field), list_p);
11325 gimplify_one_sizepos (&DECL_SIZE (field), list_p);
11326 gimplify_one_sizepos (&DECL_SIZE_UNIT (field), list_p);
11327 gimplify_type_sizes (TREE_TYPE (field), list_p);
11329 break;
11331 case POINTER_TYPE:
11332 case REFERENCE_TYPE:
11333 /* We used to recurse on the pointed-to type here, which turned out to
11334 be incorrect because its definition might refer to variables not
11335 yet initialized at this point if a forward declaration is involved.
11337 It was actually useful for anonymous pointed-to types to ensure
11338 that the sizes evaluation dominates every possible later use of the
11339 values. Restricting to such types here would be safe since there
11340 is no possible forward declaration around, but would introduce an
11341 undesirable middle-end semantic to anonymity. We then defer to
11342 front-ends the responsibility of ensuring that the sizes are
11343 evaluated both early and late enough, e.g. by attaching artificial
11344 type declarations to the tree. */
11345 break;
11347 default:
11348 break;
11351 gimplify_one_sizepos (&TYPE_SIZE (type), list_p);
11352 gimplify_one_sizepos (&TYPE_SIZE_UNIT (type), list_p);
11354 for (t = TYPE_NEXT_VARIANT (type); t; t = TYPE_NEXT_VARIANT (t))
11356 TYPE_SIZE (t) = TYPE_SIZE (type);
11357 TYPE_SIZE_UNIT (t) = TYPE_SIZE_UNIT (type);
11358 TYPE_SIZES_GIMPLIFIED (t) = 1;
11362 /* A subroutine of gimplify_type_sizes to make sure that *EXPR_P,
11363 a size or position, has had all of its SAVE_EXPRs evaluated.
11364 We add any required statements to *STMT_P. */
11366 void
11367 gimplify_one_sizepos (tree *expr_p, gimple_seq *stmt_p)
11369 tree expr = *expr_p;
11371 /* We don't do anything if the value isn't there, is constant, or contains
11372 A PLACEHOLDER_EXPR. We also don't want to do anything if it's already
11373 a VAR_DECL. If it's a VAR_DECL from another function, the gimplifier
11374 will want to replace it with a new variable, but that will cause problems
11375 if this type is from outside the function. It's OK to have that here. */
11376 if (is_gimple_sizepos (expr))
11377 return;
11379 *expr_p = unshare_expr (expr);
11381 gimplify_expr (expr_p, stmt_p, NULL, is_gimple_val, fb_rvalue);
11384 /* Gimplify the body of statements of FNDECL and return a GIMPLE_BIND node
11385 containing the sequence of corresponding GIMPLE statements. If DO_PARMS
11386 is true, also gimplify the parameters. */
11388 gbind *
11389 gimplify_body (tree fndecl, bool do_parms)
11391 location_t saved_location = input_location;
11392 gimple_seq parm_stmts, seq;
11393 gimple *outer_stmt;
11394 gbind *outer_bind;
11395 struct cgraph_node *cgn;
11397 timevar_push (TV_TREE_GIMPLIFY);
11399 /* Initialize for optimize_insn_for_s{ize,peed}_p possibly called during
11400 gimplification. */
11401 default_rtl_profile ();
11403 gcc_assert (gimplify_ctxp == NULL);
11404 push_gimplify_context ();
11406 if (flag_openacc || flag_openmp)
11408 gcc_assert (gimplify_omp_ctxp == NULL);
11409 if (lookup_attribute ("omp declare target", DECL_ATTRIBUTES (fndecl)))
11410 gimplify_omp_ctxp = new_omp_context (ORT_TARGET);
11413 /* Unshare most shared trees in the body and in that of any nested functions.
11414 It would seem we don't have to do this for nested functions because
11415 they are supposed to be output and then the outer function gimplified
11416 first, but the g++ front end doesn't always do it that way. */
11417 unshare_body (fndecl);
11418 unvisit_body (fndecl);
11420 cgn = cgraph_node::get (fndecl);
11421 if (cgn && cgn->origin)
11422 nonlocal_vlas = new hash_set<tree>;
11424 /* Make sure input_location isn't set to something weird. */
11425 input_location = DECL_SOURCE_LOCATION (fndecl);
11427 /* Resolve callee-copies. This has to be done before processing
11428 the body so that DECL_VALUE_EXPR gets processed correctly. */
11429 parm_stmts = do_parms ? gimplify_parameters () : NULL;
11431 /* Gimplify the function's body. */
11432 seq = NULL;
11433 gimplify_stmt (&DECL_SAVED_TREE (fndecl), &seq);
11434 outer_stmt = gimple_seq_first_stmt (seq);
11435 if (!outer_stmt)
11437 outer_stmt = gimple_build_nop ();
11438 gimplify_seq_add_stmt (&seq, outer_stmt);
11441 /* The body must contain exactly one statement, a GIMPLE_BIND. If this is
11442 not the case, wrap everything in a GIMPLE_BIND to make it so. */
11443 if (gimple_code (outer_stmt) == GIMPLE_BIND
11444 && gimple_seq_first (seq) == gimple_seq_last (seq))
11445 outer_bind = as_a <gbind *> (outer_stmt);
11446 else
11447 outer_bind = gimple_build_bind (NULL_TREE, seq, NULL);
11449 DECL_SAVED_TREE (fndecl) = NULL_TREE;
11451 /* If we had callee-copies statements, insert them at the beginning
11452 of the function and clear DECL_VALUE_EXPR_P on the parameters. */
11453 if (!gimple_seq_empty_p (parm_stmts))
11455 tree parm;
11457 gimplify_seq_add_seq (&parm_stmts, gimple_bind_body (outer_bind));
11458 gimple_bind_set_body (outer_bind, parm_stmts);
11460 for (parm = DECL_ARGUMENTS (current_function_decl);
11461 parm; parm = DECL_CHAIN (parm))
11462 if (DECL_HAS_VALUE_EXPR_P (parm))
11464 DECL_HAS_VALUE_EXPR_P (parm) = 0;
11465 DECL_IGNORED_P (parm) = 0;
11469 if (nonlocal_vlas)
11471 if (nonlocal_vla_vars)
11473 /* tree-nested.c may later on call declare_vars (..., true);
11474 which relies on BLOCK_VARS chain to be the tail of the
11475 gimple_bind_vars chain. Ensure we don't violate that
11476 assumption. */
11477 if (gimple_bind_block (outer_bind)
11478 == DECL_INITIAL (current_function_decl))
11479 declare_vars (nonlocal_vla_vars, outer_bind, true);
11480 else
11481 BLOCK_VARS (DECL_INITIAL (current_function_decl))
11482 = chainon (BLOCK_VARS (DECL_INITIAL (current_function_decl)),
11483 nonlocal_vla_vars);
11484 nonlocal_vla_vars = NULL_TREE;
11486 delete nonlocal_vlas;
11487 nonlocal_vlas = NULL;
11490 if ((flag_openacc || flag_openmp || flag_openmp_simd)
11491 && gimplify_omp_ctxp)
11493 delete_omp_context (gimplify_omp_ctxp);
11494 gimplify_omp_ctxp = NULL;
11497 pop_gimplify_context (outer_bind);
11498 gcc_assert (gimplify_ctxp == NULL);
11500 if (flag_checking && !seen_error ())
11501 verify_gimple_in_seq (gimple_bind_body (outer_bind));
11503 timevar_pop (TV_TREE_GIMPLIFY);
11504 input_location = saved_location;
11506 return outer_bind;
11509 typedef char *char_p; /* For DEF_VEC_P. */
11511 /* Return whether we should exclude FNDECL from instrumentation. */
11513 static bool
11514 flag_instrument_functions_exclude_p (tree fndecl)
11516 vec<char_p> *v;
11518 v = (vec<char_p> *) flag_instrument_functions_exclude_functions;
11519 if (v && v->length () > 0)
11521 const char *name;
11522 int i;
11523 char *s;
11525 name = lang_hooks.decl_printable_name (fndecl, 0);
11526 FOR_EACH_VEC_ELT (*v, i, s)
11527 if (strstr (name, s) != NULL)
11528 return true;
11531 v = (vec<char_p> *) flag_instrument_functions_exclude_files;
11532 if (v && v->length () > 0)
11534 const char *name;
11535 int i;
11536 char *s;
11538 name = DECL_SOURCE_FILE (fndecl);
11539 FOR_EACH_VEC_ELT (*v, i, s)
11540 if (strstr (name, s) != NULL)
11541 return true;
11544 return false;
11547 /* Entry point to the gimplification pass. FNDECL is the FUNCTION_DECL
11548 node for the function we want to gimplify.
11550 Return the sequence of GIMPLE statements corresponding to the body
11551 of FNDECL. */
11553 void
11554 gimplify_function_tree (tree fndecl)
11556 tree parm, ret;
11557 gimple_seq seq;
11558 gbind *bind;
11560 gcc_assert (!gimple_body (fndecl));
11562 if (DECL_STRUCT_FUNCTION (fndecl))
11563 push_cfun (DECL_STRUCT_FUNCTION (fndecl));
11564 else
11565 push_struct_function (fndecl);
11567 /* Tentatively set PROP_gimple_lva here, and reset it in gimplify_va_arg_expr
11568 if necessary. */
11569 cfun->curr_properties |= PROP_gimple_lva;
11571 for (parm = DECL_ARGUMENTS (fndecl); parm ; parm = DECL_CHAIN (parm))
11573 /* Preliminarily mark non-addressed complex variables as eligible
11574 for promotion to gimple registers. We'll transform their uses
11575 as we find them. */
11576 if ((TREE_CODE (TREE_TYPE (parm)) == COMPLEX_TYPE
11577 || TREE_CODE (TREE_TYPE (parm)) == VECTOR_TYPE)
11578 && !TREE_THIS_VOLATILE (parm)
11579 && !needs_to_live_in_memory (parm))
11580 DECL_GIMPLE_REG_P (parm) = 1;
11583 ret = DECL_RESULT (fndecl);
11584 if ((TREE_CODE (TREE_TYPE (ret)) == COMPLEX_TYPE
11585 || TREE_CODE (TREE_TYPE (ret)) == VECTOR_TYPE)
11586 && !needs_to_live_in_memory (ret))
11587 DECL_GIMPLE_REG_P (ret) = 1;
11589 bind = gimplify_body (fndecl, true);
11591 /* The tree body of the function is no longer needed, replace it
11592 with the new GIMPLE body. */
11593 seq = NULL;
11594 gimple_seq_add_stmt (&seq, bind);
11595 gimple_set_body (fndecl, seq);
11597 /* If we're instrumenting function entry/exit, then prepend the call to
11598 the entry hook and wrap the whole function in a TRY_FINALLY_EXPR to
11599 catch the exit hook. */
11600 /* ??? Add some way to ignore exceptions for this TFE. */
11601 if (flag_instrument_function_entry_exit
11602 && !DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (fndecl)
11603 && !flag_instrument_functions_exclude_p (fndecl))
11605 tree x;
11606 gbind *new_bind;
11607 gimple *tf;
11608 gimple_seq cleanup = NULL, body = NULL;
11609 tree tmp_var;
11610 gcall *call;
11612 x = builtin_decl_implicit (BUILT_IN_RETURN_ADDRESS);
11613 call = gimple_build_call (x, 1, integer_zero_node);
11614 tmp_var = create_tmp_var (ptr_type_node, "return_addr");
11615 gimple_call_set_lhs (call, tmp_var);
11616 gimplify_seq_add_stmt (&cleanup, call);
11617 x = builtin_decl_implicit (BUILT_IN_PROFILE_FUNC_EXIT);
11618 call = gimple_build_call (x, 2,
11619 build_fold_addr_expr (current_function_decl),
11620 tmp_var);
11621 gimplify_seq_add_stmt (&cleanup, call);
11622 tf = gimple_build_try (seq, cleanup, GIMPLE_TRY_FINALLY);
11624 x = builtin_decl_implicit (BUILT_IN_RETURN_ADDRESS);
11625 call = gimple_build_call (x, 1, integer_zero_node);
11626 tmp_var = create_tmp_var (ptr_type_node, "return_addr");
11627 gimple_call_set_lhs (call, tmp_var);
11628 gimplify_seq_add_stmt (&body, call);
11629 x = builtin_decl_implicit (BUILT_IN_PROFILE_FUNC_ENTER);
11630 call = gimple_build_call (x, 2,
11631 build_fold_addr_expr (current_function_decl),
11632 tmp_var);
11633 gimplify_seq_add_stmt (&body, call);
11634 gimplify_seq_add_stmt (&body, tf);
11635 new_bind = gimple_build_bind (NULL, body, gimple_bind_block (bind));
11636 /* Clear the block for BIND, since it is no longer directly inside
11637 the function, but within a try block. */
11638 gimple_bind_set_block (bind, NULL);
11640 /* Replace the current function body with the body
11641 wrapped in the try/finally TF. */
11642 seq = NULL;
11643 gimple_seq_add_stmt (&seq, new_bind);
11644 gimple_set_body (fndecl, seq);
11645 bind = new_bind;
11648 if ((flag_sanitize & SANITIZE_THREAD) != 0
11649 && !lookup_attribute ("no_sanitize_thread", DECL_ATTRIBUTES (fndecl)))
11651 gcall *call = gimple_build_call_internal (IFN_TSAN_FUNC_EXIT, 0);
11652 gimple *tf = gimple_build_try (seq, call, GIMPLE_TRY_FINALLY);
11653 gbind *new_bind = gimple_build_bind (NULL, tf, gimple_bind_block (bind));
11654 /* Clear the block for BIND, since it is no longer directly inside
11655 the function, but within a try block. */
11656 gimple_bind_set_block (bind, NULL);
11657 /* Replace the current function body with the body
11658 wrapped in the try/finally TF. */
11659 seq = NULL;
11660 gimple_seq_add_stmt (&seq, new_bind);
11661 gimple_set_body (fndecl, seq);
11664 DECL_SAVED_TREE (fndecl) = NULL_TREE;
11665 cfun->curr_properties |= PROP_gimple_any;
11667 pop_cfun ();
11669 dump_function (TDI_generic, fndecl);
11672 /* Return a dummy expression of type TYPE in order to keep going after an
11673 error. */
11675 static tree
11676 dummy_object (tree type)
11678 tree t = build_int_cst (build_pointer_type (type), 0);
11679 return build2 (MEM_REF, type, t, t);
11682 /* Gimplify __builtin_va_arg, aka VA_ARG_EXPR, which is not really a
11683 builtin function, but a very special sort of operator. */
11685 enum gimplify_status
11686 gimplify_va_arg_expr (tree *expr_p, gimple_seq *pre_p,
11687 gimple_seq *post_p ATTRIBUTE_UNUSED)
11689 tree promoted_type, have_va_type;
11690 tree valist = TREE_OPERAND (*expr_p, 0);
11691 tree type = TREE_TYPE (*expr_p);
11692 tree t, tag, aptag;
11693 location_t loc = EXPR_LOCATION (*expr_p);
11695 /* Verify that valist is of the proper type. */
11696 have_va_type = TREE_TYPE (valist);
11697 if (have_va_type == error_mark_node)
11698 return GS_ERROR;
11699 have_va_type = targetm.canonical_va_list_type (have_va_type);
11701 if (have_va_type == NULL_TREE)
11703 error_at (loc, "first argument to %<va_arg%> not of type %<va_list%>");
11704 return GS_ERROR;
11707 /* Generate a diagnostic for requesting data of a type that cannot
11708 be passed through `...' due to type promotion at the call site. */
11709 if ((promoted_type = lang_hooks.types.type_promotes_to (type))
11710 != type)
11712 static bool gave_help;
11713 bool warned;
11714 /* Use the expansion point to handle cases such as passing bool (defined
11715 in a system header) through `...'. */
11716 source_location xloc
11717 = expansion_point_location_if_in_system_header (loc);
11719 /* Unfortunately, this is merely undefined, rather than a constraint
11720 violation, so we cannot make this an error. If this call is never
11721 executed, the program is still strictly conforming. */
11722 warned = warning_at (xloc, 0,
11723 "%qT is promoted to %qT when passed through %<...%>",
11724 type, promoted_type);
11725 if (!gave_help && warned)
11727 gave_help = true;
11728 inform (xloc, "(so you should pass %qT not %qT to %<va_arg%>)",
11729 promoted_type, type);
11732 /* We can, however, treat "undefined" any way we please.
11733 Call abort to encourage the user to fix the program. */
11734 if (warned)
11735 inform (xloc, "if this code is reached, the program will abort");
11736 /* Before the abort, allow the evaluation of the va_list
11737 expression to exit or longjmp. */
11738 gimplify_and_add (valist, pre_p);
11739 t = build_call_expr_loc (loc,
11740 builtin_decl_implicit (BUILT_IN_TRAP), 0);
11741 gimplify_and_add (t, pre_p);
11743 /* This is dead code, but go ahead and finish so that the
11744 mode of the result comes out right. */
11745 *expr_p = dummy_object (type);
11746 return GS_ALL_DONE;
11749 tag = build_int_cst (build_pointer_type (type), 0);
11750 aptag = build_int_cst (TREE_TYPE (valist), 0);
11752 *expr_p = build_call_expr_internal_loc (loc, IFN_VA_ARG, type, 3,
11753 valist, tag, aptag);
11755 /* Clear the tentatively set PROP_gimple_lva, to indicate that IFN_VA_ARG
11756 needs to be expanded. */
11757 cfun->curr_properties &= ~PROP_gimple_lva;
11759 return GS_OK;
11762 /* Build a new GIMPLE_ASSIGN tuple and append it to the end of *SEQ_P.
11764 DST/SRC are the destination and source respectively. You can pass
11765 ungimplified trees in DST or SRC, in which case they will be
11766 converted to a gimple operand if necessary.
11768 This function returns the newly created GIMPLE_ASSIGN tuple. */
11770 gimple *
11771 gimplify_assign (tree dst, tree src, gimple_seq *seq_p)
11773 tree t = build2 (MODIFY_EXPR, TREE_TYPE (dst), dst, src);
11774 gimplify_and_add (t, seq_p);
11775 ggc_free (t);
11776 return gimple_seq_last_stmt (*seq_p);
11779 inline hashval_t
11780 gimplify_hasher::hash (const elt_t *p)
11782 tree t = p->val;
11783 return iterative_hash_expr (t, 0);
11786 inline bool
11787 gimplify_hasher::equal (const elt_t *p1, const elt_t *p2)
11789 tree t1 = p1->val;
11790 tree t2 = p2->val;
11791 enum tree_code code = TREE_CODE (t1);
11793 if (TREE_CODE (t2) != code
11794 || TREE_TYPE (t1) != TREE_TYPE (t2))
11795 return false;
11797 if (!operand_equal_p (t1, t2, 0))
11798 return false;
11800 /* Only allow them to compare equal if they also hash equal; otherwise
11801 results are nondeterminate, and we fail bootstrap comparison. */
11802 gcc_checking_assert (hash (p1) == hash (p2));
11804 return true;