netinet{,6}: Assert in{,6}_inithead() are only used for system routing tables.
[dragonfly.git] / contrib / gcc-5.0 / gcc / c / c-decl.c
1 /* Process declarations and variables for C compiler.
2    Copyright (C) 1988-2015 Free Software Foundation, Inc.
3
4 This file is part of GCC.
5
6 GCC is free software; you can redistribute it and/or modify it under
7 the terms of the GNU General Public License as published by the Free
8 Software Foundation; either version 3, or (at your option) any later
9 version.
10
11 GCC is distributed in the hope that it will be useful, but WITHOUT ANY
12 WARRANTY; without even the implied warranty of MERCHANTABILITY or
13 FITNESS FOR A PARTICULAR PURPOSE.  See the GNU General Public License
14 for more details.
15
16 You should have received a copy of the GNU General Public License
17 along with GCC; see the file COPYING3.  If not see
18 <http://www.gnu.org/licenses/>.  */
19
20 /* Process declarations and symbol lookup for C front end.
21    Also constructs types; the standard scalar types at initialization,
22    and structure, union, array and enum types when they are declared.  */
23
24 /* ??? not all decl nodes are given the most useful possible
25    line numbers.  For example, the CONST_DECLs for enum values.  */
26
27 #include "config.h"
28 #include "system.h"
29 #include "coretypes.h"
30 #include "input.h"
31 #include "tm.h"
32 #include "intl.h"
33 #include "hash-set.h"
34 #include "vec.h"
35 #include "symtab.h"
36 #include "input.h"
37 #include "alias.h"
38 #include "double-int.h"
39 #include "machmode.h"
40 #include "inchash.h"
41 #include "tree.h"
42 #include "fold-const.h"
43 #include "print-tree.h"
44 #include "stor-layout.h"
45 #include "varasm.h"
46 #include "attribs.h"
47 #include "stringpool.h"
48 #include "tree-inline.h"
49 #include "flags.h"
50 #include "hashtab.h"
51 #include "hash-set.h"
52 #include "vec.h"
53 #include "machmode.h"
54 #include "hard-reg-set.h"
55 #include "function.h"
56 #include "c-tree.h"
57 #include "toplev.h"
58 #include "tm_p.h"
59 #include "cpplib.h"
60 #include "target.h"
61 #include "debug.h"
62 #include "opts.h"
63 #include "timevar.h"
64 #include "c-family/c-common.h"
65 #include "c-family/c-objc.h"
66 #include "c-family/c-pragma.h"
67 #include "c-family/c-ubsan.h"
68 #include "c-lang.h"
69 #include "langhooks.h"
70 #include "tree-iterator.h"
71 #include "diagnostic-core.h"
72 #include "dumpfile.h"
73 #include "hash-map.h"
74 #include "is-a.h"
75 #include "plugin-api.h"
76 #include "ipa-ref.h"
77 #include "cgraph.h"
78 #include "hash-table.h"
79 #include "langhooks-def.h"
80 #include "plugin.h"
81 #include "c-family/c-ada-spec.h"
82 #include "cilk.h"
83 #include "builtins.h"
84
85 /* In grokdeclarator, distinguish syntactic contexts of declarators.  */
86 enum decl_context
87 { NORMAL,                       /* Ordinary declaration */
88   FUNCDEF,                      /* Function definition */
89   PARM,                         /* Declaration of parm before function body */
90   FIELD,                        /* Declaration inside struct or union */
91   TYPENAME};                    /* Typename (inside cast or sizeof)  */
92
93 /* States indicating how grokdeclarator() should handle declspecs marked
94    with __attribute__((deprecated)).  An object declared as
95    __attribute__((deprecated)) suppresses warnings of uses of other
96    deprecated items.  */
97
98 enum deprecated_states {
99   DEPRECATED_NORMAL,
100   DEPRECATED_SUPPRESS
101 };
102
103 \f
104 /* Nonzero if we have seen an invalid cross reference
105    to a struct, union, or enum, but not yet printed the message.  */
106 tree pending_invalid_xref;
107
108 /* File and line to appear in the eventual error message.  */
109 location_t pending_invalid_xref_location;
110
111 /* The file and line that the prototype came from if this is an
112    old-style definition; used for diagnostics in
113    store_parm_decls_oldstyle.  */
114
115 static location_t current_function_prototype_locus;
116
117 /* Whether this prototype was built-in.  */
118
119 static bool current_function_prototype_built_in;
120
121 /* The argument type information of this prototype.  */
122
123 static tree current_function_prototype_arg_types;
124
125 /* The argument information structure for the function currently being
126    defined.  */
127
128 static struct c_arg_info *current_function_arg_info;
129
130 /* The obstack on which parser and related data structures, which are
131    not live beyond their top-level declaration or definition, are
132    allocated.  */
133 struct obstack parser_obstack;
134
135 /* The current statement tree.  */
136
137 static GTY(()) struct stmt_tree_s c_stmt_tree;
138
139 /* State saving variables.  */
140 tree c_break_label;
141 tree c_cont_label;
142
143 /* A list of decls to be made automatically visible in each file scope.  */
144 static GTY(()) tree visible_builtins;
145
146 /* Set to 0 at beginning of a function definition, set to 1 if
147    a return statement that specifies a return value is seen.  */
148
149 int current_function_returns_value;
150
151 /* Set to 0 at beginning of a function definition, set to 1 if
152    a return statement with no argument is seen.  */
153
154 int current_function_returns_null;
155
156 /* Set to 0 at beginning of a function definition, set to 1 if
157    a call to a noreturn function is seen.  */
158
159 int current_function_returns_abnormally;
160
161 /* Set to nonzero by `grokdeclarator' for a function
162    whose return type is defaulted, if warnings for this are desired.  */
163
164 static int warn_about_return_type;
165
166 /* Nonzero when the current toplevel function contains a declaration
167    of a nested function which is never defined.  */
168
169 static bool undef_nested_function;
170
171 /* If non-zero, implicit "omp declare target" attribute is added into the
172    attribute lists.  */
173 int current_omp_declare_target_attribute;
174 \f
175 /* Each c_binding structure describes one binding of an identifier to
176    a decl.  All the decls in a scope - irrespective of namespace - are
177    chained together by the ->prev field, which (as the name implies)
178    runs in reverse order.  All the decls in a given namespace bound to
179    a given identifier are chained by the ->shadowed field, which runs
180    from inner to outer scopes.
181
182    The ->decl field usually points to a DECL node, but there are two
183    exceptions.  In the namespace of type tags, the bound entity is a
184    RECORD_TYPE, UNION_TYPE, or ENUMERAL_TYPE node.  If an undeclared
185    identifier is encountered, it is bound to error_mark_node to
186    suppress further errors about that identifier in the current
187    function.
188
189    The ->u.type field stores the type of the declaration in this scope;
190    if NULL, the type is the type of the ->decl field.  This is only of
191    relevance for objects with external or internal linkage which may
192    be redeclared in inner scopes, forming composite types that only
193    persist for the duration of those scopes.  In the external scope,
194    this stores the composite of all the types declared for this
195    object, visible or not.  The ->inner_comp field (used only at file
196    scope) stores whether an incomplete array type at file scope was
197    completed at an inner scope to an array size other than 1.
198
199    The ->u.label field is used for labels.  It points to a structure
200    which stores additional information used for warnings.
201
202    The depth field is copied from the scope structure that holds this
203    decl.  It is used to preserve the proper ordering of the ->shadowed
204    field (see bind()) and also for a handful of special-case checks.
205    Finally, the invisible bit is true for a decl which should be
206    ignored for purposes of normal name lookup, and the nested bit is
207    true for a decl that's been bound a second time in an inner scope;
208    in all such cases, the binding in the outer scope will have its
209    invisible bit true.  */
210
211 struct GTY((chain_next ("%h.prev"))) c_binding {
212   union GTY(()) {               /* first so GTY desc can use decl */
213     tree GTY((tag ("0"))) type; /* the type in this scope */
214     struct c_label_vars * GTY((tag ("1"))) label; /* for warnings */
215   } GTY((desc ("TREE_CODE (%0.decl) == LABEL_DECL"))) u;
216   tree decl;                    /* the decl bound */
217   tree id;                      /* the identifier it's bound to */
218   struct c_binding *prev;       /* the previous decl in this scope */
219   struct c_binding *shadowed;   /* the innermost decl shadowed by this one */
220   unsigned int depth : 28;      /* depth of this scope */
221   BOOL_BITFIELD invisible : 1;  /* normal lookup should ignore this binding */
222   BOOL_BITFIELD nested : 1;     /* do not set DECL_CONTEXT when popping */
223   BOOL_BITFIELD inner_comp : 1; /* incomplete array completed in inner scope */
224   BOOL_BITFIELD in_struct : 1;  /* currently defined as struct field */
225   location_t locus;             /* location for nested bindings */
226 };
227 #define B_IN_SCOPE(b1, b2) ((b1)->depth == (b2)->depth)
228 #define B_IN_CURRENT_SCOPE(b) ((b)->depth == current_scope->depth)
229 #define B_IN_FILE_SCOPE(b) ((b)->depth == 1 /*file_scope->depth*/)
230 #define B_IN_EXTERNAL_SCOPE(b) ((b)->depth == 0 /*external_scope->depth*/)
231
232 /* Each C symbol points to three linked lists of c_binding structures.
233    These describe the values of the identifier in the three different
234    namespaces defined by the language.  */
235
236 struct GTY(()) lang_identifier {
237   struct c_common_identifier common_id;
238   struct c_binding *symbol_binding; /* vars, funcs, constants, typedefs */
239   struct c_binding *tag_binding;    /* struct/union/enum tags */
240   struct c_binding *label_binding;  /* labels */
241 };
242
243 /* Validate c-lang.c's assumptions.  */
244 extern char C_SIZEOF_STRUCT_LANG_IDENTIFIER_isnt_accurate
245 [(sizeof(struct lang_identifier) == C_SIZEOF_STRUCT_LANG_IDENTIFIER) ? 1 : -1];
246
247 /* The binding oracle; see c-tree.h.  */
248 void (*c_binding_oracle) (enum c_oracle_request, tree identifier);
249
250 /* This flag is set on an identifier if we have previously asked the
251    binding oracle for this identifier's symbol binding.  */
252 #define I_SYMBOL_CHECKED(node) \
253   (TREE_LANG_FLAG_4 (IDENTIFIER_NODE_CHECK (node)))
254
255 static inline struct c_binding* *
256 i_symbol_binding (tree node)
257 {
258   struct lang_identifier *lid
259     = (struct lang_identifier *) IDENTIFIER_NODE_CHECK (node);
260
261   if (lid->symbol_binding == NULL
262       && c_binding_oracle != NULL
263       && !I_SYMBOL_CHECKED (node))
264     {
265       /* Set the "checked" flag first, to avoid infinite recursion
266          when the binding oracle calls back into gcc.  */
267       I_SYMBOL_CHECKED (node) = 1;
268       c_binding_oracle (C_ORACLE_SYMBOL, node);
269     }
270
271   return &lid->symbol_binding;
272 }
273
274 #define I_SYMBOL_BINDING(node) (*i_symbol_binding (node))
275
276 #define I_SYMBOL_DECL(node) \
277  (I_SYMBOL_BINDING(node) ? I_SYMBOL_BINDING(node)->decl : 0)
278
279 /* This flag is set on an identifier if we have previously asked the
280    binding oracle for this identifier's tag binding.  */
281 #define I_TAG_CHECKED(node) \
282   (TREE_LANG_FLAG_5 (IDENTIFIER_NODE_CHECK (node)))
283
284 static inline struct c_binding **
285 i_tag_binding (tree node)
286 {
287   struct lang_identifier *lid
288     = (struct lang_identifier *) IDENTIFIER_NODE_CHECK (node);
289
290   if (lid->tag_binding == NULL
291       && c_binding_oracle != NULL
292       && !I_TAG_CHECKED (node))
293     {
294       /* Set the "checked" flag first, to avoid infinite recursion
295          when the binding oracle calls back into gcc.  */
296       I_TAG_CHECKED (node) = 1;
297       c_binding_oracle (C_ORACLE_TAG, node);
298     }
299
300   return &lid->tag_binding;
301 }
302
303 #define I_TAG_BINDING(node) (*i_tag_binding (node))
304
305 #define I_TAG_DECL(node) \
306  (I_TAG_BINDING(node) ? I_TAG_BINDING(node)->decl : 0)
307
308 /* This flag is set on an identifier if we have previously asked the
309    binding oracle for this identifier's label binding.  */
310 #define I_LABEL_CHECKED(node) \
311   (TREE_LANG_FLAG_6 (IDENTIFIER_NODE_CHECK (node)))
312
313 static inline struct c_binding **
314 i_label_binding (tree node)
315 {
316   struct lang_identifier *lid
317     = (struct lang_identifier *) IDENTIFIER_NODE_CHECK (node);
318
319   if (lid->label_binding == NULL
320       && c_binding_oracle != NULL
321       && !I_LABEL_CHECKED (node))
322     {
323       /* Set the "checked" flag first, to avoid infinite recursion
324          when the binding oracle calls back into gcc.  */
325       I_LABEL_CHECKED (node) = 1;
326       c_binding_oracle (C_ORACLE_LABEL, node);
327     }
328
329   return &lid->label_binding;
330 }
331
332 #define I_LABEL_BINDING(node) (*i_label_binding (node))
333
334 #define I_LABEL_DECL(node) \
335  (I_LABEL_BINDING(node) ? I_LABEL_BINDING(node)->decl : 0)
336
337 /* The resulting tree type.  */
338
339 union GTY((desc ("TREE_CODE (&%h.generic) == IDENTIFIER_NODE"),
340        chain_next ("(union lang_tree_node *) c_tree_chain_next (&%h.generic)"))) lang_tree_node
341  {
342   union tree_node GTY ((tag ("0"),
343                         desc ("tree_node_structure (&%h)")))
344     generic;
345   struct lang_identifier GTY ((tag ("1"))) identifier;
346 };
347
348 /* Track bindings and other things that matter for goto warnings.  For
349    efficiency, we do not gather all the decls at the point of
350    definition.  Instead, we point into the bindings structure.  As
351    scopes are popped, we update these structures and gather the decls
352    that matter at that time.  */
353
354 struct GTY(()) c_spot_bindings {
355   /* The currently open scope which holds bindings defined when the
356      label was defined or the goto statement was found.  */
357   struct c_scope *scope;
358   /* The bindings in the scope field which were defined at the point
359      of the label or goto.  This lets us look at older or newer
360      bindings in the scope, as appropriate.  */
361   struct c_binding *bindings_in_scope;
362   /* The number of statement expressions that have started since this
363      label or goto statement was defined.  This is zero if we are at
364      the same statement expression level.  It is positive if we are in
365      a statement expression started since this spot.  It is negative
366      if this spot was in a statement expression and we have left
367      it.  */
368   int stmt_exprs;
369   /* Whether we started in a statement expression but are no longer in
370      it.  This is set to true if stmt_exprs ever goes negative.  */
371   bool left_stmt_expr;
372 };
373
374 /* This structure is used to keep track of bindings seen when a goto
375    statement is defined.  This is only used if we see the goto
376    statement before we see the label.  */
377
378 struct GTY(()) c_goto_bindings {
379   /* The location of the goto statement.  */
380   location_t loc;
381   /* The bindings of the goto statement.  */
382   struct c_spot_bindings goto_bindings;
383 };
384
385 typedef struct c_goto_bindings *c_goto_bindings_p;
386
387 /* The additional information we keep track of for a label binding.
388    These fields are updated as scopes are popped.  */
389
390 struct GTY(()) c_label_vars {
391   /* The shadowed c_label_vars, when one label shadows another (which
392      can only happen using a __label__ declaration).  */
393   struct c_label_vars *shadowed;
394   /* The bindings when the label was defined.  */
395   struct c_spot_bindings label_bindings;
396   /* A list of decls that we care about: decls about which we should
397      warn if a goto branches to this label from later in the function.
398      Decls are added to this list as scopes are popped.  We only add
399      the decls that matter.  */
400   vec<tree, va_gc> *decls_in_scope;
401   /* A list of goto statements to this label.  This is only used for
402      goto statements seen before the label was defined, so that we can
403      issue appropriate warnings for them.  */
404   vec<c_goto_bindings_p, va_gc> *gotos;
405 };
406
407 /* Each c_scope structure describes the complete contents of one
408    scope.  Four scopes are distinguished specially: the innermost or
409    current scope, the innermost function scope, the file scope (always
410    the second to outermost) and the outermost or external scope.
411
412    Most declarations are recorded in the current scope.
413
414    All normal label declarations are recorded in the innermost
415    function scope, as are bindings of undeclared identifiers to
416    error_mark_node.  (GCC permits nested functions as an extension,
417    hence the 'innermost' qualifier.)  Explicitly declared labels
418    (using the __label__ extension) appear in the current scope.
419
420    Being in the file scope (current_scope == file_scope) causes
421    special behavior in several places below.  Also, under some
422    conditions the Objective-C front end records declarations in the
423    file scope even though that isn't the current scope.
424
425    All declarations with external linkage are recorded in the external
426    scope, even if they aren't visible there; this models the fact that
427    such declarations are visible to the entire program, and (with a
428    bit of cleverness, see pushdecl) allows diagnosis of some violations
429    of C99 6.2.2p7 and 6.2.7p2:
430
431      If, within the same translation unit, the same identifier appears
432      with both internal and external linkage, the behavior is
433      undefined.
434
435      All declarations that refer to the same object or function shall
436      have compatible type; otherwise, the behavior is undefined.
437
438    Initially only the built-in declarations, which describe compiler
439    intrinsic functions plus a subset of the standard library, are in
440    this scope.
441
442    The order of the blocks list matters, and it is frequently appended
443    to.  To avoid having to walk all the way to the end of the list on
444    each insertion, or reverse the list later, we maintain a pointer to
445    the last list entry.  (FIXME: It should be feasible to use a reversed
446    list here.)
447
448    The bindings list is strictly in reverse order of declarations;
449    pop_scope relies on this.  */
450
451
452 struct GTY((chain_next ("%h.outer"))) c_scope {
453   /* The scope containing this one.  */
454   struct c_scope *outer;
455
456   /* The next outermost function scope.  */
457   struct c_scope *outer_function;
458
459   /* All bindings in this scope.  */
460   struct c_binding *bindings;
461
462   /* For each scope (except the global one), a chain of BLOCK nodes
463      for all the scopes that were entered and exited one level down.  */
464   tree blocks;
465   tree blocks_last;
466
467   /* The depth of this scope.  Used to keep the ->shadowed chain of
468      bindings sorted innermost to outermost.  */
469   unsigned int depth : 28;
470
471   /* True if we are currently filling this scope with parameter
472      declarations.  */
473   BOOL_BITFIELD parm_flag : 1;
474
475   /* True if we saw [*] in this scope.  Used to give an error messages
476      if these appears in a function definition.  */
477   BOOL_BITFIELD had_vla_unspec : 1;
478
479   /* True if we already complained about forward parameter decls
480      in this scope.  This prevents double warnings on
481      foo (int a; int b; ...)  */
482   BOOL_BITFIELD warned_forward_parm_decls : 1;
483
484   /* True if this is the outermost block scope of a function body.
485      This scope contains the parameters, the local variables declared
486      in the outermost block, and all the labels (except those in
487      nested functions, or declared at block scope with __label__).  */
488   BOOL_BITFIELD function_body : 1;
489
490   /* True means make a BLOCK for this scope no matter what.  */
491   BOOL_BITFIELD keep : 1;
492
493   /* True means that an unsuffixed float constant is _Decimal64.  */
494   BOOL_BITFIELD float_const_decimal64 : 1;
495
496   /* True if this scope has any label bindings.  This is used to speed
497      up searching for labels when popping scopes, particularly since
498      labels are normally only found at function scope.  */
499   BOOL_BITFIELD has_label_bindings : 1;
500
501   /* True if we should issue a warning if a goto statement crosses any
502      of the bindings.  We still need to check the list of bindings to
503      find the specific ones we need to warn about.  This is true if
504      decl_jump_unsafe would return true for any of the bindings.  This
505      is used to avoid looping over all the bindings unnecessarily.  */
506   BOOL_BITFIELD has_jump_unsafe_decl : 1;
507 };
508
509 /* The scope currently in effect.  */
510
511 static GTY(()) struct c_scope *current_scope;
512
513 /* The innermost function scope.  Ordinary (not explicitly declared)
514    labels, bindings to error_mark_node, and the lazily-created
515    bindings of __func__ and its friends get this scope.  */
516
517 static GTY(()) struct c_scope *current_function_scope;
518
519 /* The C file scope.  This is reset for each input translation unit.  */
520
521 static GTY(()) struct c_scope *file_scope;
522
523 /* The outermost scope.  This is used for all declarations with
524    external linkage, and only these, hence the name.  */
525
526 static GTY(()) struct c_scope *external_scope;
527
528 /* A chain of c_scope structures awaiting reuse.  */
529
530 static GTY((deletable)) struct c_scope *scope_freelist;
531
532 /* A chain of c_binding structures awaiting reuse.  */
533
534 static GTY((deletable)) struct c_binding *binding_freelist;
535
536 /* Append VAR to LIST in scope SCOPE.  */
537 #define SCOPE_LIST_APPEND(scope, list, decl) do {       \
538   struct c_scope *s_ = (scope);                         \
539   tree d_ = (decl);                                     \
540   if (s_->list##_last)                                  \
541     BLOCK_CHAIN (s_->list##_last) = d_;                 \
542   else                                                  \
543     s_->list = d_;                                      \
544   s_->list##_last = d_;                                 \
545 } while (0)
546
547 /* Concatenate FROM in scope FSCOPE onto TO in scope TSCOPE.  */
548 #define SCOPE_LIST_CONCAT(tscope, to, fscope, from) do {        \
549   struct c_scope *t_ = (tscope);                                \
550   struct c_scope *f_ = (fscope);                                \
551   if (t_->to##_last)                                            \
552     BLOCK_CHAIN (t_->to##_last) = f_->from;                     \
553   else                                                          \
554     t_->to = f_->from;                                          \
555   t_->to##_last = f_->from##_last;                              \
556 } while (0)
557
558 /* A c_inline_static structure stores details of a static identifier
559    referenced in a definition of a function that may be an inline
560    definition if no subsequent declaration of that function uses
561    "extern" or does not use "inline".  */
562
563 struct GTY((chain_next ("%h.next"))) c_inline_static {
564   /* The location for a diagnostic.  */
565   location_t location;
566
567   /* The function that may be an inline definition.  */
568   tree function;
569
570   /* The object or function referenced.  */
571   tree static_decl;
572
573   /* What sort of reference this is.  */
574   enum c_inline_static_type type;
575
576   /* The next such structure or NULL.  */
577   struct c_inline_static *next;
578 };
579
580 /* List of static identifiers used or referenced in functions that may
581    be inline definitions.  */
582 static GTY(()) struct c_inline_static *c_inline_statics;
583
584 /* True means unconditionally make a BLOCK for the next scope pushed.  */
585
586 static bool keep_next_level_flag;
587
588 /* True means the next call to push_scope will be the outermost scope
589    of a function body, so do not push a new scope, merely cease
590    expecting parameter decls.  */
591
592 static bool next_is_function_body;
593
594 /* A vector of pointers to c_binding structures.  */
595
596 typedef struct c_binding *c_binding_ptr;
597
598 /* Information that we keep for a struct or union while it is being
599    parsed.  */
600
601 struct c_struct_parse_info
602 {
603   /* If warn_cxx_compat, a list of types defined within this
604      struct.  */
605   vec<tree> struct_types;
606   /* If warn_cxx_compat, a list of field names which have bindings,
607      and which are defined in this struct, but which are not defined
608      in any enclosing struct.  This is used to clear the in_struct
609      field of the c_bindings structure.  */
610   vec<c_binding_ptr> fields;
611   /* If warn_cxx_compat, a list of typedef names used when defining
612      fields in this struct.  */
613   vec<tree> typedefs_seen;
614 };
615
616 /* Information for the struct or union currently being parsed, or
617    NULL if not parsing a struct or union.  */
618 static struct c_struct_parse_info *struct_parse_info;
619
620 /* Forward declarations.  */
621 static tree lookup_name_in_scope (tree, struct c_scope *);
622 static tree c_make_fname_decl (location_t, tree, int);
623 static tree grokdeclarator (const struct c_declarator *,
624                             struct c_declspecs *,
625                             enum decl_context, bool, tree *, tree *, tree *,
626                             bool *, enum deprecated_states);
627 static tree grokparms (struct c_arg_info *, bool);
628 static void layout_array_type (tree);
629 static void warn_defaults_to (location_t, int, const char *, ...)
630     ATTRIBUTE_GCC_DIAG(3,4);
631 \f
632 /* T is a statement.  Add it to the statement-tree.  This is the
633    C/ObjC version--C++ has a slightly different version of this
634    function.  */
635
636 tree
637 add_stmt (tree t)
638 {
639   enum tree_code code = TREE_CODE (t);
640
641   if (CAN_HAVE_LOCATION_P (t) && code != LABEL_EXPR)
642     {
643       if (!EXPR_HAS_LOCATION (t))
644         SET_EXPR_LOCATION (t, input_location);
645     }
646
647   if (code == LABEL_EXPR || code == CASE_LABEL_EXPR)
648     STATEMENT_LIST_HAS_LABEL (cur_stmt_list) = 1;
649
650   /* Add T to the statement-tree.  Non-side-effect statements need to be
651      recorded during statement expressions.  */
652   if (!building_stmt_list_p ())
653     push_stmt_list ();
654   append_to_statement_list_force (t, &cur_stmt_list);
655
656   return t;
657 }
658 \f
659 /* Build a pointer type using the default pointer mode.  */
660
661 static tree
662 c_build_pointer_type (tree to_type)
663 {
664   addr_space_t as = to_type == error_mark_node? ADDR_SPACE_GENERIC
665                                               : TYPE_ADDR_SPACE (to_type);
666   machine_mode pointer_mode;
667
668   if (as != ADDR_SPACE_GENERIC || c_default_pointer_mode == VOIDmode)
669     pointer_mode = targetm.addr_space.pointer_mode (as);
670   else
671     pointer_mode = c_default_pointer_mode;
672   return build_pointer_type_for_mode (to_type, pointer_mode, false);
673 }
674
675 \f
676 /* Return true if we will want to say something if a goto statement
677    crosses DECL.  */
678
679 static bool
680 decl_jump_unsafe (tree decl)
681 {
682   if (error_operand_p (decl))
683     return false;
684
685   /* Always warn about crossing variably modified types.  */
686   if ((TREE_CODE (decl) == VAR_DECL || TREE_CODE (decl) == TYPE_DECL)
687       && variably_modified_type_p (TREE_TYPE (decl), NULL_TREE))
688     return true;
689
690   /* Otherwise, only warn if -Wgoto-misses-init and this is an
691      initialized automatic decl.  */
692   if (warn_jump_misses_init
693       && TREE_CODE (decl) == VAR_DECL
694       && !TREE_STATIC (decl)
695       && DECL_INITIAL (decl) != NULL_TREE)
696     return true;
697
698   return false;
699 }
700 \f
701
702 void
703 c_print_identifier (FILE *file, tree node, int indent)
704 {
705   void (*save) (enum c_oracle_request, tree identifier);
706
707   /* Temporarily hide any binding oracle.  Without this, calls to
708      debug_tree from the debugger will end up calling into the oracle,
709      making for a confusing debug session.  As the oracle isn't needed
710      here for normal operation, it's simplest to suppress it.  */
711   save = c_binding_oracle;
712   c_binding_oracle = NULL;
713
714   print_node (file, "symbol", I_SYMBOL_DECL (node), indent + 4);
715   print_node (file, "tag", I_TAG_DECL (node), indent + 4);
716   print_node (file, "label", I_LABEL_DECL (node), indent + 4);
717   if (C_IS_RESERVED_WORD (node) && C_RID_CODE (node) != RID_CXX_COMPAT_WARN)
718     {
719       tree rid = ridpointers[C_RID_CODE (node)];
720       indent_to (file, indent + 4);
721       fprintf (file, "rid " HOST_PTR_PRINTF " \"%s\"",
722                (void *) rid, IDENTIFIER_POINTER (rid));
723     }
724
725   c_binding_oracle = save;
726 }
727
728 /* Establish a binding between NAME, an IDENTIFIER_NODE, and DECL,
729    which may be any of several kinds of DECL or TYPE or error_mark_node,
730    in the scope SCOPE.  */
731 static void
732 bind (tree name, tree decl, struct c_scope *scope, bool invisible,
733       bool nested, location_t locus)
734 {
735   struct c_binding *b, **here;
736
737   if (binding_freelist)
738     {
739       b = binding_freelist;
740       binding_freelist = b->prev;
741     }
742   else
743     b = ggc_alloc<c_binding> ();
744
745   b->shadowed = 0;
746   b->decl = decl;
747   b->id = name;
748   b->depth = scope->depth;
749   b->invisible = invisible;
750   b->nested = nested;
751   b->inner_comp = 0;
752   b->in_struct = 0;
753   b->locus = locus;
754
755   b->u.type = NULL;
756
757   b->prev = scope->bindings;
758   scope->bindings = b;
759
760   if (decl_jump_unsafe (decl))
761     scope->has_jump_unsafe_decl = 1;
762
763   if (!name)
764     return;
765
766   switch (TREE_CODE (decl))
767     {
768     case LABEL_DECL:     here = &I_LABEL_BINDING (name);   break;
769     case ENUMERAL_TYPE:
770     case UNION_TYPE:
771     case RECORD_TYPE:    here = &I_TAG_BINDING (name);     break;
772     case VAR_DECL:
773     case FUNCTION_DECL:
774     case TYPE_DECL:
775     case CONST_DECL:
776     case PARM_DECL:
777     case ERROR_MARK:     here = &I_SYMBOL_BINDING (name);  break;
778
779     default:
780       gcc_unreachable ();
781     }
782
783   /* Locate the appropriate place in the chain of shadowed decls
784      to insert this binding.  Normally, scope == current_scope and
785      this does nothing.  */
786   while (*here && (*here)->depth > scope->depth)
787     here = &(*here)->shadowed;
788
789   b->shadowed = *here;
790   *here = b;
791 }
792
793 /* Clear the binding structure B, stick it on the binding_freelist,
794    and return the former value of b->prev.  This is used by pop_scope
795    and get_parm_info to iterate destructively over all the bindings
796    from a given scope.  */
797 static struct c_binding *
798 free_binding_and_advance (struct c_binding *b)
799 {
800   struct c_binding *prev = b->prev;
801
802   memset (b, 0, sizeof (struct c_binding));
803   b->prev = binding_freelist;
804   binding_freelist = b;
805
806   return prev;
807 }
808
809 /* Bind a label.  Like bind, but skip fields which aren't used for
810    labels, and add the LABEL_VARS value.  */
811 static void
812 bind_label (tree name, tree label, struct c_scope *scope,
813             struct c_label_vars *label_vars)
814 {
815   struct c_binding *b;
816
817   bind (name, label, scope, /*invisible=*/false, /*nested=*/false,
818         UNKNOWN_LOCATION);
819
820   scope->has_label_bindings = true;
821
822   b = scope->bindings;
823   gcc_assert (b->decl == label);
824   label_vars->shadowed = b->u.label;
825   b->u.label = label_vars;
826 }
827 \f
828 /* Hook called at end of compilation to assume 1 elt
829    for a file-scope tentative array defn that wasn't complete before.  */
830
831 void
832 c_finish_incomplete_decl (tree decl)
833 {
834   if (TREE_CODE (decl) == VAR_DECL)
835     {
836       tree type = TREE_TYPE (decl);
837       if (type != error_mark_node
838           && TREE_CODE (type) == ARRAY_TYPE
839           && !DECL_EXTERNAL (decl)
840           && TYPE_DOMAIN (type) == 0)
841         {
842           warning_at (DECL_SOURCE_LOCATION (decl),
843                       0, "array %q+D assumed to have one element", decl);
844
845           complete_array_type (&TREE_TYPE (decl), NULL_TREE, true);
846
847           relayout_decl (decl);
848         }
849     }
850 }
851 \f
852 /* Record that inline function FUNC contains a reference (location
853    LOC) to static DECL (file-scope or function-local according to
854    TYPE).  */
855
856 void
857 record_inline_static (location_t loc, tree func, tree decl,
858                       enum c_inline_static_type type)
859 {
860   c_inline_static *csi = ggc_alloc<c_inline_static> ();
861   csi->location = loc;
862   csi->function = func;
863   csi->static_decl = decl;
864   csi->type = type;
865   csi->next = c_inline_statics;
866   c_inline_statics = csi;
867 }
868
869 /* Check for references to static declarations in inline functions at
870    the end of the translation unit and diagnose them if the functions
871    are still inline definitions.  */
872
873 static void
874 check_inline_statics (void)
875 {
876   struct c_inline_static *csi;
877   for (csi = c_inline_statics; csi; csi = csi->next)
878     {
879       if (DECL_EXTERNAL (csi->function))
880         switch (csi->type)
881           {
882           case csi_internal:
883             pedwarn (csi->location, 0,
884                      "%qD is static but used in inline function %qD "
885                      "which is not static", csi->static_decl, csi->function);
886             break;
887           case csi_modifiable:
888             pedwarn (csi->location, 0,
889                      "%q+D is static but declared in inline function %qD "
890                      "which is not static", csi->static_decl, csi->function);
891             break;
892           default:
893             gcc_unreachable ();
894           }
895     }
896   c_inline_statics = NULL;
897 }
898 \f
899 /* Fill in a c_spot_bindings structure.  If DEFINING is true, set it
900    for the current state, otherwise set it to uninitialized.  */
901
902 static void
903 set_spot_bindings (struct c_spot_bindings *p, bool defining)
904 {
905   if (defining)
906     {
907       p->scope = current_scope;
908       p->bindings_in_scope = current_scope->bindings;
909     }
910   else
911     {
912       p->scope = NULL;
913       p->bindings_in_scope = NULL;
914     }
915   p->stmt_exprs = 0;
916   p->left_stmt_expr = false;
917 }
918
919 /* Update spot bindings P as we pop out of SCOPE.  Return true if we
920    should push decls for a label.  */
921
922 static bool
923 update_spot_bindings (struct c_scope *scope, struct c_spot_bindings *p)
924 {
925   if (p->scope != scope)
926     {
927       /* This label or goto is defined in some other scope, or it is a
928          label which is not yet defined.  There is nothing to
929          update.  */
930       return false;
931     }
932
933   /* Adjust the spot bindings to refer to the bindings already defined
934      in the enclosing scope.  */
935   p->scope = scope->outer;
936   p->bindings_in_scope = p->scope->bindings;
937
938   return true;
939 }
940 \f
941 /* The Objective-C front-end often needs to determine the current scope.  */
942
943 void *
944 objc_get_current_scope (void)
945 {
946   return current_scope;
947 }
948
949 /* The following function is used only by Objective-C.  It needs to live here
950    because it accesses the innards of c_scope.  */
951
952 void
953 objc_mark_locals_volatile (void *enclosing_blk)
954 {
955   struct c_scope *scope;
956   struct c_binding *b;
957
958   for (scope = current_scope;
959        scope && scope != enclosing_blk;
960        scope = scope->outer)
961     {
962       for (b = scope->bindings; b; b = b->prev)
963         objc_volatilize_decl (b->decl);
964
965       /* Do not climb up past the current function.  */
966       if (scope->function_body)
967         break;
968     }
969 }
970
971 /* Return true if we are in the global binding level.  */
972
973 bool
974 global_bindings_p (void)
975 {
976   return current_scope == file_scope;
977 }
978
979 void
980 keep_next_level (void)
981 {
982   keep_next_level_flag = true;
983 }
984
985 /* Set the flag for the FLOAT_CONST_DECIMAL64 pragma being ON.  */
986
987 void
988 set_float_const_decimal64 (void)
989 {
990   current_scope->float_const_decimal64 = true;
991 }
992
993 /* Clear the flag for the FLOAT_CONST_DECIMAL64 pragma.  */
994
995 void
996 clear_float_const_decimal64 (void)
997 {
998   current_scope->float_const_decimal64 = false;
999 }
1000
1001 /* Return nonzero if an unsuffixed float constant is _Decimal64.  */
1002
1003 bool
1004 float_const_decimal64_p (void)
1005 {
1006   return current_scope->float_const_decimal64;
1007 }
1008
1009 /* Identify this scope as currently being filled with parameters.  */
1010
1011 void
1012 declare_parm_level (void)
1013 {
1014   current_scope->parm_flag = true;
1015 }
1016
1017 void
1018 push_scope (void)
1019 {
1020   if (next_is_function_body)
1021     {
1022       /* This is the transition from the parameters to the top level
1023          of the function body.  These are the same scope
1024          (C99 6.2.1p4,6) so we do not push another scope structure.
1025          next_is_function_body is set only by store_parm_decls, which
1026          in turn is called when and only when we are about to
1027          encounter the opening curly brace for the function body.
1028
1029          The outermost block of a function always gets a BLOCK node,
1030          because the debugging output routines expect that each
1031          function has at least one BLOCK.  */
1032       current_scope->parm_flag         = false;
1033       current_scope->function_body     = true;
1034       current_scope->keep              = true;
1035       current_scope->outer_function    = current_function_scope;
1036       current_function_scope           = current_scope;
1037
1038       keep_next_level_flag = false;
1039       next_is_function_body = false;
1040
1041       /* The FLOAT_CONST_DECIMAL64 pragma applies to nested scopes.  */
1042       if (current_scope->outer)
1043         current_scope->float_const_decimal64
1044           = current_scope->outer->float_const_decimal64;
1045       else
1046         current_scope->float_const_decimal64 = false;
1047     }
1048   else
1049     {
1050       struct c_scope *scope;
1051       if (scope_freelist)
1052         {
1053           scope = scope_freelist;
1054           scope_freelist = scope->outer;
1055         }
1056       else
1057         scope = ggc_cleared_alloc<c_scope> ();
1058
1059       /* The FLOAT_CONST_DECIMAL64 pragma applies to nested scopes.  */
1060       if (current_scope)
1061         scope->float_const_decimal64 = current_scope->float_const_decimal64;
1062       else
1063         scope->float_const_decimal64 = false;
1064
1065       scope->keep          = keep_next_level_flag;
1066       scope->outer         = current_scope;
1067       scope->depth         = current_scope ? (current_scope->depth + 1) : 0;
1068
1069       /* Check for scope depth overflow.  Unlikely (2^28 == 268,435,456) but
1070          possible.  */
1071       if (current_scope && scope->depth == 0)
1072         {
1073           scope->depth--;
1074           sorry ("GCC supports only %u nested scopes", scope->depth);
1075         }
1076
1077       current_scope        = scope;
1078       keep_next_level_flag = false;
1079     }
1080 }
1081
1082 /* This is called when we are leaving SCOPE.  For each label defined
1083    in SCOPE, add any appropriate decls to its decls_in_scope fields.
1084    These are the decls whose initialization will be skipped by a goto
1085    later in the function.  */
1086
1087 static void
1088 update_label_decls (struct c_scope *scope)
1089 {
1090   struct c_scope *s;
1091
1092   s = scope;
1093   while (s != NULL)
1094     {
1095       if (s->has_label_bindings)
1096         {
1097           struct c_binding *b;
1098
1099           for (b = s->bindings; b != NULL; b = b->prev)
1100             {
1101               struct c_label_vars *label_vars;
1102               struct c_binding *b1;
1103               bool hjud;
1104               unsigned int ix;
1105               struct c_goto_bindings *g;
1106
1107               if (TREE_CODE (b->decl) != LABEL_DECL)
1108                 continue;
1109               label_vars = b->u.label;
1110
1111               b1 = label_vars->label_bindings.bindings_in_scope;
1112               if (label_vars->label_bindings.scope == NULL)
1113                 hjud = false;
1114               else
1115                 hjud = label_vars->label_bindings.scope->has_jump_unsafe_decl;
1116               if (update_spot_bindings (scope, &label_vars->label_bindings))
1117                 {
1118                   /* This label is defined in this scope.  */
1119                   if (hjud)
1120                     {
1121                       for (; b1 != NULL; b1 = b1->prev)
1122                         {
1123                           /* A goto from later in the function to this
1124                              label will never see the initialization
1125                              of B1, if any.  Save it to issue a
1126                              warning if needed.  */
1127                           if (decl_jump_unsafe (b1->decl))
1128                             vec_safe_push(label_vars->decls_in_scope, b1->decl);
1129                         }
1130                     }
1131                 }
1132
1133               /* Update the bindings of any goto statements associated
1134                  with this label.  */
1135               FOR_EACH_VEC_SAFE_ELT (label_vars->gotos, ix, g)
1136                 update_spot_bindings (scope, &g->goto_bindings);
1137             }
1138         }
1139
1140       /* Don't search beyond the current function.  */
1141       if (s == current_function_scope)
1142         break;
1143
1144       s = s->outer;
1145     }
1146 }
1147
1148 /* Set the TYPE_CONTEXT of all of TYPE's variants to CONTEXT.  */
1149
1150 static void
1151 set_type_context (tree type, tree context)
1152 {
1153   for (type = TYPE_MAIN_VARIANT (type); type;
1154        type = TYPE_NEXT_VARIANT (type))
1155     TYPE_CONTEXT (type) = context;
1156 }
1157
1158 /* Exit a scope.  Restore the state of the identifier-decl mappings
1159    that were in effect when this scope was entered.  Return a BLOCK
1160    node containing all the DECLs in this scope that are of interest
1161    to debug info generation.  */
1162
1163 tree
1164 pop_scope (void)
1165 {
1166   struct c_scope *scope = current_scope;
1167   tree block, context, p;
1168   struct c_binding *b;
1169
1170   bool functionbody = scope->function_body;
1171   bool keep = functionbody || scope->keep || scope->bindings;
1172
1173   update_label_decls (scope);
1174
1175   /* If appropriate, create a BLOCK to record the decls for the life
1176      of this function.  */
1177   block = 0;
1178   if (keep)
1179     {
1180       block = make_node (BLOCK);
1181       BLOCK_SUBBLOCKS (block) = scope->blocks;
1182       TREE_USED (block) = 1;
1183
1184       /* In each subblock, record that this is its superior.  */
1185       for (p = scope->blocks; p; p = BLOCK_CHAIN (p))
1186         BLOCK_SUPERCONTEXT (p) = block;
1187
1188       BLOCK_VARS (block) = 0;
1189     }
1190
1191   /* The TYPE_CONTEXTs for all of the tagged types belonging to this
1192      scope must be set so that they point to the appropriate
1193      construct, i.e.  either to the current FUNCTION_DECL node, or
1194      else to the BLOCK node we just constructed.
1195
1196      Note that for tagged types whose scope is just the formal
1197      parameter list for some function type specification, we can't
1198      properly set their TYPE_CONTEXTs here, because we don't have a
1199      pointer to the appropriate FUNCTION_TYPE node readily available
1200      to us.  For those cases, the TYPE_CONTEXTs of the relevant tagged
1201      type nodes get set in `grokdeclarator' as soon as we have created
1202      the FUNCTION_TYPE node which will represent the "scope" for these
1203      "parameter list local" tagged types.  */
1204   if (scope->function_body)
1205     context = current_function_decl;
1206   else if (scope == file_scope)
1207     {
1208       tree file_decl = build_translation_unit_decl (NULL_TREE);
1209       context = file_decl;
1210       debug_hooks->register_main_translation_unit (file_decl);
1211     }
1212   else
1213     context = block;
1214
1215   /* Clear all bindings in this scope.  */
1216   for (b = scope->bindings; b; b = free_binding_and_advance (b))
1217     {
1218       p = b->decl;
1219       switch (TREE_CODE (p))
1220         {
1221         case LABEL_DECL:
1222           /* Warnings for unused labels, errors for undefined labels.  */
1223           if (TREE_USED (p) && !DECL_INITIAL (p))
1224             {
1225               error ("label %q+D used but not defined", p);
1226               DECL_INITIAL (p) = error_mark_node;
1227             }
1228           else
1229             warn_for_unused_label (p);
1230
1231           /* Labels go in BLOCK_VARS.  */
1232           DECL_CHAIN (p) = BLOCK_VARS (block);
1233           BLOCK_VARS (block) = p;
1234           gcc_assert (I_LABEL_BINDING (b->id) == b);
1235           I_LABEL_BINDING (b->id) = b->shadowed;
1236
1237           /* Also pop back to the shadowed label_vars.  */
1238           release_tree_vector (b->u.label->decls_in_scope);
1239           b->u.label = b->u.label->shadowed;
1240           break;
1241
1242         case ENUMERAL_TYPE:
1243         case UNION_TYPE:
1244         case RECORD_TYPE:
1245           set_type_context (p, context);
1246
1247           /* Types may not have tag-names, in which case the type
1248              appears in the bindings list with b->id NULL.  */
1249           if (b->id)
1250             {
1251               gcc_assert (I_TAG_BINDING (b->id) == b);
1252               I_TAG_BINDING (b->id) = b->shadowed;
1253             }
1254           break;
1255
1256         case FUNCTION_DECL:
1257           /* Propagate TREE_ADDRESSABLE from nested functions to their
1258              containing functions.  */
1259           if (!TREE_ASM_WRITTEN (p)
1260               && DECL_INITIAL (p) != 0
1261               && TREE_ADDRESSABLE (p)
1262               && DECL_ABSTRACT_ORIGIN (p) != 0
1263               && DECL_ABSTRACT_ORIGIN (p) != p)
1264             TREE_ADDRESSABLE (DECL_ABSTRACT_ORIGIN (p)) = 1;
1265           if (!DECL_EXTERNAL (p)
1266               && !DECL_INITIAL (p)
1267               && scope != file_scope
1268               && scope != external_scope)
1269             {
1270               error ("nested function %q+D declared but never defined", p);
1271               undef_nested_function = true;
1272             }
1273           else if (DECL_DECLARED_INLINE_P (p)
1274                    && TREE_PUBLIC (p)
1275                    && !DECL_INITIAL (p))
1276             {
1277               /* C99 6.7.4p6: "a function with external linkage... declared
1278                  with an inline function specifier ... shall also be defined
1279                  in the same translation unit."  */
1280               if (!flag_gnu89_inline
1281                   && !lookup_attribute ("gnu_inline", DECL_ATTRIBUTES (p))
1282                   && scope != external_scope)
1283                 pedwarn (input_location, 0,
1284                          "inline function %q+D declared but never defined", p);
1285               DECL_EXTERNAL (p) = 1;
1286             }
1287
1288           goto common_symbol;
1289
1290         case VAR_DECL:
1291           /* Warnings for unused variables.  */
1292           if ((!TREE_USED (p) || !DECL_READ_P (p))
1293               && !TREE_NO_WARNING (p)
1294               && !DECL_IN_SYSTEM_HEADER (p)
1295               && DECL_NAME (p)
1296               && !DECL_ARTIFICIAL (p)
1297               && scope != file_scope
1298               && scope != external_scope)
1299             {
1300               if (!TREE_USED (p))
1301                 warning (OPT_Wunused_variable, "unused variable %q+D", p);
1302               else if (DECL_CONTEXT (p) == current_function_decl)
1303                 warning_at (DECL_SOURCE_LOCATION (p),
1304                             OPT_Wunused_but_set_variable,
1305                             "variable %qD set but not used", p);
1306             }
1307
1308           if (b->inner_comp)
1309             {
1310               error ("type of array %q+D completed incompatibly with"
1311                      " implicit initialization", p);
1312             }
1313
1314           /* Fall through.  */
1315         case TYPE_DECL:
1316         case CONST_DECL:
1317         common_symbol:
1318           /* All of these go in BLOCK_VARS, but only if this is the
1319              binding in the home scope.  */
1320           if (!b->nested)
1321             {
1322               DECL_CHAIN (p) = BLOCK_VARS (block);
1323               BLOCK_VARS (block) = p;
1324             }
1325           else if (VAR_OR_FUNCTION_DECL_P (p) && scope != file_scope)
1326             {
1327               /* For block local externs add a special
1328                  DECL_EXTERNAL decl for debug info generation.  */
1329               tree extp = copy_node (p);
1330
1331               DECL_EXTERNAL (extp) = 1;
1332               TREE_STATIC (extp) = 0;
1333               TREE_PUBLIC (extp) = 1;
1334               DECL_INITIAL (extp) = NULL_TREE;
1335               DECL_LANG_SPECIFIC (extp) = NULL;
1336               DECL_CONTEXT (extp) = current_function_decl;
1337               if (TREE_CODE (p) == FUNCTION_DECL)
1338                 {
1339                   DECL_RESULT (extp) = NULL_TREE;
1340                   DECL_SAVED_TREE (extp) = NULL_TREE;
1341                   DECL_STRUCT_FUNCTION (extp) = NULL;
1342                 }
1343               if (b->locus != UNKNOWN_LOCATION)
1344                 DECL_SOURCE_LOCATION (extp) = b->locus;
1345               DECL_CHAIN (extp) = BLOCK_VARS (block);
1346               BLOCK_VARS (block) = extp;
1347             }
1348           /* If this is the file scope set DECL_CONTEXT of each decl to
1349              the TRANSLATION_UNIT_DECL.  This makes same_translation_unit_p
1350              work.  */
1351           if (scope == file_scope)
1352             {
1353               DECL_CONTEXT (p) = context;
1354               if (TREE_CODE (p) == TYPE_DECL
1355                   && TREE_TYPE (p) != error_mark_node)
1356                 set_type_context (TREE_TYPE (p), context);
1357             }
1358
1359           /* Fall through.  */
1360           /* Parameters go in DECL_ARGUMENTS, not BLOCK_VARS, and have
1361              already been put there by store_parm_decls.  Unused-
1362              parameter warnings are handled by function.c.
1363              error_mark_node obviously does not go in BLOCK_VARS and
1364              does not get unused-variable warnings.  */
1365         case PARM_DECL:
1366         case ERROR_MARK:
1367           /* It is possible for a decl not to have a name.  We get
1368              here with b->id NULL in this case.  */
1369           if (b->id)
1370             {
1371               gcc_assert (I_SYMBOL_BINDING (b->id) == b);
1372               I_SYMBOL_BINDING (b->id) = b->shadowed;
1373               if (b->shadowed && b->shadowed->u.type)
1374                 TREE_TYPE (b->shadowed->decl) = b->shadowed->u.type;
1375             }
1376           break;
1377
1378         default:
1379           gcc_unreachable ();
1380         }
1381     }
1382
1383
1384   /* Dispose of the block that we just made inside some higher level.  */
1385   if ((scope->function_body || scope == file_scope) && context)
1386     {
1387       DECL_INITIAL (context) = block;
1388       BLOCK_SUPERCONTEXT (block) = context;
1389     }
1390   else if (scope->outer)
1391     {
1392       if (block)
1393         SCOPE_LIST_APPEND (scope->outer, blocks, block);
1394       /* If we did not make a block for the scope just exited, any
1395          blocks made for inner scopes must be carried forward so they
1396          will later become subblocks of something else.  */
1397       else if (scope->blocks)
1398         SCOPE_LIST_CONCAT (scope->outer, blocks, scope, blocks);
1399     }
1400
1401   /* Pop the current scope, and free the structure for reuse.  */
1402   current_scope = scope->outer;
1403   if (scope->function_body)
1404     current_function_scope = scope->outer_function;
1405
1406   memset (scope, 0, sizeof (struct c_scope));
1407   scope->outer = scope_freelist;
1408   scope_freelist = scope;
1409
1410   return block;
1411 }
1412
1413 void
1414 push_file_scope (void)
1415 {
1416   tree decl;
1417
1418   if (file_scope)
1419     return;
1420
1421   push_scope ();
1422   file_scope = current_scope;
1423
1424   start_fname_decls ();
1425
1426   for (decl = visible_builtins; decl; decl = DECL_CHAIN (decl))
1427     bind (DECL_NAME (decl), decl, file_scope,
1428           /*invisible=*/false, /*nested=*/true, DECL_SOURCE_LOCATION (decl));
1429 }
1430
1431 void
1432 pop_file_scope (void)
1433 {
1434   /* In case there were missing closebraces, get us back to the global
1435      binding level.  */
1436   while (current_scope != file_scope)
1437     pop_scope ();
1438
1439   /* __FUNCTION__ is defined at file scope ("").  This
1440      call may not be necessary as my tests indicate it
1441      still works without it.  */
1442   finish_fname_decls ();
1443
1444   check_inline_statics ();
1445
1446   /* This is the point to write out a PCH if we're doing that.
1447      In that case we do not want to do anything else.  */
1448   if (pch_file)
1449     {
1450       c_common_write_pch ();
1451       return;
1452     }
1453
1454   /* Pop off the file scope and close this translation unit.  */
1455   pop_scope ();
1456   file_scope = 0;
1457
1458   maybe_apply_pending_pragma_weaks ();
1459 }
1460 \f
1461 /* Adjust the bindings for the start of a statement expression.  */
1462
1463 void
1464 c_bindings_start_stmt_expr (struct c_spot_bindings* switch_bindings)
1465 {
1466   struct c_scope *scope;
1467
1468   for (scope = current_scope; scope != NULL; scope = scope->outer)
1469     {
1470       struct c_binding *b;
1471
1472       if (!scope->has_label_bindings)
1473         continue;
1474
1475       for (b = scope->bindings; b != NULL; b = b->prev)
1476         {
1477           struct c_label_vars *label_vars;
1478           unsigned int ix;
1479           struct c_goto_bindings *g;
1480
1481           if (TREE_CODE (b->decl) != LABEL_DECL)
1482             continue;
1483           label_vars = b->u.label;
1484           ++label_vars->label_bindings.stmt_exprs;
1485           FOR_EACH_VEC_SAFE_ELT (label_vars->gotos, ix, g)
1486             ++g->goto_bindings.stmt_exprs;
1487         }
1488     }
1489
1490   if (switch_bindings != NULL)
1491     ++switch_bindings->stmt_exprs;
1492 }
1493
1494 /* Adjust the bindings for the end of a statement expression.  */
1495
1496 void
1497 c_bindings_end_stmt_expr (struct c_spot_bindings *switch_bindings)
1498 {
1499   struct c_scope *scope;
1500
1501   for (scope = current_scope; scope != NULL; scope = scope->outer)
1502     {
1503       struct c_binding *b;
1504
1505       if (!scope->has_label_bindings)
1506         continue;
1507
1508       for (b = scope->bindings; b != NULL; b = b->prev)
1509         {
1510           struct c_label_vars *label_vars;
1511           unsigned int ix;
1512           struct c_goto_bindings *g;
1513
1514           if (TREE_CODE (b->decl) != LABEL_DECL)
1515             continue;
1516           label_vars = b->u.label;
1517           --label_vars->label_bindings.stmt_exprs;
1518           if (label_vars->label_bindings.stmt_exprs < 0)
1519             {
1520               label_vars->label_bindings.left_stmt_expr = true;
1521               label_vars->label_bindings.stmt_exprs = 0;
1522             }
1523           FOR_EACH_VEC_SAFE_ELT (label_vars->gotos, ix, g)
1524             {
1525               --g->goto_bindings.stmt_exprs;
1526               if (g->goto_bindings.stmt_exprs < 0)
1527                 {
1528                   g->goto_bindings.left_stmt_expr = true;
1529                   g->goto_bindings.stmt_exprs = 0;
1530                 }
1531             }
1532         }
1533     }
1534
1535   if (switch_bindings != NULL)
1536     {
1537       --switch_bindings->stmt_exprs;
1538       gcc_assert (switch_bindings->stmt_exprs >= 0);
1539     }
1540 }
1541 \f
1542 /* Push a definition or a declaration of struct, union or enum tag "name".
1543    "type" should be the type node.
1544    We assume that the tag "name" is not already defined, and has a location
1545    of LOC.
1546
1547    Note that the definition may really be just a forward reference.
1548    In that case, the TYPE_SIZE will be zero.  */
1549
1550 static void
1551 pushtag (location_t loc, tree name, tree type)
1552 {
1553   /* Record the identifier as the type's name if it has none.  */
1554   if (name && !TYPE_NAME (type))
1555     TYPE_NAME (type) = name;
1556   bind (name, type, current_scope, /*invisible=*/false, /*nested=*/false, loc);
1557
1558   /* Create a fake NULL-named TYPE_DECL node whose TREE_TYPE will be the
1559      tagged type we just added to the current scope.  This fake
1560      NULL-named TYPE_DECL node helps dwarfout.c to know when it needs
1561      to output a representation of a tagged type, and it also gives
1562      us a convenient place to record the "scope start" address for the
1563      tagged type.  */
1564
1565   TYPE_STUB_DECL (type) = pushdecl (build_decl (loc,
1566                                                 TYPE_DECL, NULL_TREE, type));
1567
1568   /* An approximation for now, so we can tell this is a function-scope tag.
1569      This will be updated in pop_scope.  */
1570   TYPE_CONTEXT (type) = DECL_CONTEXT (TYPE_STUB_DECL (type));
1571
1572   if (warn_cxx_compat && name != NULL_TREE)
1573     {
1574       struct c_binding *b = I_SYMBOL_BINDING (name);
1575
1576       if (b != NULL
1577           && b->decl != NULL_TREE
1578           && TREE_CODE (b->decl) == TYPE_DECL
1579           && (B_IN_CURRENT_SCOPE (b)
1580               || (current_scope == file_scope && B_IN_EXTERNAL_SCOPE (b)))
1581           && (TYPE_MAIN_VARIANT (TREE_TYPE (b->decl))
1582               != TYPE_MAIN_VARIANT (type)))
1583         {
1584           warning_at (loc, OPT_Wc___compat,
1585                       ("using %qD as both a typedef and a tag is "
1586                        "invalid in C++"),
1587                       b->decl);
1588           if (b->locus != UNKNOWN_LOCATION)
1589             inform (b->locus, "originally defined here");
1590         }
1591     }
1592 }
1593
1594 /* An exported interface to pushtag.  This is used by the gdb plugin's
1595    binding oracle to introduce a new tag binding.  */
1596
1597 void
1598 c_pushtag (location_t loc, tree name, tree type)
1599 {
1600   pushtag (loc, name, type);
1601 }
1602
1603 /* An exported interface to bind a declaration.  LOC is the location
1604    to use.  DECL is the declaration to bind.  The decl's name is used
1605    to determine how it is bound.  If DECL is a VAR_DECL, then
1606    IS_GLOBAL determines whether the decl is put into the global (file
1607    and external) scope or the current function's scope; if DECL is not
1608    a VAR_DECL then it is always put into the file scope.  */
1609
1610 void
1611 c_bind (location_t loc, tree decl, bool is_global)
1612 {
1613   struct c_scope *scope;
1614   bool nested = false;
1615
1616   if (TREE_CODE (decl) != VAR_DECL || current_function_scope == NULL)
1617     {
1618       /* Types and functions are always considered to be global.  */
1619       scope = file_scope;
1620       DECL_EXTERNAL (decl) = 1;
1621       TREE_PUBLIC (decl) = 1;
1622     }
1623   else if (is_global)
1624     {
1625       /* Also bind it into the external scope.  */
1626       bind (DECL_NAME (decl), decl, external_scope, true, false, loc);
1627       nested = true;
1628       scope = file_scope;
1629       DECL_EXTERNAL (decl) = 1;
1630       TREE_PUBLIC (decl) = 1;
1631     }
1632   else
1633     {
1634       DECL_CONTEXT (decl) = current_function_decl;
1635       TREE_PUBLIC (decl) = 0;
1636       scope = current_function_scope;
1637     }
1638
1639   bind (DECL_NAME (decl), decl, scope, false, nested, loc);
1640 }
1641 \f
1642 /* Subroutine of compare_decls.  Allow harmless mismatches in return
1643    and argument types provided that the type modes match.  This function
1644    return a unified type given a suitable match, and 0 otherwise.  */
1645
1646 static tree
1647 match_builtin_function_types (tree newtype, tree oldtype)
1648 {
1649   tree newrettype, oldrettype;
1650   tree newargs, oldargs;
1651   tree trytype, tryargs;
1652
1653   /* Accept the return type of the new declaration if same modes.  */
1654   oldrettype = TREE_TYPE (oldtype);
1655   newrettype = TREE_TYPE (newtype);
1656
1657   if (TYPE_MODE (oldrettype) != TYPE_MODE (newrettype))
1658     return 0;
1659
1660   oldargs = TYPE_ARG_TYPES (oldtype);
1661   newargs = TYPE_ARG_TYPES (newtype);
1662   tryargs = newargs;
1663
1664   while (oldargs || newargs)
1665     {
1666       if (!oldargs
1667           || !newargs
1668           || !TREE_VALUE (oldargs)
1669           || !TREE_VALUE (newargs)
1670           || TYPE_MODE (TREE_VALUE (oldargs))
1671              != TYPE_MODE (TREE_VALUE (newargs)))
1672         return 0;
1673
1674       oldargs = TREE_CHAIN (oldargs);
1675       newargs = TREE_CHAIN (newargs);
1676     }
1677
1678   trytype = build_function_type (newrettype, tryargs);
1679   return build_type_attribute_variant (trytype, TYPE_ATTRIBUTES (oldtype));
1680 }
1681
1682 /* Subroutine of diagnose_mismatched_decls.  Check for function type
1683    mismatch involving an empty arglist vs a nonempty one and give clearer
1684    diagnostics.  */
1685 static void
1686 diagnose_arglist_conflict (tree newdecl, tree olddecl,
1687                            tree newtype, tree oldtype)
1688 {
1689   tree t;
1690
1691   if (TREE_CODE (olddecl) != FUNCTION_DECL
1692       || !comptypes (TREE_TYPE (oldtype), TREE_TYPE (newtype))
1693       || !((!prototype_p (oldtype) && DECL_INITIAL (olddecl) == 0)
1694            || (!prototype_p (newtype) && DECL_INITIAL (newdecl) == 0)))
1695     return;
1696
1697   t = TYPE_ARG_TYPES (oldtype);
1698   if (t == 0)
1699     t = TYPE_ARG_TYPES (newtype);
1700   for (; t; t = TREE_CHAIN (t))
1701     {
1702       tree type = TREE_VALUE (t);
1703
1704       if (TREE_CHAIN (t) == 0
1705           && TYPE_MAIN_VARIANT (type) != void_type_node)
1706         {
1707           inform (input_location, "a parameter list with an ellipsis can%'t match "
1708                   "an empty parameter name list declaration");
1709           break;
1710         }
1711
1712       if (c_type_promotes_to (type) != type)
1713         {
1714           inform (input_location, "an argument type that has a default promotion can%'t match "
1715                   "an empty parameter name list declaration");
1716           break;
1717         }
1718     }
1719 }
1720
1721 /* Another subroutine of diagnose_mismatched_decls.  OLDDECL is an
1722    old-style function definition, NEWDECL is a prototype declaration.
1723    Diagnose inconsistencies in the argument list.  Returns TRUE if
1724    the prototype is compatible, FALSE if not.  */
1725 static bool
1726 validate_proto_after_old_defn (tree newdecl, tree newtype, tree oldtype)
1727 {
1728   tree newargs, oldargs;
1729   int i;
1730
1731 #define END_OF_ARGLIST(t) ((t) == void_type_node)
1732
1733   oldargs = TYPE_ACTUAL_ARG_TYPES (oldtype);
1734   newargs = TYPE_ARG_TYPES (newtype);
1735   i = 1;
1736
1737   for (;;)
1738     {
1739       tree oldargtype = TREE_VALUE (oldargs);
1740       tree newargtype = TREE_VALUE (newargs);
1741
1742       if (oldargtype == error_mark_node || newargtype == error_mark_node)
1743         return false;
1744
1745       oldargtype = (TYPE_ATOMIC (oldargtype)
1746                     ? c_build_qualified_type (TYPE_MAIN_VARIANT (oldargtype),
1747                                               TYPE_QUAL_ATOMIC)
1748                     : TYPE_MAIN_VARIANT (oldargtype));
1749       newargtype = (TYPE_ATOMIC (newargtype)
1750                     ? c_build_qualified_type (TYPE_MAIN_VARIANT (newargtype),
1751                                               TYPE_QUAL_ATOMIC)
1752                     : TYPE_MAIN_VARIANT (newargtype));
1753
1754       if (END_OF_ARGLIST (oldargtype) && END_OF_ARGLIST (newargtype))
1755         break;
1756
1757       /* Reaching the end of just one list means the two decls don't
1758          agree on the number of arguments.  */
1759       if (END_OF_ARGLIST (oldargtype))
1760         {
1761           error ("prototype for %q+D declares more arguments "
1762                  "than previous old-style definition", newdecl);
1763           return false;
1764         }
1765       else if (END_OF_ARGLIST (newargtype))
1766         {
1767           error ("prototype for %q+D declares fewer arguments "
1768                  "than previous old-style definition", newdecl);
1769           return false;
1770         }
1771
1772       /* Type for passing arg must be consistent with that declared
1773          for the arg.  */
1774       else if (!comptypes (oldargtype, newargtype))
1775         {
1776           error ("prototype for %q+D declares argument %d"
1777                  " with incompatible type",
1778                  newdecl, i);
1779           return false;
1780         }
1781
1782       oldargs = TREE_CHAIN (oldargs);
1783       newargs = TREE_CHAIN (newargs);
1784       i++;
1785     }
1786
1787   /* If we get here, no errors were found, but do issue a warning
1788      for this poor-style construct.  */
1789   warning (0, "prototype for %q+D follows non-prototype definition",
1790            newdecl);
1791   return true;
1792 #undef END_OF_ARGLIST
1793 }
1794
1795 /* Subroutine of diagnose_mismatched_decls.  Report the location of DECL,
1796    first in a pair of mismatched declarations, using the diagnostic
1797    function DIAG.  */
1798 static void
1799 locate_old_decl (tree decl)
1800 {
1801   if (TREE_CODE (decl) == FUNCTION_DECL && DECL_BUILT_IN (decl)
1802       && !C_DECL_DECLARED_BUILTIN (decl))
1803     ;
1804   else if (DECL_INITIAL (decl))
1805     inform (input_location, "previous definition of %q+D was here", decl);
1806   else if (C_DECL_IMPLICIT (decl))
1807     inform (input_location, "previous implicit declaration of %q+D was here", decl);
1808   else
1809     inform (input_location, "previous declaration of %q+D was here", decl);
1810 }
1811
1812 /* Subroutine of duplicate_decls.  Compare NEWDECL to OLDDECL.
1813    Returns true if the caller should proceed to merge the two, false
1814    if OLDDECL should simply be discarded.  As a side effect, issues
1815    all necessary diagnostics for invalid or poor-style combinations.
1816    If it returns true, writes the types of NEWDECL and OLDDECL to
1817    *NEWTYPEP and *OLDTYPEP - these may have been adjusted from
1818    TREE_TYPE (NEWDECL, OLDDECL) respectively.  */
1819
1820 static bool
1821 diagnose_mismatched_decls (tree newdecl, tree olddecl,
1822                            tree *newtypep, tree *oldtypep)
1823 {
1824   tree newtype, oldtype;
1825   bool pedwarned = false;
1826   bool warned = false;
1827   bool retval = true;
1828
1829 #define DECL_EXTERN_INLINE(DECL) (DECL_DECLARED_INLINE_P (DECL)  \
1830                                   && DECL_EXTERNAL (DECL))
1831
1832   /* If we have error_mark_node for either decl or type, just discard
1833      the previous decl - we're in an error cascade already.  */
1834   if (olddecl == error_mark_node || newdecl == error_mark_node)
1835     return false;
1836   *oldtypep = oldtype = TREE_TYPE (olddecl);
1837   *newtypep = newtype = TREE_TYPE (newdecl);
1838   if (oldtype == error_mark_node || newtype == error_mark_node)
1839     return false;
1840
1841   /* Two different categories of symbol altogether.  This is an error
1842      unless OLDDECL is a builtin.  OLDDECL will be discarded in any case.  */
1843   if (TREE_CODE (olddecl) != TREE_CODE (newdecl))
1844     {
1845       if (!(TREE_CODE (olddecl) == FUNCTION_DECL
1846             && DECL_BUILT_IN (olddecl)
1847             && !C_DECL_DECLARED_BUILTIN (olddecl)))
1848         {
1849           error ("%q+D redeclared as different kind of symbol", newdecl);
1850           locate_old_decl (olddecl);
1851         }
1852       else if (TREE_PUBLIC (newdecl))
1853         warning (0, "built-in function %q+D declared as non-function",
1854                  newdecl);
1855       else
1856         warning (OPT_Wshadow, "declaration of %q+D shadows "
1857                  "a built-in function", newdecl);
1858       return false;
1859     }
1860
1861   /* Enumerators have no linkage, so may only be declared once in a
1862      given scope.  */
1863   if (TREE_CODE (olddecl) == CONST_DECL)
1864     {
1865       error ("redeclaration of enumerator %q+D", newdecl);
1866       locate_old_decl (olddecl);
1867       return false;
1868     }
1869
1870   if (!comptypes (oldtype, newtype))
1871     {
1872       if (TREE_CODE (olddecl) == FUNCTION_DECL
1873           && DECL_BUILT_IN (olddecl) && !C_DECL_DECLARED_BUILTIN (olddecl))
1874         {
1875           /* Accept harmless mismatch in function types.
1876              This is for the ffs and fprintf builtins.  */
1877           tree trytype = match_builtin_function_types (newtype, oldtype);
1878
1879           if (trytype && comptypes (newtype, trytype))
1880             *oldtypep = oldtype = trytype;
1881           else
1882             {
1883               /* If types don't match for a built-in, throw away the
1884                  built-in.  No point in calling locate_old_decl here, it
1885                  won't print anything.  */
1886               warning (0, "conflicting types for built-in function %q+D",
1887                        newdecl);
1888               return false;
1889             }
1890         }
1891       else if (TREE_CODE (olddecl) == FUNCTION_DECL
1892                && DECL_IS_BUILTIN (olddecl))
1893         {
1894           /* A conflicting function declaration for a predeclared
1895              function that isn't actually built in.  Objective C uses
1896              these.  The new declaration silently overrides everything
1897              but the volatility (i.e. noreturn) indication.  See also
1898              below.  FIXME: Make Objective C use normal builtins.  */
1899           TREE_THIS_VOLATILE (newdecl) |= TREE_THIS_VOLATILE (olddecl);
1900           return false;
1901         }
1902       /* Permit void foo (...) to match int foo (...) if the latter is
1903          the definition and implicit int was used.  See
1904          c-torture/compile/920625-2.c.  */
1905       else if (TREE_CODE (newdecl) == FUNCTION_DECL && DECL_INITIAL (newdecl)
1906                && TYPE_MAIN_VARIANT (TREE_TYPE (oldtype)) == void_type_node
1907                && TYPE_MAIN_VARIANT (TREE_TYPE (newtype)) == integer_type_node
1908                && C_FUNCTION_IMPLICIT_INT (newdecl) && !DECL_INITIAL (olddecl))
1909         {
1910           pedwarned = pedwarn (input_location, 0,
1911                                "conflicting types for %q+D", newdecl);
1912           /* Make sure we keep void as the return type.  */
1913           TREE_TYPE (newdecl) = *newtypep = newtype = oldtype;
1914           C_FUNCTION_IMPLICIT_INT (newdecl) = 0;
1915         }
1916       /* Permit void foo (...) to match an earlier call to foo (...) with
1917          no declared type (thus, implicitly int).  */
1918       else if (TREE_CODE (newdecl) == FUNCTION_DECL
1919                && TYPE_MAIN_VARIANT (TREE_TYPE (newtype)) == void_type_node
1920                && TYPE_MAIN_VARIANT (TREE_TYPE (oldtype)) == integer_type_node
1921                && C_DECL_IMPLICIT (olddecl) && !DECL_INITIAL (olddecl))
1922         {
1923           pedwarned = pedwarn (input_location, 0,
1924                                "conflicting types for %q+D", newdecl);
1925           /* Make sure we keep void as the return type.  */
1926           TREE_TYPE (olddecl) = *oldtypep = oldtype = newtype;
1927         }
1928       else
1929         {
1930           int new_quals = TYPE_QUALS (newtype);
1931           int old_quals = TYPE_QUALS (oldtype);
1932
1933           if (new_quals != old_quals)
1934             {
1935               addr_space_t new_addr = DECODE_QUAL_ADDR_SPACE (new_quals);
1936               addr_space_t old_addr = DECODE_QUAL_ADDR_SPACE (old_quals);
1937               if (new_addr != old_addr)
1938                 {
1939                   if (ADDR_SPACE_GENERIC_P (new_addr))
1940                     error ("conflicting named address spaces (generic vs %s) "
1941                            "for %q+D",
1942                            c_addr_space_name (old_addr), newdecl);
1943                   else if (ADDR_SPACE_GENERIC_P (old_addr))
1944                     error ("conflicting named address spaces (%s vs generic) "
1945                            "for %q+D",
1946                            c_addr_space_name (new_addr), newdecl);
1947                   else
1948                     error ("conflicting named address spaces (%s vs %s) "
1949                            "for %q+D",
1950                            c_addr_space_name (new_addr),
1951                            c_addr_space_name (old_addr),
1952                            newdecl);
1953                 }
1954
1955               if (CLEAR_QUAL_ADDR_SPACE (new_quals)
1956                   != CLEAR_QUAL_ADDR_SPACE (old_quals))
1957                 error ("conflicting type qualifiers for %q+D", newdecl);
1958             }
1959           else
1960             error ("conflicting types for %q+D", newdecl);
1961           diagnose_arglist_conflict (newdecl, olddecl, newtype, oldtype);
1962           locate_old_decl (olddecl);
1963           return false;
1964         }
1965     }
1966
1967   /* Redeclaration of a type is a constraint violation (6.7.2.3p1),
1968      but silently ignore the redeclaration if either is in a system
1969      header.  (Conflicting redeclarations were handled above.)  This
1970      is allowed for C11 if the types are the same, not just
1971      compatible.  */
1972   if (TREE_CODE (newdecl) == TYPE_DECL)
1973     {
1974       bool types_different = false;
1975       int comptypes_result;
1976
1977       comptypes_result
1978         = comptypes_check_different_types (oldtype, newtype, &types_different);
1979
1980       if (comptypes_result != 1 || types_different)
1981         {
1982           error ("redefinition of typedef %q+D with different type", newdecl);
1983           locate_old_decl (olddecl);
1984           return false;
1985         }
1986
1987       if (DECL_IN_SYSTEM_HEADER (newdecl)
1988           || DECL_IN_SYSTEM_HEADER (olddecl)
1989           || TREE_NO_WARNING (newdecl)
1990           || TREE_NO_WARNING (olddecl))
1991         return true;  /* Allow OLDDECL to continue in use.  */
1992
1993       if (variably_modified_type_p (newtype, NULL))
1994         {
1995           error ("redefinition of typedef %q+D with variably modified type",
1996                  newdecl);
1997           locate_old_decl (olddecl);
1998         }
1999       else if (pedwarn_c99 (input_location, OPT_Wpedantic,
2000                             "redefinition of typedef %q+D", newdecl))
2001         locate_old_decl (olddecl);
2002
2003       return true;
2004     }
2005
2006   /* Function declarations can either be 'static' or 'extern' (no
2007      qualifier is equivalent to 'extern' - C99 6.2.2p5) and therefore
2008      can never conflict with each other on account of linkage
2009      (6.2.2p4).  Multiple definitions are not allowed (6.9p3,5) but
2010      gnu89 mode permits two definitions if one is 'extern inline' and
2011      one is not.  The non- extern-inline definition supersedes the
2012      extern-inline definition.  */
2013
2014   else if (TREE_CODE (newdecl) == FUNCTION_DECL)
2015     {
2016       /* If you declare a built-in function name as static, or
2017          define the built-in with an old-style definition (so we
2018          can't validate the argument list) the built-in definition is
2019          overridden, but optionally warn this was a bad choice of name.  */
2020       if (DECL_BUILT_IN (olddecl)
2021           && !C_DECL_DECLARED_BUILTIN (olddecl)
2022           && (!TREE_PUBLIC (newdecl)
2023               || (DECL_INITIAL (newdecl)
2024                   && !prototype_p (TREE_TYPE (newdecl)))))
2025         {
2026           warning (OPT_Wshadow, "declaration of %q+D shadows "
2027                    "a built-in function", newdecl);
2028           /* Discard the old built-in function.  */
2029           return false;
2030         }
2031
2032       if (DECL_INITIAL (newdecl))
2033         {
2034           if (DECL_INITIAL (olddecl))
2035             {
2036               /* If both decls are in the same TU and the new declaration
2037                  isn't overriding an extern inline reject the new decl.
2038                  In c99, no overriding is allowed in the same translation
2039                  unit.  */
2040               if ((!DECL_EXTERN_INLINE (olddecl)
2041                    || DECL_EXTERN_INLINE (newdecl)
2042                    || (!flag_gnu89_inline
2043                        && (!DECL_DECLARED_INLINE_P (olddecl)
2044                            || !lookup_attribute ("gnu_inline",
2045                                                  DECL_ATTRIBUTES (olddecl)))
2046                        && (!DECL_DECLARED_INLINE_P (newdecl)
2047                            || !lookup_attribute ("gnu_inline",
2048                                                  DECL_ATTRIBUTES (newdecl))))
2049                   )
2050                   && same_translation_unit_p (newdecl, olddecl))
2051                 {
2052                   error ("redefinition of %q+D", newdecl);
2053                   locate_old_decl (olddecl);
2054                   return false;
2055                 }
2056             }
2057         }
2058       /* If we have a prototype after an old-style function definition,
2059          the argument types must be checked specially.  */
2060       else if (DECL_INITIAL (olddecl)
2061                && !prototype_p (oldtype) && prototype_p (newtype)
2062                && TYPE_ACTUAL_ARG_TYPES (oldtype)
2063                && !validate_proto_after_old_defn (newdecl, newtype, oldtype))
2064         {
2065           locate_old_decl (olddecl);
2066           return false;
2067         }
2068       /* A non-static declaration (even an "extern") followed by a
2069          static declaration is undefined behavior per C99 6.2.2p3-5,7.
2070          The same is true for a static forward declaration at block
2071          scope followed by a non-static declaration/definition at file
2072          scope.  Static followed by non-static at the same scope is
2073          not undefined behavior, and is the most convenient way to get
2074          some effects (see e.g.  what unwind-dw2-fde-glibc.c does to
2075          the definition of _Unwind_Find_FDE in unwind-dw2-fde.c), but
2076          we do diagnose it if -Wtraditional.  */
2077       if (TREE_PUBLIC (olddecl) && !TREE_PUBLIC (newdecl))
2078         {
2079           /* Two exceptions to the rule.  If olddecl is an extern
2080              inline, or a predeclared function that isn't actually
2081              built in, newdecl silently overrides olddecl.  The latter
2082              occur only in Objective C; see also above.  (FIXME: Make
2083              Objective C use normal builtins.)  */
2084           if (!DECL_IS_BUILTIN (olddecl)
2085               && !DECL_EXTERN_INLINE (olddecl))
2086             {
2087               error ("static declaration of %q+D follows "
2088                      "non-static declaration", newdecl);
2089               locate_old_decl (olddecl);
2090             }
2091           return false;
2092         }
2093       else if (TREE_PUBLIC (newdecl) && !TREE_PUBLIC (olddecl))
2094         {
2095           if (DECL_CONTEXT (olddecl))
2096             {
2097               error ("non-static declaration of %q+D follows "
2098                      "static declaration", newdecl);
2099               locate_old_decl (olddecl);
2100               return false;
2101             }
2102           else if (warn_traditional)
2103             {
2104               warned |= warning (OPT_Wtraditional,
2105                                  "non-static declaration of %q+D "
2106                                  "follows static declaration", newdecl);
2107             }
2108         }
2109
2110       /* Make sure gnu_inline attribute is either not present, or
2111          present on all inline decls.  */
2112       if (DECL_DECLARED_INLINE_P (olddecl)
2113           && DECL_DECLARED_INLINE_P (newdecl))
2114         {
2115           bool newa = lookup_attribute ("gnu_inline",
2116                                         DECL_ATTRIBUTES (newdecl)) != NULL;
2117           bool olda = lookup_attribute ("gnu_inline",
2118                                         DECL_ATTRIBUTES (olddecl)) != NULL;
2119           if (newa != olda)
2120             {
2121               error_at (input_location, "%<gnu_inline%> attribute present on %q+D",
2122                         newa ? newdecl : olddecl);
2123               error_at (DECL_SOURCE_LOCATION (newa ? olddecl : newdecl),
2124                         "but not here");
2125             }
2126         }
2127     }
2128   else if (TREE_CODE (newdecl) == VAR_DECL)
2129     {
2130       /* Only variables can be thread-local, and all declarations must
2131          agree on this property.  */
2132       if (C_DECL_THREADPRIVATE_P (olddecl) && !DECL_THREAD_LOCAL_P (newdecl))
2133         {
2134           /* Nothing to check.  Since OLDDECL is marked threadprivate
2135              and NEWDECL does not have a thread-local attribute, we
2136              will merge the threadprivate attribute into NEWDECL.  */
2137           ;
2138         }
2139       else if (DECL_THREAD_LOCAL_P (newdecl) != DECL_THREAD_LOCAL_P (olddecl))
2140         {
2141           if (DECL_THREAD_LOCAL_P (newdecl))
2142             error ("thread-local declaration of %q+D follows "
2143                    "non-thread-local declaration", newdecl);
2144           else
2145             error ("non-thread-local declaration of %q+D follows "
2146                    "thread-local declaration", newdecl);
2147
2148           locate_old_decl (olddecl);
2149           return false;
2150         }
2151
2152       /* Multiple initialized definitions are not allowed (6.9p3,5).  */
2153       if (DECL_INITIAL (newdecl) && DECL_INITIAL (olddecl))
2154         {
2155           error ("redefinition of %q+D", newdecl);
2156           locate_old_decl (olddecl);
2157           return false;
2158         }
2159
2160       /* Objects declared at file scope: if the first declaration had
2161          external linkage (even if it was an external reference) the
2162          second must have external linkage as well, or the behavior is
2163          undefined.  If the first declaration had internal linkage, then
2164          the second must too, or else be an external reference (in which
2165          case the composite declaration still has internal linkage).
2166          As for function declarations, we warn about the static-then-
2167          extern case only for -Wtraditional.  See generally 6.2.2p3-5,7.  */
2168       if (DECL_FILE_SCOPE_P (newdecl)
2169           && TREE_PUBLIC (newdecl) != TREE_PUBLIC (olddecl))
2170         {
2171           if (DECL_EXTERNAL (newdecl))
2172             {
2173               if (!DECL_FILE_SCOPE_P (olddecl))
2174                 {
2175                   error ("extern declaration of %q+D follows "
2176                          "declaration with no linkage", newdecl);
2177                   locate_old_decl (olddecl);
2178                   return false;
2179                 }
2180               else if (warn_traditional)
2181                 {
2182                   warned |= warning (OPT_Wtraditional,
2183                                      "non-static declaration of %q+D "
2184                                      "follows static declaration", newdecl);
2185                 }
2186             }
2187           else
2188             {
2189               if (TREE_PUBLIC (newdecl))
2190                 error ("non-static declaration of %q+D follows "
2191                        "static declaration", newdecl);
2192               else
2193                 error ("static declaration of %q+D follows "
2194                        "non-static declaration", newdecl);
2195
2196               locate_old_decl (olddecl);
2197               return false;
2198             }
2199         }
2200       /* Two objects with the same name declared at the same block
2201          scope must both be external references (6.7p3).  */
2202       else if (!DECL_FILE_SCOPE_P (newdecl))
2203         {
2204           if (DECL_EXTERNAL (newdecl))
2205             {
2206               /* Extern with initializer at block scope, which will
2207                  already have received an error.  */
2208             }
2209           else if (DECL_EXTERNAL (olddecl))
2210             {
2211               error ("declaration of %q+D with no linkage follows "
2212                      "extern declaration", newdecl);
2213               locate_old_decl (olddecl);
2214             }
2215           else
2216             {
2217               error ("redeclaration of %q+D with no linkage", newdecl);
2218               locate_old_decl (olddecl);
2219             }
2220
2221           return false;
2222         }
2223
2224       /* C++ does not permit a decl to appear multiple times at file
2225          scope.  */
2226       if (warn_cxx_compat
2227           && DECL_FILE_SCOPE_P (newdecl)
2228           && !DECL_EXTERNAL (newdecl)
2229           && !DECL_EXTERNAL (olddecl))
2230         warned |= warning_at (DECL_SOURCE_LOCATION (newdecl),
2231                               OPT_Wc___compat,
2232                               ("duplicate declaration of %qD is "
2233                                "invalid in C++"),
2234                               newdecl);
2235     }
2236
2237   /* warnings */
2238   /* All decls must agree on a visibility.  */
2239   if (CODE_CONTAINS_STRUCT (TREE_CODE (newdecl), TS_DECL_WITH_VIS)
2240       && DECL_VISIBILITY_SPECIFIED (newdecl) && DECL_VISIBILITY_SPECIFIED (olddecl)
2241       && DECL_VISIBILITY (newdecl) != DECL_VISIBILITY (olddecl))
2242     {
2243       warned |= warning (0, "redeclaration of %q+D with different visibility "
2244                          "(old visibility preserved)", newdecl);
2245     }
2246
2247   if (TREE_CODE (newdecl) == FUNCTION_DECL)
2248     {
2249       /* Diagnose inline __attribute__ ((noinline)) which is silly.  */
2250       if (DECL_DECLARED_INLINE_P (newdecl)
2251           && lookup_attribute ("noinline", DECL_ATTRIBUTES (olddecl)))
2252         warned |= warning (OPT_Wattributes,
2253                            "inline declaration of %qD follows "
2254                            "declaration with attribute noinline", newdecl);
2255       else if (DECL_DECLARED_INLINE_P (olddecl)
2256                && lookup_attribute ("noinline", DECL_ATTRIBUTES (newdecl)))
2257         warned |= warning (OPT_Wattributes,
2258                            "declaration of %q+D with attribute "
2259                            "noinline follows inline declaration ", newdecl);
2260       else if (lookup_attribute ("noinline", DECL_ATTRIBUTES (newdecl))
2261                && lookup_attribute ("always_inline", DECL_ATTRIBUTES (olddecl)))
2262         warned |= warning (OPT_Wattributes,
2263                            "declaration of %q+D with attribute "
2264                            "%qs follows declaration with attribute %qs",
2265                            newdecl, "noinline", "always_inline");
2266       else if (lookup_attribute ("always_inline", DECL_ATTRIBUTES (newdecl))
2267                && lookup_attribute ("noinline", DECL_ATTRIBUTES (olddecl)))
2268         warned |= warning (OPT_Wattributes,
2269                            "declaration of %q+D with attribute "
2270                            "%qs follows declaration with attribute %qs",
2271                            newdecl, "always_inline", "noinline");
2272       else if (lookup_attribute ("cold", DECL_ATTRIBUTES (newdecl))
2273                && lookup_attribute ("hot", DECL_ATTRIBUTES (olddecl)))
2274         warned |= warning (OPT_Wattributes,
2275                            "declaration of %q+D with attribute %qs follows "
2276                            "declaration with attribute %qs", newdecl, "cold",
2277                            "hot");
2278       else if (lookup_attribute ("hot", DECL_ATTRIBUTES (newdecl))
2279                && lookup_attribute ("cold", DECL_ATTRIBUTES (olddecl)))
2280         warned |= warning (OPT_Wattributes,
2281                            "declaration of %q+D with attribute %qs follows "
2282                            "declaration with attribute %qs", newdecl, "hot",
2283                            "cold");
2284     }
2285   else /* PARM_DECL, VAR_DECL */
2286     {
2287       /* Redeclaration of a parameter is a constraint violation (this is
2288          not explicitly stated, but follows from C99 6.7p3 [no more than
2289          one declaration of the same identifier with no linkage in the
2290          same scope, except type tags] and 6.2.2p6 [parameters have no
2291          linkage]).  We must check for a forward parameter declaration,
2292          indicated by TREE_ASM_WRITTEN on the old declaration - this is
2293          an extension, the mandatory diagnostic for which is handled by
2294          mark_forward_parm_decls.  */
2295
2296       if (TREE_CODE (newdecl) == PARM_DECL
2297           && (!TREE_ASM_WRITTEN (olddecl) || TREE_ASM_WRITTEN (newdecl)))
2298         {
2299           error ("redefinition of parameter %q+D", newdecl);
2300           locate_old_decl (olddecl);
2301           return false;
2302         }
2303     }
2304
2305   /* Optional warning for completely redundant decls.  */
2306   if (!warned && !pedwarned
2307       && warn_redundant_decls
2308       /* Don't warn about a function declaration followed by a
2309          definition.  */
2310       && !(TREE_CODE (newdecl) == FUNCTION_DECL
2311            && DECL_INITIAL (newdecl) && !DECL_INITIAL (olddecl))
2312       /* Don't warn about redundant redeclarations of builtins.  */
2313       && !(TREE_CODE (newdecl) == FUNCTION_DECL
2314            && !DECL_BUILT_IN (newdecl)
2315            && DECL_BUILT_IN (olddecl)
2316            && !C_DECL_DECLARED_BUILTIN (olddecl))
2317       /* Don't warn about an extern followed by a definition.  */
2318       && !(DECL_EXTERNAL (olddecl) && !DECL_EXTERNAL (newdecl))
2319       /* Don't warn about forward parameter decls.  */
2320       && !(TREE_CODE (newdecl) == PARM_DECL
2321            && TREE_ASM_WRITTEN (olddecl) && !TREE_ASM_WRITTEN (newdecl))
2322       /* Don't warn about a variable definition following a declaration.  */
2323       && !(TREE_CODE (newdecl) == VAR_DECL
2324            && DECL_INITIAL (newdecl) && !DECL_INITIAL (olddecl)))
2325     {
2326       warned = warning (OPT_Wredundant_decls, "redundant redeclaration of %q+D",
2327                         newdecl);
2328     }
2329
2330   /* Report location of previous decl/defn.  */
2331   if (warned || pedwarned)
2332     locate_old_decl (olddecl);
2333
2334 #undef DECL_EXTERN_INLINE
2335
2336   return retval;
2337 }
2338
2339 /* Subroutine of duplicate_decls.  NEWDECL has been found to be
2340    consistent with OLDDECL, but carries new information.  Merge the
2341    new information into OLDDECL.  This function issues no
2342    diagnostics.  */
2343
2344 static void
2345 merge_decls (tree newdecl, tree olddecl, tree newtype, tree oldtype)
2346 {
2347   bool new_is_definition = (TREE_CODE (newdecl) == FUNCTION_DECL
2348                             && DECL_INITIAL (newdecl) != 0);
2349   bool new_is_prototype = (TREE_CODE (newdecl) == FUNCTION_DECL
2350                            && prototype_p (TREE_TYPE (newdecl)));
2351   bool old_is_prototype = (TREE_CODE (olddecl) == FUNCTION_DECL
2352                            && prototype_p (TREE_TYPE (olddecl)));
2353
2354   /* For real parm decl following a forward decl, rechain the old decl
2355      in its new location and clear TREE_ASM_WRITTEN (it's not a
2356      forward decl anymore).  */
2357   if (TREE_CODE (newdecl) == PARM_DECL
2358       && TREE_ASM_WRITTEN (olddecl) && !TREE_ASM_WRITTEN (newdecl))
2359     {
2360       struct c_binding *b, **here;
2361
2362       for (here = &current_scope->bindings; *here; here = &(*here)->prev)
2363         if ((*here)->decl == olddecl)
2364           goto found;
2365       gcc_unreachable ();
2366
2367     found:
2368       b = *here;
2369       *here = b->prev;
2370       b->prev = current_scope->bindings;
2371       current_scope->bindings = b;
2372
2373       TREE_ASM_WRITTEN (olddecl) = 0;
2374     }
2375
2376   DECL_ATTRIBUTES (newdecl)
2377     = targetm.merge_decl_attributes (olddecl, newdecl);
2378
2379   /* Merge the data types specified in the two decls.  */
2380   TREE_TYPE (newdecl)
2381     = TREE_TYPE (olddecl)
2382     = composite_type (newtype, oldtype);
2383
2384   /* Lay the type out, unless already done.  */
2385   if (!comptypes (oldtype, TREE_TYPE (newdecl)))
2386     {
2387       if (TREE_TYPE (newdecl) != error_mark_node)
2388         layout_type (TREE_TYPE (newdecl));
2389       if (TREE_CODE (newdecl) != FUNCTION_DECL
2390           && TREE_CODE (newdecl) != TYPE_DECL
2391           && TREE_CODE (newdecl) != CONST_DECL)
2392         layout_decl (newdecl, 0);
2393     }
2394   else
2395     {
2396       /* Since the type is OLDDECL's, make OLDDECL's size go with.  */
2397       DECL_SIZE (newdecl) = DECL_SIZE (olddecl);
2398       DECL_SIZE_UNIT (newdecl) = DECL_SIZE_UNIT (olddecl);
2399       DECL_MODE (newdecl) = DECL_MODE (olddecl);
2400       if (DECL_ALIGN (olddecl) > DECL_ALIGN (newdecl))
2401         {
2402           DECL_ALIGN (newdecl) = DECL_ALIGN (olddecl);
2403           DECL_USER_ALIGN (newdecl) |= DECL_USER_ALIGN (olddecl);
2404         }
2405     }
2406
2407   /* Keep the old rtl since we can safely use it.  */
2408   if (HAS_RTL_P (olddecl))
2409     COPY_DECL_RTL (olddecl, newdecl);
2410
2411   /* Merge the type qualifiers.  */
2412   if (TREE_READONLY (newdecl))
2413     TREE_READONLY (olddecl) = 1;
2414
2415   if (TREE_THIS_VOLATILE (newdecl))
2416     TREE_THIS_VOLATILE (olddecl) = 1;
2417
2418   /* Merge deprecatedness.  */
2419   if (TREE_DEPRECATED (newdecl))
2420     TREE_DEPRECATED (olddecl) = 1;
2421
2422   /* If a decl is in a system header and the other isn't, keep the one on the
2423      system header. Otherwise, keep source location of definition rather than
2424      declaration and of prototype rather than non-prototype unless that
2425      prototype is built-in.  */
2426   if (CODE_CONTAINS_STRUCT (TREE_CODE (olddecl), TS_DECL_WITH_VIS)
2427       && DECL_IN_SYSTEM_HEADER (olddecl)
2428       && !DECL_IN_SYSTEM_HEADER (newdecl) )
2429     DECL_SOURCE_LOCATION (newdecl) = DECL_SOURCE_LOCATION (olddecl);
2430   else if (CODE_CONTAINS_STRUCT (TREE_CODE (olddecl), TS_DECL_WITH_VIS)
2431            && DECL_IN_SYSTEM_HEADER (newdecl)
2432            && !DECL_IN_SYSTEM_HEADER (olddecl))
2433     DECL_SOURCE_LOCATION (olddecl) = DECL_SOURCE_LOCATION (newdecl);
2434   else if ((DECL_INITIAL (newdecl) == 0 && DECL_INITIAL (olddecl) != 0)
2435            || (old_is_prototype && !new_is_prototype
2436                && !C_DECL_BUILTIN_PROTOTYPE (olddecl)))
2437     DECL_SOURCE_LOCATION (newdecl) = DECL_SOURCE_LOCATION (olddecl);
2438
2439   /* Merge the initialization information.  */
2440    if (DECL_INITIAL (newdecl) == 0)
2441     DECL_INITIAL (newdecl) = DECL_INITIAL (olddecl);
2442
2443   /* Merge the threadprivate attribute.  */
2444   if (TREE_CODE (olddecl) == VAR_DECL && C_DECL_THREADPRIVATE_P (olddecl))
2445     C_DECL_THREADPRIVATE_P (newdecl) = 1;
2446
2447   if (CODE_CONTAINS_STRUCT (TREE_CODE (olddecl), TS_DECL_WITH_VIS))
2448     {
2449       /* Copy the assembler name.
2450          Currently, it can only be defined in the prototype.  */
2451       COPY_DECL_ASSEMBLER_NAME (olddecl, newdecl);
2452
2453       /* Use visibility of whichever declaration had it specified */
2454       if (DECL_VISIBILITY_SPECIFIED (olddecl))
2455         {
2456           DECL_VISIBILITY (newdecl) = DECL_VISIBILITY (olddecl);
2457           DECL_VISIBILITY_SPECIFIED (newdecl) = 1;
2458         }
2459
2460       if (TREE_CODE (newdecl) == FUNCTION_DECL)
2461         {
2462           DECL_STATIC_CONSTRUCTOR(newdecl) |= DECL_STATIC_CONSTRUCTOR(olddecl);
2463           DECL_STATIC_DESTRUCTOR (newdecl) |= DECL_STATIC_DESTRUCTOR (olddecl);
2464           DECL_NO_LIMIT_STACK (newdecl) |= DECL_NO_LIMIT_STACK (olddecl);
2465           DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (newdecl)
2466             |= DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (olddecl);
2467           TREE_THIS_VOLATILE (newdecl) |= TREE_THIS_VOLATILE (olddecl);
2468           DECL_IS_MALLOC (newdecl) |= DECL_IS_MALLOC (olddecl);
2469           DECL_IS_OPERATOR_NEW (newdecl) |= DECL_IS_OPERATOR_NEW (olddecl);
2470           TREE_READONLY (newdecl) |= TREE_READONLY (olddecl);
2471           DECL_PURE_P (newdecl) |= DECL_PURE_P (olddecl);
2472           DECL_IS_NOVOPS (newdecl) |= DECL_IS_NOVOPS (olddecl);
2473         }
2474
2475       /* Merge the storage class information.  */
2476       merge_weak (newdecl, olddecl);
2477
2478       /* For functions, static overrides non-static.  */
2479       if (TREE_CODE (newdecl) == FUNCTION_DECL)
2480         {
2481           TREE_PUBLIC (newdecl) &= TREE_PUBLIC (olddecl);
2482           /* This is since we don't automatically
2483              copy the attributes of NEWDECL into OLDDECL.  */
2484           TREE_PUBLIC (olddecl) = TREE_PUBLIC (newdecl);
2485           /* If this clears `static', clear it in the identifier too.  */
2486           if (!TREE_PUBLIC (olddecl))
2487             TREE_PUBLIC (DECL_NAME (olddecl)) = 0;
2488         }
2489     }
2490
2491   /* In c99, 'extern' declaration before (or after) 'inline' means this
2492      function is not DECL_EXTERNAL, unless 'gnu_inline' attribute
2493      is present.  */
2494   if (TREE_CODE (newdecl) == FUNCTION_DECL
2495       && !flag_gnu89_inline
2496       && (DECL_DECLARED_INLINE_P (newdecl)
2497           || DECL_DECLARED_INLINE_P (olddecl))
2498       && (!DECL_DECLARED_INLINE_P (newdecl)
2499           || !DECL_DECLARED_INLINE_P (olddecl)
2500           || !DECL_EXTERNAL (olddecl))
2501       && DECL_EXTERNAL (newdecl)
2502       && !lookup_attribute ("gnu_inline", DECL_ATTRIBUTES (newdecl))
2503       && !current_function_decl)
2504     DECL_EXTERNAL (newdecl) = 0;
2505
2506   /* An inline definition following a static declaration is not
2507      DECL_EXTERNAL.  */
2508   if (new_is_definition
2509       && (DECL_DECLARED_INLINE_P (newdecl)
2510           || DECL_DECLARED_INLINE_P (olddecl))
2511       && !TREE_PUBLIC (olddecl))
2512     DECL_EXTERNAL (newdecl) = 0;
2513
2514   if (DECL_EXTERNAL (newdecl))
2515     {
2516       TREE_STATIC (newdecl) = TREE_STATIC (olddecl);
2517       DECL_EXTERNAL (newdecl) = DECL_EXTERNAL (olddecl);
2518
2519       /* An extern decl does not override previous storage class.  */
2520       TREE_PUBLIC (newdecl) = TREE_PUBLIC (olddecl);
2521       if (!DECL_EXTERNAL (newdecl))
2522         {
2523           DECL_CONTEXT (newdecl) = DECL_CONTEXT (olddecl);
2524           DECL_COMMON (newdecl) = DECL_COMMON (olddecl);
2525         }
2526     }
2527   else
2528     {
2529       TREE_STATIC (olddecl) = TREE_STATIC (newdecl);
2530       TREE_PUBLIC (olddecl) = TREE_PUBLIC (newdecl);
2531     }
2532
2533   if (TREE_CODE (newdecl) == FUNCTION_DECL)
2534     {
2535       /* If we're redefining a function previously defined as extern
2536          inline, make sure we emit debug info for the inline before we
2537          throw it away, in case it was inlined into a function that
2538          hasn't been written out yet.  */
2539       if (new_is_definition && DECL_INITIAL (olddecl))
2540         /* The new defn must not be inline.  */
2541         DECL_UNINLINABLE (newdecl) = 1;
2542       else
2543         {
2544           /* If either decl says `inline', this fn is inline, unless
2545              its definition was passed already.  */
2546           if (DECL_DECLARED_INLINE_P (newdecl)
2547               || DECL_DECLARED_INLINE_P (olddecl))
2548             DECL_DECLARED_INLINE_P (newdecl) = 1;
2549
2550           DECL_UNINLINABLE (newdecl) = DECL_UNINLINABLE (olddecl)
2551             = (DECL_UNINLINABLE (newdecl) || DECL_UNINLINABLE (olddecl));
2552
2553           DECL_DISREGARD_INLINE_LIMITS (newdecl)
2554             = DECL_DISREGARD_INLINE_LIMITS (olddecl)
2555             = (DECL_DISREGARD_INLINE_LIMITS (newdecl)
2556                || DECL_DISREGARD_INLINE_LIMITS (olddecl));
2557         }
2558
2559       if (DECL_BUILT_IN (olddecl))
2560         {
2561           /* If redeclaring a builtin function, it stays built in.
2562              But it gets tagged as having been declared.  */
2563           DECL_BUILT_IN_CLASS (newdecl) = DECL_BUILT_IN_CLASS (olddecl);
2564           DECL_FUNCTION_CODE (newdecl) = DECL_FUNCTION_CODE (olddecl);
2565           C_DECL_DECLARED_BUILTIN (newdecl) = 1;
2566           if (new_is_prototype)
2567             {
2568               C_DECL_BUILTIN_PROTOTYPE (newdecl) = 0;
2569               if (DECL_BUILT_IN_CLASS (newdecl) == BUILT_IN_NORMAL)
2570                 {
2571                   enum built_in_function fncode = DECL_FUNCTION_CODE (newdecl);
2572                   switch (fncode)
2573                     {
2574                       /* If a compatible prototype of these builtin functions
2575                          is seen, assume the runtime implements it with the
2576                          expected semantics.  */
2577                     case BUILT_IN_STPCPY:
2578                       if (builtin_decl_explicit_p (fncode))
2579                         set_builtin_decl_implicit_p (fncode, true);
2580                       break;
2581                     default:
2582                       if (builtin_decl_explicit_p (fncode))
2583                         set_builtin_decl_declared_p (fncode, true);
2584                       break;
2585                     }
2586                 }
2587             }
2588           else
2589             C_DECL_BUILTIN_PROTOTYPE (newdecl)
2590               = C_DECL_BUILTIN_PROTOTYPE (olddecl);
2591         }
2592
2593       /* Preserve function specific target and optimization options */
2594       if (DECL_FUNCTION_SPECIFIC_TARGET (olddecl)
2595           && !DECL_FUNCTION_SPECIFIC_TARGET (newdecl))
2596         DECL_FUNCTION_SPECIFIC_TARGET (newdecl)
2597           = DECL_FUNCTION_SPECIFIC_TARGET (olddecl);
2598
2599       if (DECL_FUNCTION_SPECIFIC_OPTIMIZATION (olddecl)
2600           && !DECL_FUNCTION_SPECIFIC_OPTIMIZATION (newdecl))
2601         DECL_FUNCTION_SPECIFIC_OPTIMIZATION (newdecl)
2602           = DECL_FUNCTION_SPECIFIC_OPTIMIZATION (olddecl);
2603
2604       /* Also preserve various other info from the definition.  */
2605       if (!new_is_definition)
2606         {
2607           tree t;
2608           DECL_RESULT (newdecl) = DECL_RESULT (olddecl);
2609           DECL_INITIAL (newdecl) = DECL_INITIAL (olddecl);
2610           DECL_STRUCT_FUNCTION (newdecl) = DECL_STRUCT_FUNCTION (olddecl);
2611           DECL_SAVED_TREE (newdecl) = DECL_SAVED_TREE (olddecl);
2612           DECL_ARGUMENTS (newdecl) = copy_list (DECL_ARGUMENTS (olddecl));
2613           for (t = DECL_ARGUMENTS (newdecl); t ; t = DECL_CHAIN (t))
2614             DECL_CONTEXT (t) = newdecl;
2615
2616           /* See if we've got a function to instantiate from.  */
2617           if (DECL_SAVED_TREE (olddecl))
2618             DECL_ABSTRACT_ORIGIN (newdecl)
2619               = DECL_ABSTRACT_ORIGIN (olddecl);
2620         }
2621     }
2622
2623   /* Merge the USED information.  */
2624   if (TREE_USED (olddecl))
2625     TREE_USED (newdecl) = 1;
2626   else if (TREE_USED (newdecl))
2627     TREE_USED (olddecl) = 1;
2628   if (TREE_CODE (olddecl) == VAR_DECL || TREE_CODE (olddecl) == PARM_DECL)
2629     DECL_READ_P (newdecl) |= DECL_READ_P (olddecl);
2630   if (DECL_PRESERVE_P (olddecl))
2631     DECL_PRESERVE_P (newdecl) = 1;
2632   else if (DECL_PRESERVE_P (newdecl))
2633     DECL_PRESERVE_P (olddecl) = 1;
2634
2635   /* Copy most of the decl-specific fields of NEWDECL into OLDDECL.
2636      But preserve OLDDECL's DECL_UID, DECL_CONTEXT and
2637      DECL_ARGUMENTS (if appropriate).  */
2638   {
2639     unsigned olddecl_uid = DECL_UID (olddecl);
2640     tree olddecl_context = DECL_CONTEXT (olddecl);
2641     tree olddecl_arguments = NULL;
2642     if (TREE_CODE (olddecl) == FUNCTION_DECL)
2643       olddecl_arguments = DECL_ARGUMENTS (olddecl);
2644
2645     memcpy ((char *) olddecl + sizeof (struct tree_common),
2646             (char *) newdecl + sizeof (struct tree_common),
2647             sizeof (struct tree_decl_common) - sizeof (struct tree_common));
2648     DECL_USER_ALIGN (olddecl) = DECL_USER_ALIGN (newdecl);
2649     switch (TREE_CODE (olddecl))
2650       {
2651       case FUNCTION_DECL:
2652       case VAR_DECL:
2653         {
2654           struct symtab_node *snode = olddecl->decl_with_vis.symtab_node;
2655
2656           memcpy ((char *) olddecl + sizeof (struct tree_decl_common),
2657                   (char *) newdecl + sizeof (struct tree_decl_common),
2658                   tree_code_size (TREE_CODE (olddecl)) - sizeof (struct tree_decl_common));
2659           olddecl->decl_with_vis.symtab_node = snode;
2660
2661           if ((DECL_EXTERNAL (olddecl)
2662                || TREE_PUBLIC (olddecl)
2663                || TREE_STATIC (olddecl))
2664               && DECL_SECTION_NAME (newdecl) != NULL)
2665             set_decl_section_name (olddecl, DECL_SECTION_NAME (newdecl));
2666
2667           /* This isn't quite correct for something like
2668                 int __thread x attribute ((tls_model ("local-exec")));
2669                 extern int __thread x;
2670              as we'll lose the "local-exec" model.  */
2671           if (TREE_CODE (olddecl) == VAR_DECL
2672               && DECL_THREAD_LOCAL_P (newdecl))
2673             set_decl_tls_model (olddecl, DECL_TLS_MODEL (newdecl));
2674           break;
2675         }
2676
2677       case FIELD_DECL:
2678       case PARM_DECL:
2679       case LABEL_DECL:
2680       case RESULT_DECL:
2681       case CONST_DECL:
2682       case TYPE_DECL:
2683         memcpy ((char *) olddecl + sizeof (struct tree_decl_common),
2684                 (char *) newdecl + sizeof (struct tree_decl_common),
2685                 tree_code_size (TREE_CODE (olddecl)) - sizeof (struct tree_decl_common));
2686         break;
2687
2688       default:
2689
2690         memcpy ((char *) olddecl + sizeof (struct tree_decl_common),
2691                 (char *) newdecl + sizeof (struct tree_decl_common),
2692                 sizeof (struct tree_decl_non_common) - sizeof (struct tree_decl_common));
2693       }
2694     DECL_UID (olddecl) = olddecl_uid;
2695     DECL_CONTEXT (olddecl) = olddecl_context;
2696     if (TREE_CODE (olddecl) == FUNCTION_DECL)
2697       DECL_ARGUMENTS (olddecl) = olddecl_arguments;
2698   }
2699
2700   /* If OLDDECL had its DECL_RTL instantiated, re-invoke make_decl_rtl
2701      so that encode_section_info has a chance to look at the new decl
2702      flags and attributes.  */
2703   if (DECL_RTL_SET_P (olddecl)
2704       && (TREE_CODE (olddecl) == FUNCTION_DECL
2705           || (TREE_CODE (olddecl) == VAR_DECL
2706               && TREE_STATIC (olddecl))))
2707     make_decl_rtl (olddecl);
2708 }
2709
2710 /* Handle when a new declaration NEWDECL has the same name as an old
2711    one OLDDECL in the same binding contour.  Prints an error message
2712    if appropriate.
2713
2714    If safely possible, alter OLDDECL to look like NEWDECL, and return
2715    true.  Otherwise, return false.  */
2716
2717 static bool
2718 duplicate_decls (tree newdecl, tree olddecl)
2719 {
2720   tree newtype = NULL, oldtype = NULL;
2721
2722   if (!diagnose_mismatched_decls (newdecl, olddecl, &newtype, &oldtype))
2723     {
2724       /* Avoid `unused variable' and other warnings for OLDDECL.  */
2725       TREE_NO_WARNING (olddecl) = 1;
2726       return false;
2727     }
2728
2729   merge_decls (newdecl, olddecl, newtype, oldtype);
2730
2731   /* The NEWDECL will no longer be needed.
2732
2733      Before releasing the node, be sure to remove function from symbol
2734      table that might have been inserted there to record comdat group.
2735      Be sure to however do not free DECL_STRUCT_FUNCTION because this
2736      structure is shared in between NEWDECL and OLDECL.  */
2737   if (TREE_CODE (newdecl) == FUNCTION_DECL)
2738     DECL_STRUCT_FUNCTION (newdecl) = NULL;
2739   if (TREE_CODE (newdecl) == FUNCTION_DECL
2740       || TREE_CODE (newdecl) == VAR_DECL)
2741     {
2742       struct symtab_node *snode = symtab_node::get (newdecl);
2743       if (snode)
2744         snode->remove ();
2745     }
2746   ggc_free (newdecl);
2747   return true;
2748 }
2749
2750 \f
2751 /* Check whether decl-node NEW_DECL shadows an existing declaration.  */
2752 static void
2753 warn_if_shadowing (tree new_decl)
2754 {
2755   struct c_binding *b;
2756
2757   /* Shadow warnings wanted?  */
2758   if (!warn_shadow
2759       /* No shadow warnings for internally generated vars.  */
2760       || DECL_IS_BUILTIN (new_decl)
2761       /* No shadow warnings for vars made for inlining.  */
2762       || DECL_FROM_INLINE (new_decl))
2763     return;
2764
2765   /* Is anything being shadowed?  Invisible decls do not count.  */
2766   for (b = I_SYMBOL_BINDING (DECL_NAME (new_decl)); b; b = b->shadowed)
2767     if (b->decl && b->decl != new_decl && !b->invisible
2768         && (b->decl == error_mark_node
2769             || diagnostic_report_warnings_p (global_dc,
2770                                              DECL_SOURCE_LOCATION (b->decl))))
2771       {
2772         tree old_decl = b->decl;
2773         bool warned = false;
2774
2775         if (old_decl == error_mark_node)
2776           {
2777             warning (OPT_Wshadow, "declaration of %q+D shadows previous "
2778                      "non-variable", new_decl);
2779             break;
2780           }
2781         else if (TREE_CODE (old_decl) == PARM_DECL)
2782           warned = warning (OPT_Wshadow,
2783                             "declaration of %q+D shadows a parameter",
2784                             new_decl);
2785         else if (DECL_FILE_SCOPE_P (old_decl))
2786           {
2787             /* Do not warn if a variable shadows a function, unless
2788                the variable is a function or a pointer-to-function.  */
2789             if (TREE_CODE (old_decl) == FUNCTION_DECL
2790                 && TREE_CODE (new_decl) != FUNCTION_DECL
2791                 && !FUNCTION_POINTER_TYPE_P (TREE_TYPE (new_decl)))
2792                 continue;
2793
2794             warned = warning_at (DECL_SOURCE_LOCATION (new_decl), OPT_Wshadow,
2795                                  "declaration of %qD shadows a global "
2796                                  "declaration",
2797                                  new_decl);
2798           }
2799         else if (TREE_CODE (old_decl) == FUNCTION_DECL
2800                  && DECL_BUILT_IN (old_decl))
2801           {
2802             warning (OPT_Wshadow, "declaration of %q+D shadows "
2803                      "a built-in function", new_decl);
2804             break;
2805           }
2806         else
2807           warned = warning (OPT_Wshadow, "declaration of %q+D shadows a "
2808                             "previous local", new_decl);
2809
2810         if (warned)
2811           inform (DECL_SOURCE_LOCATION (old_decl),
2812                   "shadowed declaration is here");
2813
2814         break;
2815       }
2816 }
2817
2818 /* Record a decl-node X as belonging to the current lexical scope.
2819    Check for errors (such as an incompatible declaration for the same
2820    name already seen in the same scope).
2821
2822    Returns either X or an old decl for the same name.
2823    If an old decl is returned, it may have been smashed
2824    to agree with what X says.  */
2825
2826 tree
2827 pushdecl (tree x)
2828 {
2829   tree name = DECL_NAME (x);
2830   struct c_scope *scope = current_scope;
2831   struct c_binding *b;
2832   bool nested = false;
2833   location_t locus = DECL_SOURCE_LOCATION (x);
2834
2835   /* Must set DECL_CONTEXT for everything not at file scope or
2836      DECL_FILE_SCOPE_P won't work.  Local externs don't count
2837      unless they have initializers (which generate code).  */
2838   if (current_function_decl
2839       && ((TREE_CODE (x) != FUNCTION_DECL && TREE_CODE (x) != VAR_DECL)
2840           || DECL_INITIAL (x) || !DECL_EXTERNAL (x)))
2841     DECL_CONTEXT (x) = current_function_decl;
2842
2843   /* Anonymous decls are just inserted in the scope.  */
2844   if (!name)
2845     {
2846       bind (name, x, scope, /*invisible=*/false, /*nested=*/false,
2847             locus);
2848       return x;
2849     }
2850
2851   /* First, see if there is another declaration with the same name in
2852      the current scope.  If there is, duplicate_decls may do all the
2853      work for us.  If duplicate_decls returns false, that indicates
2854      two incompatible decls in the same scope; we are to silently
2855      replace the old one (duplicate_decls has issued all appropriate
2856      diagnostics).  In particular, we should not consider possible
2857      duplicates in the external scope, or shadowing.  */
2858   b = I_SYMBOL_BINDING (name);
2859   if (b && B_IN_SCOPE (b, scope))
2860     {
2861       struct c_binding *b_ext, *b_use;
2862       tree type = TREE_TYPE (x);
2863       tree visdecl = b->decl;
2864       tree vistype = TREE_TYPE (visdecl);
2865       if (TREE_CODE (TREE_TYPE (x)) == ARRAY_TYPE
2866           && COMPLETE_TYPE_P (TREE_TYPE (x)))
2867         b->inner_comp = false;
2868       b_use = b;
2869       b_ext = b;
2870       /* If this is an external linkage declaration, we should check
2871          for compatibility with the type in the external scope before
2872          setting the type at this scope based on the visible
2873          information only.  */
2874       if (TREE_PUBLIC (x) && TREE_PUBLIC (visdecl))
2875         {
2876           while (b_ext && !B_IN_EXTERNAL_SCOPE (b_ext))
2877             b_ext = b_ext->shadowed;
2878           if (b_ext)
2879             {
2880               b_use = b_ext;
2881               if (b_use->u.type)
2882                 TREE_TYPE (b_use->decl) = b_use->u.type;
2883             }
2884         }
2885       if (duplicate_decls (x, b_use->decl))
2886         {
2887           if (b_use != b)
2888             {
2889               /* Save the updated type in the external scope and
2890                  restore the proper type for this scope.  */
2891               tree thistype;
2892               if (comptypes (vistype, type))
2893                 thistype = composite_type (vistype, type);
2894               else
2895                 thistype = TREE_TYPE (b_use->decl);
2896               b_use->u.type = TREE_TYPE (b_use->decl);
2897               if (TREE_CODE (b_use->decl) == FUNCTION_DECL
2898                   && DECL_BUILT_IN (b_use->decl))
2899                 thistype
2900                   = build_type_attribute_variant (thistype,
2901                                                   TYPE_ATTRIBUTES
2902                                                   (b_use->u.type));
2903               TREE_TYPE (b_use->decl) = thistype;
2904             }
2905           return b_use->decl;
2906         }
2907       else
2908         goto skip_external_and_shadow_checks;
2909     }
2910
2911   /* All declarations with external linkage, and all external
2912      references, go in the external scope, no matter what scope is
2913      current.  However, the binding in that scope is ignored for
2914      purposes of normal name lookup.  A separate binding structure is
2915      created in the requested scope; this governs the normal
2916      visibility of the symbol.
2917
2918      The binding in the externals scope is used exclusively for
2919      detecting duplicate declarations of the same object, no matter
2920      what scope they are in; this is what we do here.  (C99 6.2.7p2:
2921      All declarations that refer to the same object or function shall
2922      have compatible type; otherwise, the behavior is undefined.)  */
2923   if (DECL_EXTERNAL (x) || scope == file_scope)
2924     {
2925       tree type = TREE_TYPE (x);
2926       tree vistype = 0;
2927       tree visdecl = 0;
2928       bool type_saved = false;
2929       if (b && !B_IN_EXTERNAL_SCOPE (b)
2930           && (TREE_CODE (b->decl) == FUNCTION_DECL
2931               || TREE_CODE (b->decl) == VAR_DECL)
2932           && DECL_FILE_SCOPE_P (b->decl))
2933         {
2934           visdecl = b->decl;
2935           vistype = TREE_TYPE (visdecl);
2936         }
2937       if (scope != file_scope
2938           && !DECL_IN_SYSTEM_HEADER (x))
2939         warning (OPT_Wnested_externs, "nested extern declaration of %qD", x);
2940
2941       while (b && !B_IN_EXTERNAL_SCOPE (b))
2942         {
2943           /* If this decl might be modified, save its type.  This is
2944              done here rather than when the decl is first bound
2945              because the type may change after first binding, through
2946              being completed or through attributes being added.  If we
2947              encounter multiple such decls, only the first should have
2948              its type saved; the others will already have had their
2949              proper types saved and the types will not have changed as
2950              their scopes will not have been re-entered.  */
2951           if (DECL_P (b->decl) && DECL_FILE_SCOPE_P (b->decl) && !type_saved)
2952             {
2953               b->u.type = TREE_TYPE (b->decl);
2954               type_saved = true;
2955             }
2956           if (B_IN_FILE_SCOPE (b)
2957               && TREE_CODE (b->decl) == VAR_DECL
2958               && TREE_STATIC (b->decl)
2959               && TREE_CODE (TREE_TYPE (b->decl)) == ARRAY_TYPE
2960               && !TYPE_DOMAIN (TREE_TYPE (b->decl))
2961               && TREE_CODE (type) == ARRAY_TYPE
2962               && TYPE_DOMAIN (type)
2963               && TYPE_MAX_VALUE (TYPE_DOMAIN (type))
2964               && !integer_zerop (TYPE_MAX_VALUE (TYPE_DOMAIN (type))))
2965             {
2966               /* Array type completed in inner scope, which should be
2967                  diagnosed if the completion does not have size 1 and
2968                  it does not get completed in the file scope.  */
2969               b->inner_comp = true;
2970             }
2971           b = b->shadowed;
2972         }
2973
2974       /* If a matching external declaration has been found, set its
2975          type to the composite of all the types of that declaration.
2976          After the consistency checks, it will be reset to the
2977          composite of the visible types only.  */
2978       if (b && (TREE_PUBLIC (x) || same_translation_unit_p (x, b->decl))
2979           && b->u.type)
2980         TREE_TYPE (b->decl) = b->u.type;
2981
2982       /* The point of the same_translation_unit_p check here is,
2983          we want to detect a duplicate decl for a construct like
2984          foo() { extern bar(); } ... static bar();  but not if
2985          they are in different translation units.  In any case,
2986          the static does not go in the externals scope.  */
2987       if (b
2988           && (TREE_PUBLIC (x) || same_translation_unit_p (x, b->decl))
2989           && duplicate_decls (x, b->decl))
2990         {
2991           tree thistype;
2992           if (vistype)
2993             {
2994               if (comptypes (vistype, type))
2995                 thistype = composite_type (vistype, type);
2996               else
2997                 thistype = TREE_TYPE (b->decl);
2998             }
2999           else
3000             thistype = type;
3001           b->u.type = TREE_TYPE (b->decl);
3002           if (TREE_CODE (b->decl) == FUNCTION_DECL && DECL_BUILT_IN (b->decl))
3003             thistype
3004               = build_type_attribute_variant (thistype,
3005                                               TYPE_ATTRIBUTES (b->u.type));
3006           TREE_TYPE (b->decl) = thistype;
3007           bind (name, b->decl, scope, /*invisible=*/false, /*nested=*/true,
3008                 locus);
3009           return b->decl;
3010         }
3011       else if (TREE_PUBLIC (x))
3012         {
3013           if (visdecl && !b && duplicate_decls (x, visdecl))
3014             {
3015               /* An external declaration at block scope referring to a
3016                  visible entity with internal linkage.  The composite
3017                  type will already be correct for this scope, so we
3018                  just need to fall through to make the declaration in
3019                  this scope.  */
3020               nested = true;
3021               x = visdecl;
3022             }
3023           else
3024             {
3025               bind (name, x, external_scope, /*invisible=*/true,
3026                     /*nested=*/false, locus);
3027               nested = true;
3028             }
3029         }
3030     }
3031
3032   if (TREE_CODE (x) != PARM_DECL)
3033     warn_if_shadowing (x);
3034
3035  skip_external_and_shadow_checks:
3036   if (TREE_CODE (x) == TYPE_DECL)
3037     {
3038       /* So this is a typedef, set its underlying type.  */
3039       set_underlying_type (x);
3040
3041       /* If X is a typedef defined in the current function, record it
3042          for the purpose of implementing the -Wunused-local-typedefs
3043          warning.  */
3044       record_locally_defined_typedef (x);
3045     }
3046
3047   bind (name, x, scope, /*invisible=*/false, nested, locus);
3048
3049   /* If x's type is incomplete because it's based on a
3050      structure or union which has not yet been fully declared,
3051      attach it to that structure or union type, so we can go
3052      back and complete the variable declaration later, if the
3053      structure or union gets fully declared.
3054
3055      If the input is erroneous, we can have error_mark in the type
3056      slot (e.g. "f(void a, ...)") - that doesn't count as an
3057      incomplete type.  */
3058   if (TREE_TYPE (x) != error_mark_node
3059       && !COMPLETE_TYPE_P (TREE_TYPE (x)))
3060     {
3061       tree element = TREE_TYPE (x);
3062
3063       while (TREE_CODE (element) == ARRAY_TYPE)
3064         element = TREE_TYPE (element);
3065       element = TYPE_MAIN_VARIANT (element);
3066
3067       if ((TREE_CODE (element) == RECORD_TYPE
3068            || TREE_CODE (element) == UNION_TYPE)
3069           && (TREE_CODE (x) != TYPE_DECL
3070               || TREE_CODE (TREE_TYPE (x)) == ARRAY_TYPE)
3071           && !COMPLETE_TYPE_P (element))
3072         C_TYPE_INCOMPLETE_VARS (element)
3073           = tree_cons (NULL_TREE, x, C_TYPE_INCOMPLETE_VARS (element));
3074     }
3075   return x;
3076 }
3077
3078 /* Record X as belonging to file scope.
3079    This is used only internally by the Objective-C front end,
3080    and is limited to its needs.  duplicate_decls is not called;
3081    if there is any preexisting decl for this identifier, it is an ICE.  */
3082
3083 tree
3084 pushdecl_top_level (tree x)
3085 {
3086   tree name;
3087   bool nested = false;
3088   gcc_assert (TREE_CODE (x) == VAR_DECL || TREE_CODE (x) == CONST_DECL);
3089
3090   name = DECL_NAME (x);
3091
3092  gcc_assert (TREE_CODE (x) == CONST_DECL || !I_SYMBOL_BINDING (name));
3093
3094   if (TREE_PUBLIC (x))
3095     {
3096       bind (name, x, external_scope, /*invisible=*/true, /*nested=*/false,
3097             UNKNOWN_LOCATION);
3098       nested = true;
3099     }
3100   if (file_scope)
3101     bind (name, x, file_scope, /*invisible=*/false, nested, UNKNOWN_LOCATION);
3102
3103   return x;
3104 }
3105 \f
3106 static void
3107 implicit_decl_warning (location_t loc, tree id, tree olddecl)
3108 {
3109   if (warn_implicit_function_declaration)
3110     {
3111       bool warned;
3112
3113       if (flag_isoc99)
3114         warned = pedwarn (loc, OPT_Wimplicit_function_declaration,
3115                           "implicit declaration of function %qE", id);
3116       else
3117         warned = warning_at (loc, OPT_Wimplicit_function_declaration,
3118                              G_("implicit declaration of function %qE"), id);
3119       if (olddecl && warned)
3120         locate_old_decl (olddecl);
3121     }
3122 }
3123
3124 /* This function represents mapping of a function code FCODE
3125    to its respective header.  */
3126
3127 static const char *
3128 header_for_builtin_fn (enum built_in_function fcode)
3129 {
3130   switch (fcode)
3131     {
3132     CASE_FLT_FN (BUILT_IN_ACOS):
3133     CASE_FLT_FN (BUILT_IN_ACOSH):
3134     CASE_FLT_FN (BUILT_IN_ASIN):
3135     CASE_FLT_FN (BUILT_IN_ASINH):
3136     CASE_FLT_FN (BUILT_IN_ATAN):
3137     CASE_FLT_FN (BUILT_IN_ATANH):
3138     CASE_FLT_FN (BUILT_IN_ATAN2):
3139     CASE_FLT_FN (BUILT_IN_CBRT):
3140     CASE_FLT_FN (BUILT_IN_CEIL):
3141     CASE_FLT_FN (BUILT_IN_COPYSIGN):
3142     CASE_FLT_FN (BUILT_IN_COS):
3143     CASE_FLT_FN (BUILT_IN_COSH):
3144     CASE_FLT_FN (BUILT_IN_ERF):
3145     CASE_FLT_FN (BUILT_IN_ERFC):
3146     CASE_FLT_FN (BUILT_IN_EXP):
3147     CASE_FLT_FN (BUILT_IN_EXP2):
3148     CASE_FLT_FN (BUILT_IN_EXPM1):
3149     CASE_FLT_FN (BUILT_IN_FABS):
3150     CASE_FLT_FN (BUILT_IN_FDIM):
3151     CASE_FLT_FN (BUILT_IN_FLOOR):
3152     CASE_FLT_FN (BUILT_IN_FMA):
3153     CASE_FLT_FN (BUILT_IN_FMAX):
3154     CASE_FLT_FN (BUILT_IN_FMIN):
3155     CASE_FLT_FN (BUILT_IN_FMOD):
3156     CASE_FLT_FN (BUILT_IN_FREXP):
3157     CASE_FLT_FN (BUILT_IN_HYPOT):
3158     CASE_FLT_FN (BUILT_IN_ILOGB):
3159     CASE_FLT_FN (BUILT_IN_LDEXP):
3160     CASE_FLT_FN (BUILT_IN_LGAMMA):
3161     CASE_FLT_FN (BUILT_IN_LLRINT):
3162     CASE_FLT_FN (BUILT_IN_LLROUND):
3163     CASE_FLT_FN (BUILT_IN_LOG):
3164     CASE_FLT_FN (BUILT_IN_LOG10):
3165     CASE_FLT_FN (BUILT_IN_LOG1P):
3166     CASE_FLT_FN (BUILT_IN_LOG2):
3167     CASE_FLT_FN (BUILT_IN_LOGB):
3168     CASE_FLT_FN (BUILT_IN_LRINT):
3169     CASE_FLT_FN (BUILT_IN_LROUND):
3170     CASE_FLT_FN (BUILT_IN_MODF):
3171     CASE_FLT_FN (BUILT_IN_NAN):
3172     CASE_FLT_FN (BUILT_IN_NEARBYINT):
3173     CASE_FLT_FN (BUILT_IN_NEXTAFTER):
3174     CASE_FLT_FN (BUILT_IN_NEXTTOWARD):
3175     CASE_FLT_FN (BUILT_IN_POW):
3176     CASE_FLT_FN (BUILT_IN_REMAINDER):
3177     CASE_FLT_FN (BUILT_IN_REMQUO):
3178     CASE_FLT_FN (BUILT_IN_RINT):
3179     CASE_FLT_FN (BUILT_IN_ROUND):
3180     CASE_FLT_FN (BUILT_IN_SCALBLN):
3181     CASE_FLT_FN (BUILT_IN_SCALBN):
3182     CASE_FLT_FN (BUILT_IN_SIN):
3183     CASE_FLT_FN (BUILT_IN_SINH):
3184     CASE_FLT_FN (BUILT_IN_SINCOS):
3185     CASE_FLT_FN (BUILT_IN_SQRT):
3186     CASE_FLT_FN (BUILT_IN_TAN):
3187     CASE_FLT_FN (BUILT_IN_TANH):
3188     CASE_FLT_FN (BUILT_IN_TGAMMA):
3189     CASE_FLT_FN (BUILT_IN_TRUNC):
3190     case BUILT_IN_ISINF:
3191     case BUILT_IN_ISNAN:
3192       return "<math.h>";
3193     CASE_FLT_FN (BUILT_IN_CABS):
3194     CASE_FLT_FN (BUILT_IN_CACOS):
3195     CASE_FLT_FN (BUILT_IN_CACOSH):
3196     CASE_FLT_FN (BUILT_IN_CARG):
3197     CASE_FLT_FN (BUILT_IN_CASIN):
3198     CASE_FLT_FN (BUILT_IN_CASINH):
3199     CASE_FLT_FN (BUILT_IN_CATAN):
3200     CASE_FLT_FN (BUILT_IN_CATANH):
3201     CASE_FLT_FN (BUILT_IN_CCOS):
3202     CASE_FLT_FN (BUILT_IN_CCOSH):
3203     CASE_FLT_FN (BUILT_IN_CEXP):
3204     CASE_FLT_FN (BUILT_IN_CIMAG):
3205     CASE_FLT_FN (BUILT_IN_CLOG):
3206     CASE_FLT_FN (BUILT_IN_CONJ):
3207     CASE_FLT_FN (BUILT_IN_CPOW):
3208     CASE_FLT_FN (BUILT_IN_CPROJ):
3209     CASE_FLT_FN (BUILT_IN_CREAL):
3210     CASE_FLT_FN (BUILT_IN_CSIN):
3211     CASE_FLT_FN (BUILT_IN_CSINH):
3212     CASE_FLT_FN (BUILT_IN_CSQRT):
3213     CASE_FLT_FN (BUILT_IN_CTAN):
3214     CASE_FLT_FN (BUILT_IN_CTANH):
3215       return "<complex.h>";
3216     case BUILT_IN_MEMCHR:
3217     case BUILT_IN_MEMCMP:
3218     case BUILT_IN_MEMCPY:
3219     case BUILT_IN_MEMMOVE:
3220     case BUILT_IN_MEMSET:
3221     case BUILT_IN_STRCAT:
3222     case BUILT_IN_STRCHR:
3223     case BUILT_IN_STRCMP:
3224     case BUILT_IN_STRCPY:
3225     case BUILT_IN_STRCSPN:
3226     case BUILT_IN_STRLEN:
3227     case BUILT_IN_STRNCAT:
3228     case BUILT_IN_STRNCMP:
3229     case BUILT_IN_STRNCPY:
3230     case BUILT_IN_STRPBRK:
3231     case BUILT_IN_STRRCHR:
3232     case BUILT_IN_STRSPN:
3233     case BUILT_IN_STRSTR:
3234       return "<string.h>";
3235     case BUILT_IN_FPRINTF:
3236     case BUILT_IN_PUTC:
3237     case BUILT_IN_FPUTC:
3238     case BUILT_IN_FPUTS:
3239     case BUILT_IN_FSCANF:
3240     case BUILT_IN_FWRITE:
3241     case BUILT_IN_PRINTF:
3242     case BUILT_IN_PUTCHAR:
3243     case BUILT_IN_PUTS:
3244     case BUILT_IN_SCANF:
3245     case BUILT_IN_SNPRINTF:
3246     case BUILT_IN_SPRINTF:
3247     case BUILT_IN_SSCANF:
3248     case BUILT_IN_VFPRINTF:
3249     case BUILT_IN_VFSCANF:
3250     case BUILT_IN_VPRINTF:
3251     case BUILT_IN_VSCANF:
3252     case BUILT_IN_VSNPRINTF:
3253     case BUILT_IN_VSPRINTF:
3254     case BUILT_IN_VSSCANF:
3255       return "<stdio.h>";
3256     case BUILT_IN_ISALNUM:
3257     case BUILT_IN_ISALPHA:
3258     case BUILT_IN_ISBLANK:
3259     case BUILT_IN_ISCNTRL:
3260     case BUILT_IN_ISDIGIT:
3261     case BUILT_IN_ISGRAPH:
3262     case BUILT_IN_ISLOWER:
3263     case BUILT_IN_ISPRINT:
3264     case BUILT_IN_ISPUNCT:
3265     case BUILT_IN_ISSPACE:
3266     case BUILT_IN_ISUPPER:
3267     case BUILT_IN_ISXDIGIT:
3268     case BUILT_IN_TOLOWER:
3269     case BUILT_IN_TOUPPER:
3270       return "<ctype.h>";
3271     case BUILT_IN_ISWALNUM:
3272     case BUILT_IN_ISWALPHA:
3273     case BUILT_IN_ISWBLANK:
3274     case BUILT_IN_ISWCNTRL:
3275     case BUILT_IN_ISWDIGIT:
3276     case BUILT_IN_ISWGRAPH:
3277     case BUILT_IN_ISWLOWER:
3278     case BUILT_IN_ISWPRINT:
3279     case BUILT_IN_ISWPUNCT:
3280     case BUILT_IN_ISWSPACE:
3281     case BUILT_IN_ISWUPPER:
3282     case BUILT_IN_ISWXDIGIT:
3283     case BUILT_IN_TOWLOWER:
3284     case BUILT_IN_TOWUPPER:
3285       return "<wctype.h>";
3286     case BUILT_IN_ABORT:
3287     case BUILT_IN_ABS:
3288     case BUILT_IN_CALLOC:
3289     case BUILT_IN_EXIT:
3290     case BUILT_IN_FREE:
3291     case BUILT_IN_LABS:
3292     case BUILT_IN_LLABS:
3293     case BUILT_IN_MALLOC:
3294     case BUILT_IN_REALLOC:
3295     case BUILT_IN__EXIT2:
3296     case BUILT_IN_ALIGNED_ALLOC:
3297       return "<stdlib.h>";
3298     case BUILT_IN_IMAXABS:
3299       return "<inttypes.h>";
3300     case BUILT_IN_STRFTIME:
3301       return "<time.h>";
3302     default:
3303       return NULL;
3304     }
3305 }
3306
3307 /* Generate an implicit declaration for identifier FUNCTIONID at LOC as a
3308    function of type int ().  */
3309
3310 tree
3311 implicitly_declare (location_t loc, tree functionid)
3312 {
3313   struct c_binding *b;
3314   tree decl = 0;
3315   tree asmspec_tree;
3316
3317   for (b = I_SYMBOL_BINDING (functionid); b; b = b->shadowed)
3318     {
3319       if (B_IN_SCOPE (b, external_scope))
3320         {
3321           decl = b->decl;
3322           break;
3323         }
3324     }
3325
3326   if (decl)
3327     {
3328       if (decl == error_mark_node)
3329         return decl;
3330
3331       /* FIXME: Objective-C has weird not-really-builtin functions
3332          which are supposed to be visible automatically.  They wind up
3333          in the external scope because they're pushed before the file
3334          scope gets created.  Catch this here and rebind them into the
3335          file scope.  */
3336       if (!DECL_BUILT_IN (decl) && DECL_IS_BUILTIN (decl))
3337         {
3338           bind (functionid, decl, file_scope,
3339                 /*invisible=*/false, /*nested=*/true,
3340                 DECL_SOURCE_LOCATION (decl));
3341           return decl;
3342         }
3343       else
3344         {
3345           tree newtype = default_function_type;
3346           if (b->u.type)
3347             TREE_TYPE (decl) = b->u.type;
3348           /* Implicit declaration of a function already declared
3349              (somehow) in a different scope, or as a built-in.
3350              If this is the first time this has happened, warn;
3351              then recycle the old declaration but with the new type.  */
3352           if (!C_DECL_IMPLICIT (decl))
3353             {
3354               implicit_decl_warning (loc, functionid, decl);
3355               C_DECL_IMPLICIT (decl) = 1;
3356             }
3357           if (DECL_BUILT_IN (decl))
3358             {
3359               newtype = build_type_attribute_variant (newtype,
3360                                                       TYPE_ATTRIBUTES
3361                                                       (TREE_TYPE (decl)));
3362               if (!comptypes (newtype, TREE_TYPE (decl)))
3363                 {
3364                   bool warned = warning_at (loc, 0, "incompatible implicit "
3365                                             "declaration of built-in "
3366                                             "function %qD", decl);
3367                   /* See if we can hint which header to include.  */
3368                   const char *header
3369                     = header_for_builtin_fn (DECL_FUNCTION_CODE (decl));
3370                   if (header != NULL && warned)
3371                     inform (loc, "include %qs or provide a declaration of %qD",
3372                             header, decl);
3373                   newtype = TREE_TYPE (decl);
3374                 }
3375             }
3376           else
3377             {
3378               if (!comptypes (newtype, TREE_TYPE (decl)))
3379                 {
3380                   error_at (loc, "incompatible implicit declaration of "
3381                             "function %qD", decl);
3382                   locate_old_decl (decl);
3383                 }
3384             }
3385           b->u.type = TREE_TYPE (decl);
3386           TREE_TYPE (decl) = newtype;
3387           bind (functionid, decl, current_scope,
3388                 /*invisible=*/false, /*nested=*/true,
3389                 DECL_SOURCE_LOCATION (decl));
3390           return decl;
3391         }
3392     }
3393
3394   /* Not seen before.  */
3395   decl = build_decl (loc, FUNCTION_DECL, functionid, default_function_type);
3396   DECL_EXTERNAL (decl) = 1;
3397   TREE_PUBLIC (decl) = 1;
3398   C_DECL_IMPLICIT (decl) = 1;
3399   implicit_decl_warning (loc, functionid, 0);
3400   asmspec_tree = maybe_apply_renaming_pragma (decl, /*asmname=*/NULL);
3401   if (asmspec_tree)
3402     set_user_assembler_name (decl, TREE_STRING_POINTER (asmspec_tree));
3403
3404   /* C89 says implicit declarations are in the innermost block.
3405      So we record the decl in the standard fashion.  */
3406   decl = pushdecl (decl);
3407
3408   /* No need to call objc_check_decl here - it's a function type.  */
3409   rest_of_decl_compilation (decl, 0, 0);
3410
3411   /* Write a record describing this implicit function declaration
3412      to the prototypes file (if requested).  */
3413   gen_aux_info_record (decl, 0, 1, 0);
3414
3415   /* Possibly apply some default attributes to this implicit declaration.  */
3416   decl_attributes (&decl, NULL_TREE, 0);
3417
3418   return decl;
3419 }
3420
3421 /* Issue an error message for a reference to an undeclared variable
3422    ID, including a reference to a builtin outside of function-call
3423    context.  Establish a binding of the identifier to error_mark_node
3424    in an appropriate scope, which will suppress further errors for the
3425    same identifier.  The error message should be given location LOC.  */
3426 void
3427 undeclared_variable (location_t loc, tree id)
3428 {
3429   static bool already = false;
3430   struct c_scope *scope;
3431
3432   if (current_function_decl == 0)
3433     {
3434       error_at (loc, "%qE undeclared here (not in a function)", id);
3435       scope = current_scope;
3436     }
3437   else
3438     {
3439       if (!objc_diagnose_private_ivar (id))
3440         error_at (loc, "%qE undeclared (first use in this function)", id);
3441       if (!already)
3442         {
3443           inform (loc, "each undeclared identifier is reported only"
3444                   " once for each function it appears in");
3445           already = true;
3446         }
3447
3448       /* If we are parsing old-style parameter decls, current_function_decl
3449          will be nonnull but current_function_scope will be null.  */
3450       scope = current_function_scope ? current_function_scope : current_scope;
3451     }
3452   bind (id, error_mark_node, scope, /*invisible=*/false, /*nested=*/false,
3453         UNKNOWN_LOCATION);
3454 }
3455 \f
3456 /* Subroutine of lookup_label, declare_label, define_label: construct a
3457    LABEL_DECL with all the proper frills.  Also create a struct
3458    c_label_vars initialized for the current scope.  */
3459
3460 static tree
3461 make_label (location_t location, tree name, bool defining,
3462             struct c_label_vars **p_label_vars)
3463 {
3464   tree label = build_decl (location, LABEL_DECL, name, void_type_node);
3465   DECL_CONTEXT (label) = current_function_decl;
3466   DECL_MODE (label) = VOIDmode;
3467
3468   c_label_vars *label_vars = ggc_alloc<c_label_vars> ();
3469   label_vars->shadowed = NULL;
3470   set_spot_bindings (&label_vars->label_bindings, defining);
3471   label_vars->decls_in_scope = make_tree_vector ();
3472   label_vars->gotos = NULL;
3473   *p_label_vars = label_vars;
3474
3475   return label;
3476 }
3477
3478 /* Get the LABEL_DECL corresponding to identifier NAME as a label.
3479    Create one if none exists so far for the current function.
3480    This is called when a label is used in a goto expression or
3481    has its address taken.  */
3482
3483 tree
3484 lookup_label (tree name)
3485 {
3486   tree label;
3487   struct c_label_vars *label_vars;
3488
3489   if (current_function_scope == 0)
3490     {
3491       error ("label %qE referenced outside of any function", name);
3492       return 0;
3493     }
3494
3495   /* Use a label already defined or ref'd with this name, but not if
3496      it is inherited from a containing function and wasn't declared
3497      using __label__.  */
3498   label = I_LABEL_DECL (name);
3499   if (label && (DECL_CONTEXT (label) == current_function_decl
3500                 || C_DECLARED_LABEL_FLAG (label)))
3501     {
3502       /* If the label has only been declared, update its apparent
3503          location to point here, for better diagnostics if it
3504          turns out not to have been defined.  */
3505       if (DECL_INITIAL (label) == NULL_TREE)
3506         DECL_SOURCE_LOCATION (label) = input_location;
3507       return label;
3508     }
3509
3510   /* No label binding for that identifier; make one.  */
3511   label = make_label (input_location, name, false, &label_vars);
3512
3513   /* Ordinary labels go in the current function scope.  */
3514   bind_label (name, label, current_function_scope, label_vars);
3515
3516   return label;
3517 }
3518
3519 /* Issue a warning about DECL for a goto statement at GOTO_LOC going
3520    to LABEL.  */
3521
3522 static void
3523 warn_about_goto (location_t goto_loc, tree label, tree decl)
3524 {
3525   if (variably_modified_type_p (TREE_TYPE (decl), NULL_TREE))
3526     error_at (goto_loc,
3527               "jump into scope of identifier with variably modified type");
3528   else
3529     warning_at (goto_loc, OPT_Wjump_misses_init,
3530                 "jump skips variable initialization");
3531   inform (DECL_SOURCE_LOCATION (label), "label %qD defined here", label);
3532   inform (DECL_SOURCE_LOCATION (decl), "%qD declared here", decl);
3533 }
3534
3535 /* Look up a label because of a goto statement.  This is like
3536    lookup_label, but also issues any appropriate warnings.  */
3537
3538 tree
3539 lookup_label_for_goto (location_t loc, tree name)
3540 {
3541   tree label;
3542   struct c_label_vars *label_vars;
3543   unsigned int ix;
3544   tree decl;
3545
3546   label = lookup_label (name);
3547   if (label == NULL_TREE)
3548     return NULL_TREE;
3549
3550   /* If we are jumping to a different function, we can't issue any
3551      useful warnings.  */
3552   if (DECL_CONTEXT (label) != current_function_decl)
3553     {
3554       gcc_assert (C_DECLARED_LABEL_FLAG (label));
3555       return label;
3556     }
3557
3558   label_vars = I_LABEL_BINDING (name)->u.label;
3559
3560   /* If the label has not yet been defined, then push this goto on a
3561      list for possible later warnings.  */
3562   if (label_vars->label_bindings.scope == NULL)
3563     {
3564       c_goto_bindings *g = ggc_alloc<c_goto_bindings> ();
3565
3566       g->loc = loc;
3567       set_spot_bindings (&g->goto_bindings, true);
3568       vec_safe_push (label_vars->gotos, g);
3569       return label;
3570     }
3571
3572   /* If there are any decls in label_vars->decls_in_scope, then this
3573      goto has missed the declaration of the decl.  This happens for a
3574      case like
3575        int i = 1;
3576       lab:
3577        ...
3578        goto lab;
3579      Issue a warning or error.  */
3580   FOR_EACH_VEC_SAFE_ELT (label_vars->decls_in_scope, ix, decl)
3581     warn_about_goto (loc, label, decl);
3582
3583   if (label_vars->label_bindings.left_stmt_expr)
3584     {
3585       error_at (loc, "jump into statement expression");
3586       inform (DECL_SOURCE_LOCATION (label), "label %qD defined here", label);
3587     }
3588
3589   return label;
3590 }
3591
3592 /* Make a label named NAME in the current function, shadowing silently
3593    any that may be inherited from containing functions or containing
3594    scopes.  This is called for __label__ declarations.  */
3595
3596 tree
3597 declare_label (tree name)
3598 {
3599   struct c_binding *b = I_LABEL_BINDING (name);
3600   tree label;
3601   struct c_label_vars *label_vars;
3602
3603   /* Check to make sure that the label hasn't already been declared
3604      at this scope */
3605   if (b && B_IN_CURRENT_SCOPE (b))
3606     {
3607       error ("duplicate label declaration %qE", name);
3608       locate_old_decl (b->decl);
3609
3610       /* Just use the previous declaration.  */
3611       return b->decl;
3612     }
3613
3614   label = make_label (input_location, name, false, &label_vars);
3615   C_DECLARED_LABEL_FLAG (label) = 1;
3616
3617   /* Declared labels go in the current scope.  */
3618   bind_label (name, label, current_scope, label_vars);
3619
3620   return label;
3621 }
3622
3623 /* When we define a label, issue any appropriate warnings if there are
3624    any gotos earlier in the function which jump to this label.  */
3625
3626 static void
3627 check_earlier_gotos (tree label, struct c_label_vars* label_vars)
3628 {
3629   unsigned int ix;
3630   struct c_goto_bindings *g;
3631
3632   FOR_EACH_VEC_SAFE_ELT (label_vars->gotos, ix, g)
3633     {
3634       struct c_binding *b;
3635       struct c_scope *scope;
3636
3637       /* We have a goto to this label.  The goto is going forward.  In
3638          g->scope, the goto is going to skip any binding which was
3639          defined after g->bindings_in_scope.  */
3640       if (g->goto_bindings.scope->has_jump_unsafe_decl)
3641         {
3642           for (b = g->goto_bindings.scope->bindings;
3643                b != g->goto_bindings.bindings_in_scope;
3644                b = b->prev)
3645             {
3646               if (decl_jump_unsafe (b->decl))
3647                 warn_about_goto (g->loc, label, b->decl);
3648             }
3649         }
3650
3651       /* We also need to warn about decls defined in any scopes
3652          between the scope of the label and the scope of the goto.  */
3653       for (scope = label_vars->label_bindings.scope;
3654            scope != g->goto_bindings.scope;
3655            scope = scope->outer)
3656         {
3657           gcc_assert (scope != NULL);
3658           if (scope->has_jump_unsafe_decl)
3659             {
3660               if (scope == label_vars->label_bindings.scope)
3661                 b = label_vars->label_bindings.bindings_in_scope;
3662               else
3663                 b = scope->bindings;
3664               for (; b != NULL; b = b->prev)
3665                 {
3666                   if (decl_jump_unsafe (b->decl))
3667                     warn_about_goto (g->loc, label, b->decl);
3668                 }
3669             }
3670         }
3671
3672       if (g->goto_bindings.stmt_exprs > 0)
3673         {
3674           error_at (g->loc, "jump into statement expression");
3675           inform (DECL_SOURCE_LOCATION (label), "label %qD defined here",
3676                   label);
3677         }
3678     }
3679
3680   /* Now that the label is defined, we will issue warnings about
3681      subsequent gotos to this label when we see them.  */
3682   vec_safe_truncate (label_vars->gotos, 0);
3683   label_vars->gotos = NULL;
3684 }
3685
3686 /* Define a label, specifying the location in the source file.
3687    Return the LABEL_DECL node for the label, if the definition is valid.
3688    Otherwise return 0.  */
3689
3690 tree
3691 define_label (location_t location, tree name)
3692 {
3693   /* Find any preexisting label with this name.  It is an error
3694      if that label has already been defined in this function, or
3695      if there is a containing function with a declared label with
3696      the same name.  */
3697   tree label = I_LABEL_DECL (name);
3698
3699   if (label
3700       && ((DECL_CONTEXT (label) == current_function_decl
3701            && DECL_INITIAL (label) != 0)
3702           || (DECL_CONTEXT (label) != current_function_decl
3703               && C_DECLARED_LABEL_FLAG (label))))
3704     {
3705       error_at (location, "duplicate label %qD", label);
3706       locate_old_decl (label);
3707       return 0;
3708     }
3709   else if (label && DECL_CONTEXT (label) == current_function_decl)
3710     {
3711       struct c_label_vars *label_vars = I_LABEL_BINDING (name)->u.label;
3712
3713       /* The label has been used or declared already in this function,
3714          but not defined.  Update its location to point to this
3715          definition.  */
3716       DECL_SOURCE_LOCATION (label) = location;
3717       set_spot_bindings (&label_vars->label_bindings, true);
3718
3719       /* Issue warnings as required about any goto statements from
3720          earlier in the function.  */
3721       check_earlier_gotos (label, label_vars);
3722     }
3723   else
3724     {
3725       struct c_label_vars *label_vars;
3726
3727       /* No label binding for that identifier; make one.  */
3728       label = make_label (location, name, true, &label_vars);
3729
3730       /* Ordinary labels go in the current function scope.  */
3731       bind_label (name, label, current_function_scope, label_vars);
3732     }
3733
3734   if (!in_system_header_at (input_location) && lookup_name (name))
3735     warning_at (location, OPT_Wtraditional,
3736                 "traditional C lacks a separate namespace "
3737                 "for labels, identifier %qE conflicts", name);
3738
3739   /* Mark label as having been defined.  */
3740   DECL_INITIAL (label) = error_mark_node;
3741   return label;
3742 }
3743 \f
3744 /* Get the bindings for a new switch statement.  This is used to issue
3745    warnings as appropriate for jumps from the switch to case or
3746    default labels.  */
3747
3748 struct c_spot_bindings *
3749 c_get_switch_bindings (void)
3750 {
3751   struct c_spot_bindings *switch_bindings;
3752
3753   switch_bindings = XNEW (struct c_spot_bindings);
3754   set_spot_bindings (switch_bindings, true);
3755   return switch_bindings;
3756 }
3757
3758 void
3759 c_release_switch_bindings (struct c_spot_bindings *bindings)
3760 {
3761   gcc_assert (bindings->stmt_exprs == 0 && !bindings->left_stmt_expr);
3762   XDELETE (bindings);
3763 }
3764
3765 /* This is called at the point of a case or default label to issue
3766    warnings about decls as needed.  It returns true if it found an
3767    error, not just a warning.  */
3768
3769 bool
3770 c_check_switch_jump_warnings (struct c_spot_bindings *switch_bindings,
3771                               location_t switch_loc, location_t case_loc)
3772 {
3773   bool saw_error;
3774   struct c_scope *scope;
3775
3776   saw_error = false;
3777   for (scope = current_scope;
3778        scope != switch_bindings->scope;
3779        scope = scope->outer)
3780     {
3781       struct c_binding *b;
3782
3783       gcc_assert (scope != NULL);
3784
3785       if (!scope->has_jump_unsafe_decl)
3786         continue;
3787
3788       for (b = scope->bindings; b != NULL; b = b->prev)
3789         {
3790           if (decl_jump_unsafe (b->decl))
3791             {
3792               if (variably_modified_type_p (TREE_TYPE (b->decl), NULL_TREE))
3793                 {
3794                   saw_error = true;
3795                   error_at (case_loc,
3796                             ("switch jumps into scope of identifier with "
3797                              "variably modified type"));
3798                 }
3799               else
3800                 warning_at (case_loc, OPT_Wjump_misses_init,
3801                             "switch jumps over variable initialization");
3802               inform (switch_loc, "switch starts here");
3803               inform (DECL_SOURCE_LOCATION (b->decl), "%qD declared here",
3804                       b->decl);
3805             }
3806         }
3807     }
3808
3809   if (switch_bindings->stmt_exprs > 0)
3810     {
3811       saw_error = true;
3812       error_at (case_loc, "switch jumps into statement expression");
3813       inform (switch_loc, "switch starts here");
3814     }
3815
3816   return saw_error;
3817 }
3818 \f
3819 /* Given NAME, an IDENTIFIER_NODE,
3820    return the structure (or union or enum) definition for that name.
3821    If THISLEVEL_ONLY is nonzero, searches only the current_scope.
3822    CODE says which kind of type the caller wants;
3823    it is RECORD_TYPE or UNION_TYPE or ENUMERAL_TYPE.
3824    If PLOC is not NULL and this returns non-null, it sets *PLOC to the
3825    location where the tag was defined.
3826    If the wrong kind of type is found, an error is reported.  */
3827
3828 static tree
3829 lookup_tag (enum tree_code code, tree name, int thislevel_only,
3830             location_t *ploc)
3831 {
3832   struct c_binding *b = I_TAG_BINDING (name);
3833   int thislevel = 0;
3834
3835   if (!b || !b->decl)
3836     return 0;
3837
3838   /* We only care about whether it's in this level if
3839      thislevel_only was set or it might be a type clash.  */
3840   if (thislevel_only || TREE_CODE (b->decl) != code)
3841     {
3842       /* For our purposes, a tag in the external scope is the same as
3843          a tag in the file scope.  (Primarily relevant to Objective-C
3844          and its builtin structure tags, which get pushed before the
3845          file scope is created.)  */
3846       if (B_IN_CURRENT_SCOPE (b)
3847           || (current_scope == file_scope && B_IN_EXTERNAL_SCOPE (b)))
3848         thislevel = 1;
3849     }
3850
3851   if (thislevel_only && !thislevel)
3852     return 0;
3853
3854   if (TREE_CODE (b->decl) != code)
3855     {
3856       /* Definition isn't the kind we were looking for.  */
3857       pending_invalid_xref = name;
3858       pending_invalid_xref_location = input_location;
3859
3860       /* If in the same binding level as a declaration as a tag
3861          of a different type, this must not be allowed to
3862          shadow that tag, so give the error immediately.
3863          (For example, "struct foo; union foo;" is invalid.)  */
3864       if (thislevel)
3865         pending_xref_error ();
3866     }
3867
3868   if (ploc != NULL)
3869     *ploc = b->locus;
3870
3871   return b->decl;
3872 }
3873
3874 /* Print an error message now
3875    for a recent invalid struct, union or enum cross reference.
3876    We don't print them immediately because they are not invalid
3877    when used in the `struct foo;' construct for shadowing.  */
3878
3879 void
3880 pending_xref_error (void)
3881 {
3882   if (pending_invalid_xref != 0)
3883     error_at (pending_invalid_xref_location, "%qE defined as wrong kind of tag",
3884               pending_invalid_xref);
3885   pending_invalid_xref = 0;
3886 }
3887
3888 \f
3889 /* Look up NAME in the current scope and its superiors
3890    in the namespace of variables, functions and typedefs.
3891    Return a ..._DECL node of some kind representing its definition,
3892    or return 0 if it is undefined.  */
3893
3894 tree
3895 lookup_name (tree name)
3896 {
3897   struct c_binding *b = I_SYMBOL_BINDING (name);
3898   if (b && !b->invisible)
3899     {
3900       maybe_record_typedef_use (b->decl);
3901       return b->decl;
3902     }
3903   return 0;
3904 }
3905
3906 /* Similar to `lookup_name' but look only at the indicated scope.  */
3907
3908 static tree
3909 lookup_name_in_scope (tree name, struct c_scope *scope)
3910 {
3911   struct c_binding *b;
3912
3913   for (b = I_SYMBOL_BINDING (name); b; b = b->shadowed)
3914     if (B_IN_SCOPE (b, scope))
3915       return b->decl;
3916   return 0;
3917 }
3918 \f
3919 /* Create the predefined scalar types of C,
3920    and some nodes representing standard constants (0, 1, (void *) 0).
3921    Initialize the global scope.
3922    Make definitions for built-in primitive functions.  */
3923
3924 void
3925 c_init_decl_processing (void)
3926 {
3927   location_t save_loc = input_location;
3928
3929   /* Initialize reserved words for parser.  */
3930   c_parse_init ();
3931
3932   current_function_decl = 0;
3933
3934   gcc_obstack_init (&parser_obstack);
3935
3936   /* Make the externals scope.  */
3937   push_scope ();
3938   external_scope = current_scope;
3939
3940   /* Declarations from c_common_nodes_and_builtins must not be associated
3941      with this input file, lest we get differences between using and not
3942      using preprocessed headers.  */
3943   input_location = BUILTINS_LOCATION;
3944
3945   c_common_nodes_and_builtins ();
3946
3947   /* In C, comparisons and TRUTH_* expressions have type int.  */
3948   truthvalue_type_node = integer_type_node;
3949   truthvalue_true_node = integer_one_node;
3950   truthvalue_false_node = integer_zero_node;
3951
3952   /* Even in C99, which has a real boolean type.  */
3953   pushdecl (build_decl (UNKNOWN_LOCATION, TYPE_DECL, get_identifier ("_Bool"),
3954                         boolean_type_node));
3955
3956   input_location = save_loc;
3957
3958   make_fname_decl = c_make_fname_decl;
3959   start_fname_decls ();
3960 }
3961
3962 /* Create the VAR_DECL at LOC for __FUNCTION__ etc. ID is the name to
3963    give the decl, NAME is the initialization string and TYPE_DEP
3964    indicates whether NAME depended on the type of the function.  As we
3965    don't yet implement delayed emission of static data, we mark the
3966    decl as emitted so it is not placed in the output.  Anything using
3967    it must therefore pull out the STRING_CST initializer directly.
3968    FIXME.  */
3969
3970 static tree
3971 c_make_fname_decl (location_t loc, tree id, int type_dep)
3972 {
3973   const char *name = fname_as_string (type_dep);
3974   tree decl, type, init;
3975   size_t length = strlen (name);
3976
3977   type = build_array_type (char_type_node,
3978                            build_index_type (size_int (length)));
3979   type = c_build_qualified_type (type, TYPE_QUAL_CONST);
3980
3981   decl = build_decl (loc, VAR_DECL, id, type);
3982
3983   TREE_STATIC (decl) = 1;
3984   TREE_READONLY (decl) = 1;
3985   DECL_ARTIFICIAL (decl) = 1;
3986
3987   init = build_string (length + 1, name);
3988   free (CONST_CAST (char *, name));
3989   TREE_TYPE (init) = type;
3990   DECL_INITIAL (decl) = init;
3991
3992   TREE_USED (decl) = 1;
3993
3994   if (current_function_decl
3995       /* For invalid programs like this:
3996
3997          void foo()
3998          const char* p = __FUNCTION__;
3999
4000          the __FUNCTION__ is believed to appear in K&R style function
4001          parameter declarator.  In that case we still don't have
4002          function_scope.  */
4003       && (!seen_error () || current_function_scope))
4004     {
4005       DECL_CONTEXT (decl) = current_function_decl;
4006       bind (id, decl, current_function_scope,
4007             /*invisible=*/false, /*nested=*/false, UNKNOWN_LOCATION);
4008     }
4009
4010   finish_decl (decl, loc, init, NULL_TREE, NULL_TREE);
4011
4012   return decl;
4013 }
4014
4015 tree
4016 c_builtin_function (tree decl)
4017 {
4018   tree type = TREE_TYPE (decl);
4019   tree   id = DECL_NAME (decl);
4020
4021   const char *name = IDENTIFIER_POINTER (id);
4022   C_DECL_BUILTIN_PROTOTYPE (decl) = prototype_p (type);
4023
4024   /* Should never be called on a symbol with a preexisting meaning.  */
4025   gcc_assert (!I_SYMBOL_BINDING (id));
4026
4027   bind (id, decl, external_scope, /*invisible=*/true, /*nested=*/false,
4028         UNKNOWN_LOCATION);
4029
4030   /* Builtins in the implementation namespace are made visible without
4031      needing to be explicitly declared.  See push_file_scope.  */
4032   if (name[0] == '_' && (name[1] == '_' || ISUPPER (name[1])))
4033     {
4034       DECL_CHAIN (decl) = visible_builtins;
4035       visible_builtins = decl;
4036     }
4037
4038   return decl;
4039 }
4040
4041 tree
4042 c_builtin_function_ext_scope (tree decl)
4043 {
4044   tree type = TREE_TYPE (decl);
4045   tree   id = DECL_NAME (decl);
4046
4047   const char *name = IDENTIFIER_POINTER (id);
4048   C_DECL_BUILTIN_PROTOTYPE (decl) = prototype_p (type);
4049
4050   if (external_scope)
4051     bind (id, decl, external_scope, /*invisible=*/false, /*nested=*/false,
4052           UNKNOWN_LOCATION);
4053
4054   /* Builtins in the implementation namespace are made visible without
4055      needing to be explicitly declared.  See push_file_scope.  */
4056   if (name[0] == '_' && (name[1] == '_' || ISUPPER (name[1])))
4057     {
4058       DECL_CHAIN (decl) = visible_builtins;
4059       visible_builtins = decl;
4060     }
4061
4062   return decl;
4063 }
4064 \f
4065 /* Called when a declaration is seen that contains no names to declare.
4066    If its type is a reference to a structure, union or enum inherited
4067    from a containing scope, shadow that tag name for the current scope
4068    with a forward reference.
4069    If its type defines a new named structure or union
4070    or defines an enum, it is valid but we need not do anything here.
4071    Otherwise, it is an error.  */
4072
4073 void
4074 shadow_tag (const struct c_declspecs *declspecs)
4075 {
4076   shadow_tag_warned (declspecs, 0);
4077 }
4078
4079 /* WARNED is 1 if we have done a pedwarn, 2 if we have done a warning,
4080    but no pedwarn.  */
4081 void
4082 shadow_tag_warned (const struct c_declspecs *declspecs, int warned)
4083 {
4084   bool found_tag = false;
4085
4086   if (declspecs->type && !declspecs->default_int_p && !declspecs->typedef_p)
4087     {
4088       tree value = declspecs->type;
4089       enum tree_code code = TREE_CODE (value);
4090
4091       if (code == RECORD_TYPE || code == UNION_TYPE || code == ENUMERAL_TYPE)
4092         /* Used to test also that TYPE_SIZE (value) != 0.
4093            That caused warning for `struct foo;' at top level in the file.  */
4094         {
4095           tree name = TYPE_NAME (value);
4096           tree t;
4097
4098           found_tag = true;
4099
4100           if (declspecs->restrict_p)
4101             {
4102               error ("invalid use of %<restrict%>");
4103               warned = 1;
4104             }
4105
4106           if (name == 0)
4107             {
4108               if (warned != 1 && code != ENUMERAL_TYPE)
4109                 /* Empty unnamed enum OK */
4110                 {
4111                   pedwarn (input_location, 0,
4112                            "unnamed struct/union that defines no instances");
4113                   warned = 1;
4114                 }
4115             }
4116           else if (declspecs->typespec_kind != ctsk_tagdef
4117                    && declspecs->typespec_kind != ctsk_tagfirstref
4118                    && declspecs->storage_class != csc_none)
4119             {
4120               if (warned != 1)
4121                 pedwarn (input_location, 0,
4122                          "empty declaration with storage class specifier "
4123                          "does not redeclare tag");
4124               warned = 1;
4125               pending_xref_error ();
4126             }
4127           else if (declspecs->typespec_kind != ctsk_tagdef
4128                    && declspecs->typespec_kind != ctsk_tagfirstref
4129                    && (declspecs->const_p
4130                        || declspecs->volatile_p
4131                        || declspecs->atomic_p
4132                        || declspecs->restrict_p
4133                        || declspecs->address_space))
4134             {
4135               if (warned != 1)
4136                 pedwarn (input_location, 0,
4137                          "empty declaration with type qualifier "
4138                           "does not redeclare tag");
4139               warned = 1;
4140               pending_xref_error ();
4141             }
4142           else if (declspecs->typespec_kind != ctsk_tagdef
4143                    && declspecs->typespec_kind != ctsk_tagfirstref
4144                    && declspecs->alignas_p)
4145             {
4146               if (warned != 1)
4147                 pedwarn (input_location, 0,
4148                          "empty declaration with %<_Alignas%> "
4149                           "does not redeclare tag");
4150               warned = 1;
4151               pending_xref_error ();
4152             }
4153           else
4154             {
4155               pending_invalid_xref = 0;
4156               t = lookup_tag (code, name, 1, NULL);
4157
4158               if (t == 0)
4159                 {
4160                   t = make_node (code);
4161                   pushtag (input_location, name, t);
4162                 }
4163             }
4164         }
4165       else
4166         {
4167           if (warned != 1 && !in_system_header_at (input_location))
4168             {
4169               pedwarn (input_location, 0,
4170                        "useless type name in empty declaration");
4171               warned = 1;
4172             }
4173         }
4174     }
4175   else if (warned != 1 && !in_system_header_at (input_location)
4176            && declspecs->typedef_p)
4177     {
4178       pedwarn (input_location, 0, "useless type name in empty declaration");
4179       warned = 1;
4180     }
4181
4182   pending_invalid_xref = 0;
4183
4184   if (declspecs->inline_p)
4185     {
4186       error ("%<inline%> in empty declaration");
4187       warned = 1;
4188     }
4189
4190   if (declspecs->noreturn_p)
4191     {
4192       error ("%<_Noreturn%> in empty declaration");
4193       warned = 1;
4194     }
4195
4196   if (current_scope == file_scope && declspecs->storage_class == csc_auto)
4197     {
4198       error ("%<auto%> in file-scope empty declaration");
4199       warned = 1;
4200     }
4201
4202   if (current_scope == file_scope && declspecs->storage_class == csc_register)
4203     {
4204       error ("%<register%> in file-scope empty declaration");
4205       warned = 1;
4206     }
4207
4208   if (!warned && !in_system_header_at (input_location)
4209       && declspecs->storage_class != csc_none)
4210     {
4211       warning (0, "useless storage class specifier in empty declaration");
4212       warned = 2;
4213     }
4214
4215   if (!warned && !in_system_header_at (input_location) && declspecs->thread_p)
4216     {
4217       warning (0, "useless %qs in empty declaration",
4218                declspecs->thread_gnu_p ? "__thread" : "_Thread_local");
4219       warned = 2;
4220     }
4221
4222   if (!warned
4223       && !in_system_header_at (input_location)
4224       && (declspecs->const_p
4225           || declspecs->volatile_p
4226           || declspecs->atomic_p
4227           || declspecs->restrict_p
4228           || declspecs->address_space))
4229     {
4230       warning (0, "useless type qualifier in empty declaration");
4231       warned = 2;
4232     }
4233
4234   if (!warned && !in_system_header_at (input_location)
4235       && declspecs->alignas_p)
4236     {
4237       warning (0, "useless %<_Alignas%> in empty declaration");
4238       warned = 2;
4239     }
4240
4241   if (warned != 1)
4242     {
4243       if (!found_tag)
4244         pedwarn (input_location, 0, "empty declaration");
4245     }
4246 }
4247 \f
4248
4249 /* Return the qualifiers from SPECS as a bitwise OR of TYPE_QUAL_*
4250    bits.  SPECS represents declaration specifiers that the grammar
4251    only permits to contain type qualifiers and attributes.  */
4252
4253 int
4254 quals_from_declspecs (const struct c_declspecs *specs)
4255 {
4256   int quals = ((specs->const_p ? TYPE_QUAL_CONST : 0)
4257                | (specs->volatile_p ? TYPE_QUAL_VOLATILE : 0)
4258                | (specs->restrict_p ? TYPE_QUAL_RESTRICT : 0)
4259                | (specs->atomic_p ? TYPE_QUAL_ATOMIC : 0)
4260                | (ENCODE_QUAL_ADDR_SPACE (specs->address_space)));
4261   gcc_assert (!specs->type
4262               && !specs->decl_attr
4263               && specs->typespec_word == cts_none
4264               && specs->storage_class == csc_none
4265               && !specs->typedef_p
4266               && !specs->explicit_signed_p
4267               && !specs->deprecated_p
4268               && !specs->long_p
4269               && !specs->long_long_p
4270               && !specs->short_p
4271               && !specs->signed_p
4272               && !specs->unsigned_p
4273               && !specs->complex_p
4274               && !specs->inline_p
4275               && !specs->noreturn_p
4276               && !specs->thread_p);
4277   return quals;
4278 }
4279
4280 /* Construct an array declarator.  LOC is the location of the
4281    beginning of the array (usually the opening brace).  EXPR is the
4282    expression inside [], or NULL_TREE.  QUALS are the type qualifiers
4283    inside the [] (to be applied to the pointer to which a parameter
4284    array is converted).  STATIC_P is true if "static" is inside the
4285    [], false otherwise.  VLA_UNSPEC_P is true if the array is [*], a
4286    VLA of unspecified length which is nevertheless a complete type,
4287    false otherwise.  The field for the contained declarator is left to
4288    be filled in by set_array_declarator_inner.  */
4289
4290 struct c_declarator *
4291 build_array_declarator (location_t loc,
4292                         tree expr, struct c_declspecs *quals, bool static_p,
4293                         bool vla_unspec_p)
4294 {
4295   struct c_declarator *declarator = XOBNEW (&parser_obstack,
4296                                             struct c_declarator);
4297   declarator->id_loc = loc;
4298   declarator->kind = cdk_array;
4299   declarator->declarator = 0;
4300   declarator->u.array.dimen = expr;
4301   if (quals)
4302     {
4303       declarator->u.array.attrs = quals->attrs;
4304       declarator->u.array.quals = quals_from_declspecs (quals);
4305     }
4306   else
4307     {
4308       declarator->u.array.attrs = NULL_TREE;
4309       declarator->u.array.quals = 0;
4310     }
4311   declarator->u.array.static_p = static_p;
4312   declarator->u.array.vla_unspec_p = vla_unspec_p;
4313   if (static_p || quals != NULL)
4314     pedwarn_c90 (loc, OPT_Wpedantic,
4315                  "ISO C90 does not support %<static%> or type "
4316                  "qualifiers in parameter array declarators");
4317   if (vla_unspec_p)
4318     pedwarn_c90 (loc, OPT_Wpedantic,
4319                  "ISO C90 does not support %<[*]%> array declarators");
4320   if (vla_unspec_p)
4321     {
4322       if (!current_scope->parm_flag)
4323         {
4324           /* C99 6.7.5.2p4 */
4325           error_at (loc, "%<[*]%> not allowed in other than "
4326                     "function prototype scope");
4327           declarator->u.array.vla_unspec_p = false;
4328           return NULL;
4329         }
4330       current_scope->had_vla_unspec = true;
4331     }
4332   return declarator;
4333 }
4334
4335 /* Set the contained declarator of an array declarator.  DECL is the
4336    declarator, as constructed by build_array_declarator; INNER is what
4337    appears on the left of the [].  */
4338
4339 struct c_declarator *
4340 set_array_declarator_inner (struct c_declarator *decl,
4341                             struct c_declarator *inner)
4342 {
4343   decl->declarator = inner;
4344   return decl;
4345 }
4346
4347 /* INIT is a constructor that forms DECL's initializer.  If the final
4348    element initializes a flexible array field, add the size of that
4349    initializer to DECL's size.  */
4350
4351 static void
4352 add_flexible_array_elts_to_size (tree decl, tree init)
4353 {
4354   tree elt, type;
4355
4356   if (vec_safe_is_empty (CONSTRUCTOR_ELTS (init)))
4357     return;
4358
4359   elt = CONSTRUCTOR_ELTS (init)->last ().value;
4360   type = TREE_TYPE (elt);
4361   if (TREE_CODE (type) == ARRAY_TYPE
4362       && TYPE_SIZE (type) == NULL_TREE
4363       && TYPE_DOMAIN (type) != NULL_TREE
4364       && TYPE_MAX_VALUE (TYPE_DOMAIN (type)) == NULL_TREE)
4365     {
4366       complete_array_type (&type, elt, false);
4367       DECL_SIZE (decl)
4368         = size_binop (PLUS_EXPR, DECL_SIZE (decl), TYPE_SIZE (type));
4369       DECL_SIZE_UNIT (decl)
4370         = size_binop (PLUS_EXPR, DECL_SIZE_UNIT (decl), TYPE_SIZE_UNIT (type));
4371     }
4372 }
4373 \f
4374 /* Decode a "typename", such as "int **", returning a ..._TYPE node.
4375    Set *EXPR, if EXPR not NULL, to any expression to be evaluated
4376    before the type name, and set *EXPR_CONST_OPERANDS, if
4377    EXPR_CONST_OPERANDS not NULL, to indicate whether the type name may
4378    appear in a constant expression.  */
4379
4380 tree
4381 groktypename (struct c_type_name *type_name, tree *expr,
4382               bool *expr_const_operands)
4383 {
4384   tree type;
4385   tree attrs = type_name->specs->attrs;
4386
4387   type_name->specs->attrs = NULL_TREE;
4388
4389   type = grokdeclarator (type_name->declarator, type_name->specs, TYPENAME,
4390                          false, NULL, &attrs, expr, expr_const_operands,
4391                          DEPRECATED_NORMAL);
4392
4393   /* Apply attributes.  */
4394   decl_attributes (&type, attrs, 0);
4395
4396   return type;
4397 }
4398
4399 /* Wrapper for decl_attributes that adds some implicit attributes
4400    to VAR_DECLs or FUNCTION_DECLs.  */
4401
4402 static tree
4403 c_decl_attributes (tree *node, tree attributes, int flags)
4404 {
4405   /* Add implicit "omp declare target" attribute if requested.  */
4406   if (current_omp_declare_target_attribute
4407       && ((TREE_CODE (*node) == VAR_DECL
4408            && (TREE_STATIC (*node) || DECL_EXTERNAL (*node)))
4409           || TREE_CODE (*node) == FUNCTION_DECL))
4410     {
4411       if (TREE_CODE (*node) == VAR_DECL
4412           && ((DECL_CONTEXT (*node)
4413                && TREE_CODE (DECL_CONTEXT (*node)) == FUNCTION_DECL)
4414               || (current_function_decl && !DECL_EXTERNAL (*node))))
4415         error ("%q+D in block scope inside of declare target directive",
4416                *node);
4417       else if (TREE_CODE (*node) == VAR_DECL
4418                && !lang_hooks.types.omp_mappable_type (TREE_TYPE (*node)))
4419         error ("%q+D in declare target directive does not have mappable type",
4420                *node);
4421       else
4422         attributes = tree_cons (get_identifier ("omp declare target"),
4423                                 NULL_TREE, attributes);
4424     }
4425   return decl_attributes (node, attributes, flags);
4426 }
4427
4428
4429 /* Decode a declarator in an ordinary declaration or data definition.
4430    This is called as soon as the type information and variable name
4431    have been parsed, before parsing the initializer if any.
4432    Here we create the ..._DECL node, fill in its type,
4433    and put it on the list of decls for the current context.
4434    The ..._DECL node is returned as the value.
4435
4436    Exception: for arrays where the length is not specified,
4437    the type is left null, to be filled in by `finish_decl'.
4438
4439    Function definitions do not come here; they go to start_function
4440    instead.  However, external and forward declarations of functions
4441    do go through here.  Structure field declarations are done by
4442    grokfield and not through here.  */
4443
4444 tree
4445 start_decl (struct c_declarator *declarator, struct c_declspecs *declspecs,
4446             bool initialized, tree attributes)
4447 {
4448   tree decl;
4449   tree tem;
4450   tree expr = NULL_TREE;
4451   enum deprecated_states deprecated_state = DEPRECATED_NORMAL;
4452
4453   /* An object declared as __attribute__((deprecated)) suppresses
4454      warnings of uses of other deprecated items.  */
4455   if (lookup_attribute ("deprecated", attributes))
4456     deprecated_state = DEPRECATED_SUPPRESS;
4457
4458   decl = grokdeclarator (declarator, declspecs,
4459                          NORMAL, initialized, NULL, &attributes, &expr, NULL,
4460                          deprecated_state);
4461   if (!decl || decl == error_mark_node)
4462     return NULL_TREE;
4463
4464   if (expr)
4465     add_stmt (fold_convert (void_type_node, expr));
4466
4467   if (TREE_CODE (decl) != FUNCTION_DECL && MAIN_NAME_P (DECL_NAME (decl)))
4468     warning (OPT_Wmain, "%q+D is usually a function", decl);
4469
4470   if (initialized)
4471     /* Is it valid for this decl to have an initializer at all?
4472        If not, set INITIALIZED to zero, which will indirectly
4473        tell 'finish_decl' to ignore the initializer once it is parsed.  */
4474     switch (TREE_CODE (decl))
4475       {
4476       case TYPE_DECL:
4477         error ("typedef %qD is initialized (use __typeof__ instead)", decl);
4478         initialized = 0;
4479         break;
4480
4481       case FUNCTION_DECL:
4482         error ("function %qD is initialized like a variable", decl);
4483         initialized = 0;
4484         break;
4485
4486       case PARM_DECL:
4487         /* DECL_INITIAL in a PARM_DECL is really DECL_ARG_TYPE.  */
4488         error ("parameter %qD is initialized", decl);
4489         initialized = 0;
4490         break;
4491
4492       default:
4493         /* Don't allow initializations for incomplete types except for
4494            arrays which might be completed by the initialization.  */
4495
4496         /* This can happen if the array size is an undefined macro.
4497            We already gave a warning, so we don't need another one.  */
4498         if (TREE_TYPE (decl) == error_mark_node)
4499           initialized = 0;
4500         else if (COMPLETE_TYPE_P (TREE_TYPE (decl)))
4501           {
4502             /* A complete type is ok if size is fixed.  */
4503
4504             if (TREE_CODE (TYPE_SIZE (TREE_TYPE (decl))) != INTEGER_CST
4505                 || C_DECL_VARIABLE_SIZE (decl))
4506               {
4507                 error ("variable-sized object may not be initialized");
4508                 initialized = 0;
4509               }
4510           }
4511         else if (TREE_CODE (TREE_TYPE (decl)) != ARRAY_TYPE)
4512           {
4513             error ("variable %qD has initializer but incomplete type", decl);
4514             initialized = 0;
4515           }
4516         else if (C_DECL_VARIABLE_SIZE (decl))
4517           {
4518             /* Although C99 is unclear about whether incomplete arrays
4519                of VLAs themselves count as VLAs, it does not make
4520                sense to permit them to be initialized given that
4521                ordinary VLAs may not be initialized.  */
4522             error ("variable-sized object may not be initialized");
4523             initialized = 0;
4524           }
4525       }
4526
4527   if (initialized)
4528     {
4529       if (current_scope == file_scope)
4530         TREE_STATIC (decl) = 1;
4531
4532       /* Tell 'pushdecl' this is an initialized decl
4533          even though we don't yet have the initializer expression.
4534          Also tell 'finish_decl' it may store the real initializer.  */
4535       DECL_INITIAL (decl) = error_mark_node;
4536     }
4537
4538   /* If this is a function declaration, write a record describing it to the
4539      prototypes file (if requested).  */
4540
4541   if (TREE_CODE (decl) == FUNCTION_DECL)
4542     gen_aux_info_record (decl, 0, 0, prototype_p (TREE_TYPE (decl)));
4543
4544   /* ANSI specifies that a tentative definition which is not merged with
4545      a non-tentative definition behaves exactly like a definition with an
4546      initializer equal to zero.  (Section 3.7.2)
4547
4548      -fno-common gives strict ANSI behavior, though this tends to break
4549      a large body of code that grew up without this rule.
4550
4551      Thread-local variables are never common, since there's no entrenched
4552      body of code to break, and it allows more efficient variable references
4553      in the presence of dynamic linking.  */
4554
4555   if (TREE_CODE (decl) == VAR_DECL
4556       && !initialized
4557       && TREE_PUBLIC (decl)
4558       && !DECL_THREAD_LOCAL_P (decl)
4559       && !flag_no_common)
4560     DECL_COMMON (decl) = 1;
4561
4562   /* Set attributes here so if duplicate decl, will have proper attributes.  */
4563   c_decl_attributes (&decl, attributes, 0);
4564
4565   /* Handle gnu_inline attribute.  */
4566   if (declspecs->inline_p
4567       && !flag_gnu89_inline
4568       && TREE_CODE (decl) == FUNCTION_DECL
4569       && (lookup_attribute ("gnu_inline", DECL_ATTRIBUTES (decl))
4570           || current_function_decl))
4571     {
4572       if (declspecs->storage_class == csc_auto && current_scope != file_scope)
4573         ;
4574       else if (declspecs->storage_class != csc_static)
4575         DECL_EXTERNAL (decl) = !DECL_EXTERNAL (decl);
4576     }
4577
4578   if (TREE_CODE (decl) == FUNCTION_DECL
4579       && targetm.calls.promote_prototypes (TREE_TYPE (decl)))
4580     {
4581       struct c_declarator *ce = declarator;
4582
4583       if (ce->kind == cdk_pointer)
4584         ce = declarator->declarator;
4585       if (ce->kind == cdk_function)
4586         {
4587           tree args = ce->u.arg_info->parms;
4588           for (; args; args = DECL_CHAIN (args))
4589             {
4590               tree type = TREE_TYPE (args);
4591               if (type && INTEGRAL_TYPE_P (type)
4592                   && TYPE_PRECISION (type) < TYPE_PRECISION (integer_type_node))
4593                 DECL_ARG_TYPE (args) = c_type_promotes_to (type);
4594             }
4595         }
4596     }
4597
4598   if (TREE_CODE (decl) == FUNCTION_DECL
4599       && DECL_DECLARED_INLINE_P (decl)
4600       && DECL_UNINLINABLE (decl)
4601       && lookup_attribute ("noinline", DECL_ATTRIBUTES (decl)))
4602     warning (OPT_Wattributes, "inline function %q+D given attribute noinline",
4603              decl);
4604
4605   /* C99 6.7.4p3: An inline definition of a function with external
4606      linkage shall not contain a definition of a modifiable object
4607      with static storage duration...  */
4608   if (TREE_CODE (decl) == VAR_DECL
4609       && current_scope != file_scope
4610       && TREE_STATIC (decl)
4611       && !TREE_READONLY (decl)
4612       && DECL_DECLARED_INLINE_P (current_function_decl)
4613       && DECL_EXTERNAL (current_function_decl))
4614     record_inline_static (input_location, current_function_decl,
4615                           decl, csi_modifiable);
4616
4617   if (c_dialect_objc () 
4618       && (TREE_CODE (decl) == VAR_DECL
4619           || TREE_CODE (decl) == FUNCTION_DECL))
4620       objc_check_global_decl (decl);
4621
4622   /* Add this decl to the current scope.
4623      TEM may equal DECL or it may be a previous decl of the same name.  */
4624   tem = pushdecl (decl);
4625
4626   if (initialized && DECL_EXTERNAL (tem))
4627     {
4628       DECL_EXTERNAL (tem) = 0;
4629       TREE_STATIC (tem) = 1;
4630     }
4631
4632   return tem;
4633 }
4634
4635 /* Subroutine of finish_decl. TYPE is the type of an uninitialized object
4636    DECL or the non-array element type if DECL is an uninitialized array.
4637    If that type has a const member, diagnose this. */
4638
4639 static void
4640 diagnose_uninitialized_cst_member (tree decl, tree type)
4641 {
4642   tree field;
4643   for (field = TYPE_FIELDS (type); field; field = TREE_CHAIN (field))
4644     {
4645       tree field_type;
4646       if (TREE_CODE (field) != FIELD_DECL)
4647         continue;
4648       field_type = strip_array_types (TREE_TYPE (field));
4649
4650       if (TYPE_QUALS (field_type) & TYPE_QUAL_CONST)
4651         {
4652           warning_at (DECL_SOURCE_LOCATION (decl), OPT_Wc___compat,
4653                       "uninitialized const member in %qT is invalid in C++",
4654                       strip_array_types (TREE_TYPE (decl)));
4655           inform (DECL_SOURCE_LOCATION (field), "%qD should be initialized", field);
4656         }
4657
4658       if (TREE_CODE (field_type) == RECORD_TYPE
4659           || TREE_CODE (field_type) == UNION_TYPE)
4660         diagnose_uninitialized_cst_member (decl, field_type);
4661     }
4662 }
4663
4664 /* Finish processing of a declaration;
4665    install its initial value.
4666    If ORIGTYPE is not NULL_TREE, it is the original type of INIT.
4667    If the length of an array type is not known before,
4668    it must be determined now, from the initial value, or it is an error.
4669
4670    INIT_LOC is the location of the initial value.  */
4671
4672 void
4673 finish_decl (tree decl, location_t init_loc, tree init,
4674              tree origtype, tree asmspec_tree)
4675 {
4676   tree type;
4677   bool was_incomplete = (DECL_SIZE (decl) == 0);
4678   const char *asmspec = 0;
4679
4680   /* If a name was specified, get the string.  */
4681   if ((TREE_CODE (decl) == FUNCTION_DECL || TREE_CODE (decl) == VAR_DECL)
4682       && DECL_FILE_SCOPE_P (decl))
4683     asmspec_tree = maybe_apply_renaming_pragma (decl, asmspec_tree);
4684   if (asmspec_tree)
4685     asmspec = TREE_STRING_POINTER (asmspec_tree);
4686
4687   if (TREE_CODE (decl) == VAR_DECL
4688       && TREE_STATIC (decl)
4689       && global_bindings_p ())
4690     /* So decl is a global variable. Record the types it uses
4691        so that we can decide later to emit debug info for them.  */
4692     record_types_used_by_current_var_decl (decl);
4693
4694   /* If `start_decl' didn't like having an initialization, ignore it now.  */
4695   if (init != 0 && DECL_INITIAL (decl) == 0)
4696     init = 0;
4697
4698   /* Don't crash if parm is initialized.  */
4699   if (TREE_CODE (decl) == PARM_DECL)
4700     init = 0;
4701
4702   if (init)
4703     store_init_value (init_loc, decl, init, origtype);
4704
4705   if (c_dialect_objc () && (TREE_CODE (decl) == VAR_DECL
4706                             || TREE_CODE (decl) == FUNCTION_DECL
4707                             || TREE_CODE (decl) == FIELD_DECL))
4708     objc_check_decl (decl);
4709
4710   type = TREE_TYPE (decl);
4711
4712   /* Deduce size of array from initialization, if not already known.  */
4713   if (TREE_CODE (type) == ARRAY_TYPE
4714       && TYPE_DOMAIN (type) == 0
4715       && TREE_CODE (decl) != TYPE_DECL)
4716     {
4717       bool do_default
4718         = (TREE_STATIC (decl)
4719            /* Even if pedantic, an external linkage array
4720               may have incomplete type at first.  */
4721            ? pedantic && !TREE_PUBLIC (decl)
4722            : !DECL_EXTERNAL (decl));
4723       int failure
4724         = complete_array_type (&TREE_TYPE (decl), DECL_INITIAL (decl),
4725                                do_default);
4726
4727       /* Get the completed type made by complete_array_type.  */
4728       type = TREE_TYPE (decl);
4729
4730       switch (failure)
4731         {
4732         case 1:
4733           error ("initializer fails to determine size of %q+D", decl);
4734           break;
4735
4736         case 2:
4737           if (do_default)
4738             error ("array size missing in %q+D", decl);
4739           /* If a `static' var's size isn't known,
4740              make it extern as well as static, so it does not get
4741              allocated.
4742              If it is not `static', then do not mark extern;
4743              finish_incomplete_decl will give it a default size
4744              and it will get allocated.  */
4745           else if (!pedantic && TREE_STATIC (decl) && !TREE_PUBLIC (decl))
4746             DECL_EXTERNAL (decl) = 1;
4747           break;
4748
4749         case 3:
4750           error ("zero or negative size array %q+D", decl);
4751           break;
4752
4753         case 0:
4754           /* For global variables, update the copy of the type that
4755              exists in the binding.  */
4756           if (TREE_PUBLIC (decl))
4757             {
4758               struct c_binding *b_ext = I_SYMBOL_BINDING (DECL_NAME (decl));
4759               while (b_ext && !B_IN_EXTERNAL_SCOPE (b_ext))
4760                 b_ext = b_ext->shadowed;
4761               if (b_ext)
4762                 {
4763                   if (b_ext->u.type && comptypes (b_ext->u.type, type))
4764                     b_ext->u.type = composite_type (b_ext->u.type, type);
4765                   else
4766                     b_ext->u.type = type;
4767                 }
4768             }
4769           break;
4770
4771         default:
4772           gcc_unreachable ();
4773         }
4774
4775       if (DECL_INITIAL (decl))
4776         TREE_TYPE (DECL_INITIAL (decl)) = type;
4777
4778       relayout_decl (decl);
4779     }
4780
4781   if (TREE_CODE (decl) == VAR_DECL)
4782     {
4783       if (init && TREE_CODE (init) == CONSTRUCTOR)
4784         add_flexible_array_elts_to_size (decl, init);
4785
4786       if (DECL_SIZE (decl) == 0 && TREE_TYPE (decl) != error_mark_node
4787           && COMPLETE_TYPE_P (TREE_TYPE (decl)))
4788         layout_decl (decl, 0);
4789
4790       if (DECL_SIZE (decl) == 0
4791           /* Don't give an error if we already gave one earlier.  */
4792           && TREE_TYPE (decl) != error_mark_node
4793           && (TREE_STATIC (decl)
4794               /* A static variable with an incomplete type
4795                  is an error if it is initialized.
4796                  Also if it is not file scope.
4797                  Otherwise, let it through, but if it is not `extern'
4798                  then it may cause an error message later.  */
4799               ? (DECL_INITIAL (decl) != 0
4800                  || !DECL_FILE_SCOPE_P (decl))
4801               /* An automatic variable with an incomplete type
4802                  is an error.  */
4803               : !DECL_EXTERNAL (decl)))
4804          {
4805            error ("storage size of %q+D isn%'t known", decl);
4806            TREE_TYPE (decl) = error_mark_node;
4807          }
4808
4809       if ((DECL_EXTERNAL (decl) || TREE_STATIC (decl))
4810           && DECL_SIZE (decl) != 0)
4811         {
4812           if (TREE_CODE (DECL_SIZE (decl)) == INTEGER_CST)
4813             constant_expression_warning (DECL_SIZE (decl));
4814           else
4815             {
4816               error ("storage size of %q+D isn%'t constant", decl);
4817               TREE_TYPE (decl) = error_mark_node;
4818             }
4819         }
4820
4821       if (TREE_USED (type))
4822         {
4823           TREE_USED (decl) = 1;
4824           DECL_READ_P (decl) = 1;
4825         }
4826     }
4827
4828   /* If this is a function and an assembler name is specified, reset DECL_RTL
4829      so we can give it its new name.  Also, update builtin_decl if it
4830      was a normal built-in.  */
4831   if (TREE_CODE (decl) == FUNCTION_DECL && asmspec)
4832     {
4833       if (DECL_BUILT_IN_CLASS (decl) == BUILT_IN_NORMAL)
4834         set_builtin_user_assembler_name (decl, asmspec);
4835       set_user_assembler_name (decl, asmspec);
4836     }
4837
4838   /* If #pragma weak was used, mark the decl weak now.  */
4839   maybe_apply_pragma_weak (decl);
4840
4841   /* Output the assembler code and/or RTL code for variables and functions,
4842      unless the type is an undefined structure or union.
4843      If not, it will get done when the type is completed.  */
4844
4845   if (TREE_CODE (decl) == VAR_DECL || TREE_CODE (decl) == FUNCTION_DECL)
4846     {
4847       /* Determine the ELF visibility.  */
4848       if (TREE_PUBLIC (decl))
4849         c_determine_visibility (decl);
4850
4851       /* This is a no-op in c-lang.c or something real in objc-act.c.  */
4852       if (c_dialect_objc ())
4853         objc_check_decl (decl);
4854
4855       if (asmspec)
4856         {
4857           /* If this is not a static variable, issue a warning.
4858              It doesn't make any sense to give an ASMSPEC for an
4859              ordinary, non-register local variable.  Historically,
4860              GCC has accepted -- but ignored -- the ASMSPEC in
4861              this case.  */
4862           if (!DECL_FILE_SCOPE_P (decl)
4863               && TREE_CODE (decl) == VAR_DECL
4864               && !C_DECL_REGISTER (decl)
4865               && !TREE_STATIC (decl))
4866             warning (0, "ignoring asm-specifier for non-static local "
4867                      "variable %q+D", decl);
4868           else
4869             set_user_assembler_name (decl, asmspec);
4870         }
4871
4872       if (DECL_FILE_SCOPE_P (decl))
4873         {
4874           if (DECL_INITIAL (decl) == NULL_TREE
4875               || DECL_INITIAL (decl) == error_mark_node)
4876             /* Don't output anything
4877                when a tentative file-scope definition is seen.
4878                But at end of compilation, do output code for them.  */
4879             DECL_DEFER_OUTPUT (decl) = 1;
4880           if (asmspec && C_DECL_REGISTER (decl))
4881             DECL_HARD_REGISTER (decl) = 1;
4882           rest_of_decl_compilation (decl, true, 0);
4883         }
4884       else
4885         {
4886           /* In conjunction with an ASMSPEC, the `register'
4887              keyword indicates that we should place the variable
4888              in a particular register.  */
4889           if (asmspec && C_DECL_REGISTER (decl))
4890             {
4891               DECL_HARD_REGISTER (decl) = 1;
4892               /* This cannot be done for a structure with volatile
4893                  fields, on which DECL_REGISTER will have been
4894                  reset.  */
4895               if (!DECL_REGISTER (decl))
4896                 error ("cannot put object with volatile field into register");
4897             }
4898
4899           if (TREE_CODE (decl) != FUNCTION_DECL)
4900             {
4901               /* If we're building a variable sized type, and we might be
4902                  reachable other than via the top of the current binding
4903                  level, then create a new BIND_EXPR so that we deallocate
4904                  the object at the right time.  */
4905               /* Note that DECL_SIZE can be null due to errors.  */
4906               if (DECL_SIZE (decl)
4907                   && !TREE_CONSTANT (DECL_SIZE (decl))
4908                   && STATEMENT_LIST_HAS_LABEL (cur_stmt_list))
4909                 {
4910                   tree bind;
4911                   bind = build3 (BIND_EXPR, void_type_node, NULL, NULL, NULL);
4912                   TREE_SIDE_EFFECTS (bind) = 1;
4913                   add_stmt (bind);
4914                   BIND_EXPR_BODY (bind) = push_stmt_list ();
4915                 }
4916               add_stmt (build_stmt (DECL_SOURCE_LOCATION (decl),
4917                                     DECL_EXPR, decl));
4918             }
4919         }
4920
4921
4922       if (!DECL_FILE_SCOPE_P (decl))
4923         {
4924           /* Recompute the RTL of a local array now
4925              if it used to be an incomplete type.  */
4926           if (was_incomplete
4927               && !TREE_STATIC (decl) && !DECL_EXTERNAL (decl))
4928             {
4929               /* If we used it already as memory, it must stay in memory.  */
4930               TREE_ADDRESSABLE (decl) = TREE_USED (decl);
4931               /* If it's still incomplete now, no init will save it.  */
4932               if (DECL_SIZE (decl) == 0)
4933                 DECL_INITIAL (decl) = 0;
4934             }
4935         }
4936     }
4937
4938   if (TREE_CODE (decl) == TYPE_DECL)
4939     {
4940       if (!DECL_FILE_SCOPE_P (decl)
4941           && variably_modified_type_p (TREE_TYPE (decl), NULL_TREE))
4942         add_stmt (build_stmt (DECL_SOURCE_LOCATION (decl), DECL_EXPR, decl));
4943
4944       rest_of_decl_compilation (decl, DECL_FILE_SCOPE_P (decl), 0);
4945     }
4946
4947   /* Install a cleanup (aka destructor) if one was given.  */
4948   if (TREE_CODE (decl) == VAR_DECL && !TREE_STATIC (decl))
4949     {
4950       tree attr = lookup_attribute ("cleanup", DECL_ATTRIBUTES (decl));
4951       if (attr)
4952         {
4953           tree cleanup_id = TREE_VALUE (TREE_VALUE (attr));
4954           tree cleanup_decl = lookup_name (cleanup_id);
4955           tree cleanup;
4956           vec<tree, va_gc> *v;
4957
4958           /* Build "cleanup(&decl)" for the destructor.  */
4959           cleanup = build_unary_op (input_location, ADDR_EXPR, decl, 0);
4960           vec_alloc (v, 1);
4961           v->quick_push (cleanup);
4962           cleanup = c_build_function_call_vec (DECL_SOURCE_LOCATION (decl),
4963                                                vNULL, cleanup_decl, v, NULL);
4964           vec_free (v);
4965
4966           /* Don't warn about decl unused; the cleanup uses it.  */
4967           TREE_USED (decl) = 1;
4968           TREE_USED (cleanup_decl) = 1;
4969           DECL_READ_P (decl) = 1;
4970
4971           push_cleanup (decl, cleanup, false);
4972         }
4973     }
4974
4975   if (warn_cxx_compat
4976       && TREE_CODE (decl) == VAR_DECL
4977       && !DECL_EXTERNAL (decl)
4978       && DECL_INITIAL (decl) == NULL_TREE)
4979     {
4980       type = strip_array_types (type);
4981       if (TREE_READONLY (decl))
4982         warning_at (DECL_SOURCE_LOCATION (decl), OPT_Wc___compat,
4983                     "uninitialized const %qD is invalid in C++", decl);
4984       else if ((TREE_CODE (type) == RECORD_TYPE
4985                 || TREE_CODE (type) == UNION_TYPE)
4986                && C_TYPE_FIELDS_READONLY (type))
4987         diagnose_uninitialized_cst_member (decl, type);
4988     }
4989
4990         invoke_plugin_callbacks (PLUGIN_FINISH_DECL, decl);
4991 }
4992
4993 /* Given a parsed parameter declaration, decode it into a PARM_DECL.
4994    EXPR is NULL or a pointer to an expression that needs to be
4995    evaluated for the side effects of array size expressions in the
4996    parameters.  */
4997
4998 tree
4999 grokparm (const struct c_parm *parm, tree *expr)
5000 {
5001   tree attrs = parm->attrs;
5002   tree decl = grokdeclarator (parm->declarator, parm->specs, PARM, false,
5003                               NULL, &attrs, expr, NULL, DEPRECATED_NORMAL);
5004
5005   decl_attributes (&decl, attrs, 0);
5006
5007   return decl;
5008 }
5009
5010 /* Given a parsed parameter declaration, decode it into a PARM_DECL
5011    and push that on the current scope.  EXPR is a pointer to an
5012    expression that needs to be evaluated for the side effects of array
5013    size expressions in the parameters.  */
5014
5015 void
5016 push_parm_decl (const struct c_parm *parm, tree *expr)
5017 {
5018   tree attrs = parm->attrs;
5019   tree decl;
5020
5021   decl = grokdeclarator (parm->declarator, parm->specs, PARM, false, NULL,
5022                          &attrs, expr, NULL, DEPRECATED_NORMAL);
5023   decl_attributes (&decl, attrs, 0);
5024
5025   decl = pushdecl (decl);
5026
5027   finish_decl (decl, input_location, NULL_TREE, NULL_TREE, NULL_TREE);
5028 }
5029
5030 /* Mark all the parameter declarations to date as forward decls.
5031    Also diagnose use of this extension.  */
5032
5033 void
5034 mark_forward_parm_decls (void)
5035 {
5036   struct c_binding *b;
5037
5038   if (pedantic && !current_scope->warned_forward_parm_decls)
5039     {
5040       pedwarn (input_location, OPT_Wpedantic,
5041                "ISO C forbids forward parameter declarations");
5042       current_scope->warned_forward_parm_decls = true;
5043     }
5044
5045   for (b = current_scope->bindings; b; b = b->prev)
5046     if (TREE_CODE (b->decl) == PARM_DECL)
5047       TREE_ASM_WRITTEN (b->decl) = 1;
5048 }
5049 \f
5050 /* Build a COMPOUND_LITERAL_EXPR.  TYPE is the type given in the compound
5051    literal, which may be an incomplete array type completed by the
5052    initializer; INIT is a CONSTRUCTOR at LOC that initializes the compound
5053    literal.  NON_CONST is true if the initializers contain something
5054    that cannot occur in a constant expression.  */
5055
5056 tree
5057 build_compound_literal (location_t loc, tree type, tree init, bool non_const)
5058 {
5059   /* We do not use start_decl here because we have a type, not a declarator;
5060      and do not use finish_decl because the decl should be stored inside
5061      the COMPOUND_LITERAL_EXPR rather than added elsewhere as a DECL_EXPR.  */
5062   tree decl;
5063   tree complit;
5064   tree stmt;
5065
5066   if (type == error_mark_node
5067       || init == error_mark_node)
5068     return error_mark_node;
5069
5070   decl = build_decl (loc, VAR_DECL, NULL_TREE, type);
5071   DECL_EXTERNAL (decl) = 0;
5072   TREE_PUBLIC (decl) = 0;
5073   TREE_STATIC (decl) = (current_scope == file_scope);
5074   DECL_CONTEXT (decl) = current_function_decl;
5075   TREE_USED (decl) = 1;
5076   DECL_READ_P (decl) = 1;
5077   TREE_TYPE (decl) = type;
5078   TREE_READONLY (decl) = (TYPE_READONLY (type)
5079                           || (TREE_CODE (type) == ARRAY_TYPE
5080                               && TYPE_READONLY (TREE_TYPE (type))));
5081   store_init_value (loc, decl, init, NULL_TREE);
5082
5083   if (TREE_CODE (type) == ARRAY_TYPE && !COMPLETE_TYPE_P (type))
5084     {
5085       int failure = complete_array_type (&TREE_TYPE (decl),
5086                                          DECL_INITIAL (decl), true);
5087       /* If complete_array_type returns 3, it means that the
5088          initial value of the compound literal is empty.  Allow it.  */
5089       gcc_assert (failure == 0 || failure == 3);
5090
5091       type = TREE_TYPE (decl);
5092       TREE_TYPE (DECL_INITIAL (decl)) = type;
5093     }
5094
5095   if (type == error_mark_node || !COMPLETE_TYPE_P (type))
5096     {
5097       c_incomplete_type_error (NULL_TREE, type);
5098       return error_mark_node;
5099     }
5100
5101   stmt = build_stmt (DECL_SOURCE_LOCATION (decl), DECL_EXPR, decl);
5102   complit = build1 (COMPOUND_LITERAL_EXPR, type, stmt);
5103   TREE_SIDE_EFFECTS (complit) = 1;
5104
5105   layout_decl (decl, 0);
5106
5107   if (TREE_STATIC (decl))
5108     {
5109       /* This decl needs a name for the assembler output.  */
5110       set_compound_literal_name (decl);
5111       DECL_DEFER_OUTPUT (decl) = 1;
5112       DECL_COMDAT (decl) = 1;
5113       DECL_ARTIFICIAL (decl) = 1;
5114       DECL_IGNORED_P (decl) = 1;
5115       pushdecl (decl);
5116       rest_of_decl_compilation (decl, 1, 0);
5117     }
5118
5119   if (non_const)
5120     {
5121       complit = build2 (C_MAYBE_CONST_EXPR, type, NULL, complit);
5122       C_MAYBE_CONST_EXPR_NON_CONST (complit) = 1;
5123     }
5124
5125   return complit;
5126 }
5127
5128 /* Check the type of a compound literal.  Here we just check that it
5129    is valid for C++.  */
5130
5131 void
5132 check_compound_literal_type (location_t loc, struct c_type_name *type_name)
5133 {
5134   if (warn_cxx_compat
5135       && (type_name->specs->typespec_kind == ctsk_tagdef
5136           || type_name->specs->typespec_kind == ctsk_tagfirstref))
5137     warning_at (loc, OPT_Wc___compat,
5138                 "defining a type in a compound literal is invalid in C++");
5139 }
5140 \f
5141 /* Determine whether TYPE is a structure with a flexible array member,
5142    or a union containing such a structure (possibly recursively).  */
5143
5144 static bool
5145 flexible_array_type_p (tree type)
5146 {
5147   tree x;
5148   switch (TREE_CODE (type))
5149     {
5150     case RECORD_TYPE:
5151       x = TYPE_FIELDS (type);
5152       if (x == NULL_TREE)
5153         return false;
5154       while (DECL_CHAIN (x) != NULL_TREE)
5155         x = DECL_CHAIN (x);
5156       if (TREE_CODE (TREE_TYPE (x)) == ARRAY_TYPE
5157           && TYPE_SIZE (TREE_TYPE (x)) == NULL_TREE
5158           && TYPE_DOMAIN (TREE_TYPE (x)) != NULL_TREE
5159           && TYPE_MAX_VALUE (TYPE_DOMAIN (TREE_TYPE (x))) == NULL_TREE)
5160         return true;
5161       return false;
5162     case UNION_TYPE:
5163       for (x = TYPE_FIELDS (type); x != NULL_TREE; x = DECL_CHAIN (x))
5164         {
5165           if (flexible_array_type_p (TREE_TYPE (x)))
5166             return true;
5167         }
5168       return false;
5169     default:
5170     return false;
5171   }
5172 }
5173 \f
5174 /* Performs sanity checks on the TYPE and WIDTH of the bit-field NAME,
5175    replacing with appropriate values if they are invalid.  */
5176 static void
5177 check_bitfield_type_and_width (tree *type, tree *width, tree orig_name)
5178 {
5179   tree type_mv;
5180   unsigned int max_width;
5181   unsigned HOST_WIDE_INT w;
5182   const char *name = (orig_name
5183                       ? identifier_to_locale (IDENTIFIER_POINTER (orig_name))
5184                       : _("<anonymous>"));
5185
5186   /* Detect and ignore out of range field width and process valid
5187      field widths.  */
5188   if (!INTEGRAL_TYPE_P (TREE_TYPE (*width)))
5189     {
5190       error ("bit-field %qs width not an integer constant", name);
5191       *width = integer_one_node;
5192     }
5193   else
5194     {
5195       if (TREE_CODE (*width) != INTEGER_CST)
5196         {
5197           *width = c_fully_fold (*width, false, NULL);
5198           if (TREE_CODE (*width) == INTEGER_CST)
5199             pedwarn (input_location, OPT_Wpedantic,
5200                      "bit-field %qs width not an integer constant expression",
5201                      name);
5202         }
5203       if (TREE_CODE (*width) != INTEGER_CST)
5204         {
5205           error ("bit-field %qs width not an integer constant", name);
5206           *width = integer_one_node;
5207         }
5208       constant_expression_warning (*width);
5209       if (tree_int_cst_sgn (*width) < 0)
5210         {
5211           error ("negative width in bit-field %qs", name);
5212           *width = integer_one_node;
5213         }
5214       else if (integer_zerop (*width) && orig_name)
5215         {
5216           error ("zero width for bit-field %qs", name);
5217           *width = integer_one_node;
5218         }
5219     }
5220
5221   /* Detect invalid bit-field type.  */
5222   if (TREE_CODE (*type) != INTEGER_TYPE
5223       && TREE_CODE (*type) != BOOLEAN_TYPE
5224       && TREE_CODE (*type) != ENUMERAL_TYPE)
5225     {
5226       error ("bit-field %qs has invalid type", name);
5227       *type = unsigned_type_node;
5228     }
5229
5230   type_mv = TYPE_MAIN_VARIANT (*type);
5231   if (!in_system_header_at (input_location)
5232       && type_mv != integer_type_node
5233       && type_mv != unsigned_type_node
5234       && type_mv != boolean_type_node)
5235     pedwarn_c90 (input_location, OPT_Wpedantic,
5236                  "type of bit-field %qs is a GCC extension", name);
5237
5238   max_width = TYPE_PRECISION (*type);
5239
5240   if (0 < compare_tree_int (*width, max_width))
5241     {
5242       error ("width of %qs exceeds its type", name);
5243       w = max_width;
5244       *width = build_int_cst (integer_type_node, w);
5245     }
5246   else
5247     w = tree_to_uhwi (*width);
5248
5249   if (TREE_CODE (*type) == ENUMERAL_TYPE)
5250     {
5251       struct lang_type *lt = TYPE_LANG_SPECIFIC (*type);
5252       if (!lt
5253           || w < tree_int_cst_min_precision (lt->enum_min, TYPE_SIGN (*type))
5254           || w < tree_int_cst_min_precision (lt->enum_max, TYPE_SIGN (*type)))
5255         warning (0, "%qs is narrower than values of its type", name);
5256     }
5257 }
5258
5259 \f
5260
5261 /* Print warning about variable length array if necessary.  */
5262
5263 static void
5264 warn_variable_length_array (tree name, tree size)
5265 {
5266   if (TREE_CONSTANT (size))
5267     {
5268       if (name)
5269         pedwarn_c90 (input_location, OPT_Wvla,
5270                      "ISO C90 forbids array %qE whose size "
5271                      "can%'t be evaluated", name);
5272       else
5273         pedwarn_c90 (input_location, OPT_Wvla, "ISO C90 forbids array "
5274                      "whose size can%'t be evaluated");
5275     }
5276   else
5277     {
5278       if (name)
5279         pedwarn_c90 (input_location, OPT_Wvla,
5280                      "ISO C90 forbids variable length array %qE", name);
5281       else
5282         pedwarn_c90 (input_location, OPT_Wvla, "ISO C90 forbids variable "
5283                      "length array");
5284     }
5285 }
5286
5287 /* Print warning about defaulting to int if necessary.  */
5288
5289 static void
5290 warn_defaults_to (location_t location, int opt, const char *gmsgid, ...)
5291 {
5292   diagnostic_info diagnostic;
5293   va_list ap;
5294
5295   va_start (ap, gmsgid);
5296   diagnostic_set_info (&diagnostic, gmsgid, &ap, location,
5297                        flag_isoc99 ? DK_PEDWARN : DK_WARNING);
5298   diagnostic.option_index = opt;
5299   report_diagnostic (&diagnostic);
5300   va_end (ap);
5301 }
5302
5303 /* Given declspecs and a declarator,
5304    determine the name and type of the object declared
5305    and construct a ..._DECL node for it.
5306    (In one case we can return a ..._TYPE node instead.
5307     For invalid input we sometimes return 0.)
5308
5309    DECLSPECS is a c_declspecs structure for the declaration specifiers.
5310
5311    DECL_CONTEXT says which syntactic context this declaration is in:
5312      NORMAL for most contexts.  Make a VAR_DECL or FUNCTION_DECL or TYPE_DECL.
5313      FUNCDEF for a function definition.  Like NORMAL but a few different
5314       error messages in each case.  Return value may be zero meaning
5315       this definition is too screwy to try to parse.
5316      PARM for a parameter declaration (either within a function prototype
5317       or before a function body).  Make a PARM_DECL, or return void_type_node.
5318      TYPENAME if for a typename (in a cast or sizeof).
5319       Don't make a DECL node; just return the ..._TYPE node.
5320      FIELD for a struct or union field; make a FIELD_DECL.
5321    INITIALIZED is true if the decl has an initializer.
5322    WIDTH is non-NULL for bit-fields, and is a pointer to an INTEGER_CST node
5323    representing the width of the bit-field.
5324    DECL_ATTRS points to the list of attributes that should be added to this
5325      decl.  Any nested attributes that belong on the decl itself will be
5326      added to this list.
5327    If EXPR is not NULL, any expressions that need to be evaluated as
5328      part of evaluating variably modified types will be stored in *EXPR.
5329    If EXPR_CONST_OPERANDS is not NULL, *EXPR_CONST_OPERANDS will be
5330      set to indicate whether operands in *EXPR can be used in constant
5331      expressions.
5332    DEPRECATED_STATE is a deprecated_states value indicating whether
5333    deprecation warnings should be suppressed.
5334
5335    In the TYPENAME case, DECLARATOR is really an absolute declarator.
5336    It may also be so in the PARM case, for a prototype where the
5337    argument type is specified but not the name.
5338
5339    This function is where the complicated C meanings of `static'
5340    and `extern' are interpreted.  */
5341
5342 static tree
5343 grokdeclarator (const struct c_declarator *declarator,
5344                 struct c_declspecs *declspecs,
5345                 enum decl_context decl_context, bool initialized, tree *width,
5346                 tree *decl_attrs, tree *expr, bool *expr_const_operands,
5347                 enum deprecated_states deprecated_state)
5348 {
5349   tree type = declspecs->type;
5350   bool threadp = declspecs->thread_p;
5351   enum c_storage_class storage_class = declspecs->storage_class;
5352   int constp;
5353   int restrictp;
5354   int volatilep;
5355   int atomicp;
5356   int type_quals = TYPE_UNQUALIFIED;
5357   tree name = NULL_TREE;
5358   bool funcdef_flag = false;
5359   bool funcdef_syntax = false;
5360   bool size_varies = false;
5361   tree decl_attr = declspecs->decl_attr;
5362   int array_ptr_quals = TYPE_UNQUALIFIED;
5363   tree array_ptr_attrs = NULL_TREE;
5364   int array_parm_static = 0;
5365   bool array_parm_vla_unspec_p = false;
5366   tree returned_attrs = NULL_TREE;
5367   bool bitfield = width != NULL;
5368   tree element_type;
5369   struct c_arg_info *arg_info = 0;
5370   addr_space_t as1, as2, address_space;
5371   location_t loc = UNKNOWN_LOCATION;
5372   const char *errmsg;
5373   tree expr_dummy;
5374   bool expr_const_operands_dummy;
5375   enum c_declarator_kind first_non_attr_kind;
5376   unsigned int alignas_align = 0;
5377
5378   if (TREE_CODE (type) == ERROR_MARK)
5379     return error_mark_node;
5380   if (expr == NULL)
5381     expr = &expr_dummy;
5382   if (expr_const_operands == NULL)
5383     expr_const_operands = &expr_const_operands_dummy;
5384
5385   *expr = declspecs->expr;
5386   *expr_const_operands = declspecs->expr_const_operands;
5387
5388   if (decl_context == FUNCDEF)
5389     funcdef_flag = true, decl_context = NORMAL;
5390
5391   /* Look inside a declarator for the name being declared
5392      and get it as an IDENTIFIER_NODE, for an error message.  */
5393   {
5394     const struct c_declarator *decl = declarator;
5395
5396     first_non_attr_kind = cdk_attrs;
5397     while (decl)
5398       switch (decl->kind)
5399         {
5400         case cdk_array:
5401           loc = decl->id_loc;
5402           /* FALL THRU.  */
5403
5404         case cdk_function:
5405         case cdk_pointer:
5406           funcdef_syntax = (decl->kind == cdk_function);
5407           decl = decl->declarator;
5408           if (first_non_attr_kind == cdk_attrs)
5409             first_non_attr_kind = decl->kind;
5410           break;
5411
5412         case cdk_attrs:
5413           decl = decl->declarator;
5414           break;
5415
5416         case cdk_id:
5417           loc = decl->id_loc;
5418           if (decl->u.id)
5419             name = decl->u.id;
5420           if (first_non_attr_kind == cdk_attrs)
5421             first_non_attr_kind = decl->kind;
5422           decl = 0;
5423           break;
5424
5425         default:
5426           gcc_unreachable ();
5427         }
5428     if (name == 0)
5429       {
5430         gcc_assert (decl_context == PARM
5431                     || decl_context == TYPENAME
5432                     || (decl_context == FIELD
5433                         && declarator->kind == cdk_id));
5434         gcc_assert (!initialized);
5435       }
5436   }
5437
5438   /* A function definition's declarator must have the form of
5439      a function declarator.  */
5440
5441   if (funcdef_flag && !funcdef_syntax)
5442     return 0;
5443
5444   /* If this looks like a function definition, make it one,
5445      even if it occurs where parms are expected.
5446      Then store_parm_decls will reject it and not use it as a parm.  */
5447   if (decl_context == NORMAL && !funcdef_flag && current_scope->parm_flag)
5448     decl_context = PARM;
5449
5450   if (declspecs->deprecated_p && deprecated_state != DEPRECATED_SUPPRESS)
5451     warn_deprecated_use (declspecs->type, declspecs->decl_attr);
5452
5453   if ((decl_context == NORMAL || decl_context == FIELD)
5454       && current_scope == file_scope
5455       && variably_modified_type_p (type, NULL_TREE))
5456     {
5457       if (name)
5458         error_at (loc, "variably modified %qE at file scope", name);
5459       else
5460         error_at (loc, "variably modified field at file scope");
5461       type = integer_type_node;
5462     }
5463
5464   size_varies = C_TYPE_VARIABLE_SIZE (type) != 0;
5465
5466   /* Diagnose defaulting to "int".  */
5467
5468   if (declspecs->default_int_p && !in_system_header_at (input_location))
5469     {
5470       /* Issue a warning if this is an ISO C 99 program or if
5471          -Wreturn-type and this is a function, or if -Wimplicit;
5472          prefer the former warning since it is more explicit.  */
5473       if ((warn_implicit_int || warn_return_type || flag_isoc99)
5474           && funcdef_flag)
5475         warn_about_return_type = 1;
5476       else
5477         {
5478           if (name)
5479             warn_defaults_to (loc, OPT_Wimplicit_int,
5480                               "type defaults to %<int%> in declaration "
5481                               "of %qE", name);
5482           else
5483             warn_defaults_to (loc, OPT_Wimplicit_int,
5484                               "type defaults to %<int%> in type name");
5485         }
5486     }
5487
5488   /* Adjust the type if a bit-field is being declared,
5489      -funsigned-bitfields applied and the type is not explicitly
5490      "signed".  */
5491   if (bitfield && !flag_signed_bitfields && !declspecs->explicit_signed_p
5492       && TREE_CODE (type) == INTEGER_TYPE)
5493     type = unsigned_type_for (type);
5494
5495   /* Figure out the type qualifiers for the declaration.  There are
5496      two ways a declaration can become qualified.  One is something
5497      like `const int i' where the `const' is explicit.  Another is
5498      something like `typedef const int CI; CI i' where the type of the
5499      declaration contains the `const'.  A third possibility is that
5500      there is a type qualifier on the element type of a typedefed
5501      array type, in which case we should extract that qualifier so
5502      that c_apply_type_quals_to_decl receives the full list of
5503      qualifiers to work with (C90 is not entirely clear about whether
5504      duplicate qualifiers should be diagnosed in this case, but it
5505      seems most appropriate to do so).  */
5506   element_type = strip_array_types (type);
5507   constp = declspecs->const_p + TYPE_READONLY (element_type);
5508   restrictp = declspecs->restrict_p + TYPE_RESTRICT (element_type);
5509   volatilep = declspecs->volatile_p + TYPE_VOLATILE (element_type);
5510   atomicp = declspecs->atomic_p + TYPE_ATOMIC (element_type);
5511   as1 = declspecs->address_space;
5512   as2 = TYPE_ADDR_SPACE (element_type);
5513   address_space = ADDR_SPACE_GENERIC_P (as1)? as2 : as1;
5514
5515   if (constp > 1)
5516     pedwarn_c90 (loc, OPT_Wpedantic, "duplicate %<const%>");
5517   if (restrictp > 1)
5518     pedwarn_c90 (loc, OPT_Wpedantic, "duplicate %<restrict%>");
5519   if (volatilep > 1)
5520     pedwarn_c90 (loc, OPT_Wpedantic, "duplicate %<volatile%>");
5521   if (atomicp > 1)
5522     pedwarn_c90 (loc, OPT_Wpedantic, "duplicate %<_Atomic%>");
5523
5524   if (!ADDR_SPACE_GENERIC_P (as1) && !ADDR_SPACE_GENERIC_P (as2) && as1 != as2)
5525     error_at (loc, "conflicting named address spaces (%s vs %s)",
5526               c_addr_space_name (as1), c_addr_space_name (as2));
5527
5528   if ((TREE_CODE (type) == ARRAY_TYPE
5529        || first_non_attr_kind == cdk_array)
5530       && TYPE_QUALS (element_type))
5531     type = TYPE_MAIN_VARIANT (type);
5532   type_quals = ((constp ? TYPE_QUAL_CONST : 0)
5533                 | (restrictp ? TYPE_QUAL_RESTRICT : 0)
5534                 | (volatilep ? TYPE_QUAL_VOLATILE : 0)
5535                 | (atomicp ? TYPE_QUAL_ATOMIC : 0)
5536                 | ENCODE_QUAL_ADDR_SPACE (address_space));
5537
5538   /* Applying the _Atomic qualifier to an array type (through the use
5539      of typedefs or typeof) must be detected here.  If the qualifier
5540      is introduced later, any appearance of applying it to an array is
5541      actually applying it to an element of that array.  */
5542   if (atomicp && TREE_CODE (type) == ARRAY_TYPE)
5543     error_at (loc, "%<_Atomic%>-qualified array type");
5544
5545   /* Warn about storage classes that are invalid for certain
5546      kinds of declarations (parameters, typenames, etc.).  */
5547
5548   if (funcdef_flag
5549       && (threadp
5550           || storage_class == csc_auto
5551           || storage_class == csc_register
5552           || storage_class == csc_typedef))
5553     {
5554       if (storage_class == csc_auto)
5555         pedwarn (loc,
5556                  (current_scope == file_scope) ? 0 : OPT_Wpedantic,
5557                  "function definition declared %<auto%>");
5558       if (storage_class == csc_register)
5559         error_at (loc, "function definition declared %<register%>");
5560       if (storage_class == csc_typedef)
5561         error_at (loc, "function definition declared %<typedef%>");
5562       if (threadp)
5563         error_at (loc, "function definition declared %qs",
5564                   declspecs->thread_gnu_p ? "__thread" : "_Thread_local");
5565       threadp = false;
5566       if (storage_class == csc_auto
5567           || storage_class == csc_register
5568           || storage_class == csc_typedef)
5569         storage_class = csc_none;
5570     }
5571   else if (decl_context != NORMAL && (storage_class != csc_none || threadp))
5572     {
5573       if (decl_context == PARM && storage_class == csc_register)
5574         ;
5575       else
5576         {
5577           switch (decl_context)
5578             {
5579             case FIELD:
5580               if (name)
5581                 error_at (loc, "storage class specified for structure "
5582                           "field %qE", name);
5583               else
5584                 error_at (loc, "storage class specified for structure field");
5585               break;
5586             case PARM:
5587               if (name)
5588                 error_at (loc, "storage class specified for parameter %qE",
5589                           name);
5590               else
5591                 error_at (loc, "storage class specified for unnamed parameter");
5592               break;
5593             default:
5594               error_at (loc, "storage class specified for typename");
5595               break;
5596             }
5597           storage_class = csc_none;
5598           threadp = false;
5599         }
5600     }
5601   else if (storage_class == csc_extern
5602            && initialized
5603            && !funcdef_flag)
5604     {
5605       /* 'extern' with initialization is invalid if not at file scope.  */
5606        if (current_scope == file_scope)
5607          {
5608            /* It is fine to have 'extern const' when compiling at C
5609               and C++ intersection.  */
5610            if (!(warn_cxx_compat && constp))
5611              warning_at (loc, 0, "%qE initialized and declared %<extern%>",
5612                          name);
5613          }
5614       else
5615         error_at (loc, "%qE has both %<extern%> and initializer", name);
5616     }
5617   else if (current_scope == file_scope)
5618     {
5619       if (storage_class == csc_auto)
5620         error_at (loc, "file-scope declaration of %qE specifies %<auto%>",
5621                   name);
5622       if (pedantic && storage_class == csc_register)
5623         pedwarn (input_location, OPT_Wpedantic,
5624                  "file-scope declaration of %qE specifies %<register%>", name);
5625     }
5626   else
5627     {
5628       if (storage_class == csc_extern && funcdef_flag)
5629         error_at (loc, "nested function %qE declared %<extern%>", name);
5630       else if (threadp && storage_class == csc_none)
5631         {
5632           error_at (loc, "function-scope %qE implicitly auto and declared "
5633                     "%qs", name,
5634                     declspecs->thread_gnu_p ? "__thread" : "_Thread_local");
5635           threadp = false;
5636         }
5637     }
5638
5639   /* Now figure out the structure of the declarator proper.
5640      Descend through it, creating more complex types, until we reach
5641      the declared identifier (or NULL_TREE, in an absolute declarator).
5642      At each stage we maintain an unqualified version of the type
5643      together with any qualifiers that should be applied to it with
5644      c_build_qualified_type; this way, array types including
5645      multidimensional array types are first built up in unqualified
5646      form and then the qualified form is created with
5647      TYPE_MAIN_VARIANT pointing to the unqualified form.  */
5648
5649   while (declarator && declarator->kind != cdk_id)
5650     {
5651       if (type == error_mark_node)
5652         {
5653           declarator = declarator->declarator;
5654           continue;
5655         }
5656
5657       /* Each level of DECLARATOR is either a cdk_array (for ...[..]),
5658          a cdk_pointer (for *...),
5659          a cdk_function (for ...(...)),
5660          a cdk_attrs (for nested attributes),
5661          or a cdk_id (for the name being declared
5662          or the place in an absolute declarator
5663          where the name was omitted).
5664          For the last case, we have just exited the loop.
5665
5666          At this point, TYPE is the type of elements of an array,
5667          or for a function to return, or for a pointer to point to.
5668          After this sequence of ifs, TYPE is the type of the
5669          array or function or pointer, and DECLARATOR has had its
5670          outermost layer removed.  */
5671
5672       if (array_ptr_quals != TYPE_UNQUALIFIED
5673           || array_ptr_attrs != NULL_TREE
5674           || array_parm_static)
5675         {
5676           /* Only the innermost declarator (making a parameter be of
5677              array type which is converted to pointer type)
5678              may have static or type qualifiers.  */
5679           error_at (loc, "static or type qualifiers in non-parameter array declarator");
5680           array_ptr_quals = TYPE_UNQUALIFIED;
5681           array_ptr_attrs = NULL_TREE;
5682           array_parm_static = 0;
5683         }
5684
5685       switch (declarator->kind)
5686         {
5687         case cdk_attrs:
5688           {
5689             /* A declarator with embedded attributes.  */
5690             tree attrs = declarator->u.attrs;
5691             const struct c_declarator *inner_decl;
5692             int attr_flags = 0;
5693             declarator = declarator->declarator;
5694             inner_decl = declarator;
5695             while (inner_decl->kind == cdk_attrs)
5696               inner_decl = inner_decl->declarator;
5697             if (inner_decl->kind == cdk_id)
5698               attr_flags |= (int) ATTR_FLAG_DECL_NEXT;
5699             else if (inner_decl->kind == cdk_function)
5700               attr_flags |= (int) ATTR_FLAG_FUNCTION_NEXT;
5701             else if (inner_decl->kind == cdk_array)
5702               attr_flags |= (int) ATTR_FLAG_ARRAY_NEXT;
5703             returned_attrs = decl_attributes (&type,
5704                                               chainon (returned_attrs, attrs),
5705                                               attr_flags);
5706             break;
5707           }
5708         case cdk_array:
5709           {
5710             tree itype = NULL_TREE;
5711             tree size = declarator->u.array.dimen;
5712             /* The index is a signed object `sizetype' bits wide.  */
5713             tree index_type = c_common_signed_type (sizetype);
5714
5715             array_ptr_quals = declarator->u.array.quals;
5716             array_ptr_attrs = declarator->u.array.attrs;
5717             array_parm_static = declarator->u.array.static_p;
5718             array_parm_vla_unspec_p = declarator->u.array.vla_unspec_p;
5719
5720             declarator = declarator->declarator;
5721
5722             /* Check for some types that there cannot be arrays of.  */
5723
5724             if (VOID_TYPE_P (type))
5725               {
5726                 if (name)
5727                   error_at (loc, "declaration of %qE as array of voids", name);
5728                 else
5729                   error_at (loc, "declaration of type name as array of voids");
5730                 type = error_mark_node;
5731               }
5732
5733             if (TREE_CODE (type) == FUNCTION_TYPE)
5734               {
5735                 if (name)
5736                   error_at (loc, "declaration of %qE as array of functions",
5737                             name);
5738                 else
5739                   error_at (loc, "declaration of type name as array of "
5740                             "functions");
5741                 type = error_mark_node;
5742               }
5743
5744             if (pedantic && !in_system_header_at (input_location)
5745                 && flexible_array_type_p (type))
5746               pedwarn (loc, OPT_Wpedantic,
5747                        "invalid use of structure with flexible array member");
5748
5749             if (size == error_mark_node)
5750               type = error_mark_node;
5751
5752             if (type == error_mark_node)
5753               continue;
5754
5755             /* If size was specified, set ITYPE to a range-type for
5756                that size.  Otherwise, ITYPE remains null.  finish_decl
5757                may figure it out from an initial value.  */
5758
5759             if (size)
5760               {
5761                 bool size_maybe_const = true;
5762                 bool size_int_const = (TREE_CODE (size) == INTEGER_CST
5763                                        && !TREE_OVERFLOW (size));
5764                 bool this_size_varies = false;
5765
5766                 /* Strip NON_LVALUE_EXPRs since we aren't using as an
5767                    lvalue.  */
5768                 STRIP_TYPE_NOPS (size);
5769
5770                 if (!INTEGRAL_TYPE_P (TREE_TYPE (size)))
5771                   {
5772                     if (name)
5773                       error_at (loc, "size of array %qE has non-integer type",
5774                                 name);
5775                     else
5776                       error_at (loc,
5777                                 "size of unnamed array has non-integer type");
5778                     size = integer_one_node;
5779                   }
5780
5781                 size = c_fully_fold (size, false, &size_maybe_const);
5782
5783                 if (pedantic && size_maybe_const && integer_zerop (size))
5784                   {
5785                     if (name)
5786                       pedwarn (loc, OPT_Wpedantic,
5787                                "ISO C forbids zero-size array %qE", name);
5788                     else
5789                       pedwarn (loc, OPT_Wpedantic,
5790                                "ISO C forbids zero-size array");
5791                   }
5792
5793                 if (TREE_CODE (size) == INTEGER_CST && size_maybe_const)
5794                   {
5795                     constant_expression_warning (size);
5796                     if (tree_int_cst_sgn (size) < 0)
5797                       {
5798                         if (name)
5799                           error_at (loc, "size of array %qE is negative", name);
5800                         else
5801                           error_at (loc, "size of unnamed array is negative");
5802                         size = integer_one_node;
5803                       }
5804                     /* Handle a size folded to an integer constant but
5805                        not an integer constant expression.  */
5806                     if (!size_int_const)
5807                       {
5808                         /* If this is a file scope declaration of an
5809                            ordinary identifier, this is invalid code;
5810                            diagnosing it here and not subsequently
5811                            treating the type as variable-length avoids
5812                            more confusing diagnostics later.  */
5813                         if ((decl_context == NORMAL || decl_context == FIELD)
5814                             && current_scope == file_scope)
5815                           pedwarn (input_location, 0,
5816                                    "variably modified %qE at file scope",
5817                                    name);
5818                         else
5819                           this_size_varies = size_varies = true;
5820                         warn_variable_length_array (name, size);
5821                       }
5822                   }
5823                 else if ((decl_context == NORMAL || decl_context == FIELD)
5824                          && current_scope == file_scope)
5825                   {
5826                     error_at (loc, "variably modified %qE at file scope", name);
5827                     size = integer_one_node;
5828                   }
5829                 else
5830                   {
5831                     /* Make sure the array size remains visibly
5832                        nonconstant even if it is (eg) a const variable
5833                        with known value.  */
5834                     this_size_varies = size_varies = true;
5835                     warn_variable_length_array (name, size);
5836                     if (flag_sanitize & SANITIZE_VLA
5837                         && decl_context == NORMAL
5838                         && do_ubsan_in_current_function ())
5839                       {
5840                         /* Evaluate the array size only once.  */
5841                         size = c_save_expr (size);
5842                         size = c_fully_fold (size, false, NULL);
5843                         size = fold_build2 (COMPOUND_EXPR, TREE_TYPE (size),
5844                                             ubsan_instrument_vla (loc, size),
5845                                             size);
5846                       }
5847                   }
5848
5849                 if (integer_zerop (size) && !this_size_varies)
5850                   {
5851                     /* A zero-length array cannot be represented with
5852                        an unsigned index type, which is what we'll
5853                        get with build_index_type.  Create an
5854                        open-ended range instead.  */
5855                     itype = build_range_type (sizetype, size, NULL_TREE);
5856                   }
5857                 else
5858                   {
5859                     /* Arrange for the SAVE_EXPR on the inside of the
5860                        MINUS_EXPR, which allows the -1 to get folded
5861                        with the +1 that happens when building TYPE_SIZE.  */
5862                     if (size_varies)
5863                       size = save_expr (size);
5864                     if (this_size_varies && TREE_CODE (size) == INTEGER_CST)
5865                       size = build2 (COMPOUND_EXPR, TREE_TYPE (size),
5866                                      integer_zero_node, size);
5867
5868                     /* Compute the maximum valid index, that is, size
5869                        - 1.  Do the calculation in index_type, so that
5870                        if it is a variable the computations will be
5871                        done in the proper mode.  */
5872                     itype = fold_build2_loc (loc, MINUS_EXPR, index_type,
5873                                              convert (index_type, size),
5874                                              convert (index_type,
5875                                                       size_one_node));
5876
5877                     /* The above overflows when size does not fit
5878                        in index_type.
5879                        ???  While a size of INT_MAX+1 technically shouldn't
5880                        cause an overflow (because we subtract 1), handling
5881                        this case seems like an unnecessary complication.  */
5882                     if (TREE_CODE (size) == INTEGER_CST
5883                         && !int_fits_type_p (size, index_type))
5884                       {
5885                         if (name)
5886                           error_at (loc, "size of array %qE is too large",
5887                                     name);
5888                         else
5889                           error_at (loc, "size of unnamed array is too large");
5890                         type = error_mark_node;
5891                         continue;
5892                       }
5893
5894                     itype = build_index_type (itype);
5895                   }
5896                 if (this_size_varies)
5897                   {
5898                     if (*expr)
5899                       *expr = build2 (COMPOUND_EXPR, TREE_TYPE (size),
5900                                       *expr, size);
5901                     else
5902                       *expr = size;
5903                     *expr_const_operands &= size_maybe_const;
5904                   }
5905               }
5906             else if (decl_context == FIELD)
5907               {
5908                 bool flexible_array_member = false;
5909                 if (array_parm_vla_unspec_p)
5910                   /* Field names can in fact have function prototype
5911                      scope so [*] is disallowed here through making
5912                      the field variably modified, not through being
5913                      something other than a declaration with function
5914                      prototype scope.  */
5915                   size_varies = true;
5916                 else
5917                   {
5918                     const struct c_declarator *t = declarator;
5919                     while (t->kind == cdk_attrs)
5920                       t = t->declarator;
5921                     flexible_array_member = (t->kind == cdk_id);
5922                   }
5923                 if (flexible_array_member
5924                     && !in_system_header_at (input_location))
5925                   pedwarn_c90 (loc, OPT_Wpedantic, "ISO C90 does not "
5926                                "support flexible array members");
5927
5928                 /* ISO C99 Flexible array members are effectively
5929                    identical to GCC's zero-length array extension.  */
5930                 if (flexible_array_member || array_parm_vla_unspec_p)
5931                   itype = build_range_type (sizetype, size_zero_node,
5932                                             NULL_TREE);
5933               }
5934             else if (decl_context == PARM)
5935               {
5936                 if (array_parm_vla_unspec_p)
5937                   {
5938                     itype = build_range_type (sizetype, size_zero_node, NULL_TREE);
5939                     size_varies = true;
5940                   }
5941               }
5942             else if (decl_context == TYPENAME)
5943               {
5944                 if (array_parm_vla_unspec_p)
5945                   {
5946                     /* C99 6.7.5.2p4 */
5947                     warning (0, "%<[*]%> not in a declaration");
5948                     /* We use this to avoid messing up with incomplete
5949                        array types of the same type, that would
5950                        otherwise be modified below.  */
5951                     itype = build_range_type (sizetype, size_zero_node,
5952                                               NULL_TREE);
5953                     size_varies = true;
5954                   }
5955               }
5956
5957             /* Complain about arrays of incomplete types.  */
5958             if (!COMPLETE_TYPE_P (type))
5959               {
5960                 error_at (loc, "array type has incomplete element type %qT",
5961                           type);
5962                 type = error_mark_node;
5963               }
5964             else
5965             /* When itype is NULL, a shared incomplete array type is
5966                returned for all array of a given type.  Elsewhere we
5967                make sure we don't complete that type before copying
5968                it, but here we want to make sure we don't ever
5969                modify the shared type, so we gcc_assert (itype)
5970                below.  */
5971               {
5972                 addr_space_t as = DECODE_QUAL_ADDR_SPACE (type_quals);
5973                 if (!ADDR_SPACE_GENERIC_P (as) && as != TYPE_ADDR_SPACE (type))
5974                   type = build_qualified_type (type,
5975                                                ENCODE_QUAL_ADDR_SPACE (as));
5976
5977                 type = build_array_type (type, itype);
5978               }
5979
5980             if (type != error_mark_node)
5981               {
5982                 if (size_varies)
5983                   {
5984                     /* It is ok to modify type here even if itype is
5985                        NULL: if size_varies, we're in a
5986                        multi-dimensional array and the inner type has
5987                        variable size, so the enclosing shared array type
5988                        must too.  */
5989                     if (size && TREE_CODE (size) == INTEGER_CST)
5990                       type
5991                         = build_distinct_type_copy (TYPE_MAIN_VARIANT (type));
5992                     C_TYPE_VARIABLE_SIZE (type) = 1;
5993                   }
5994
5995                 /* The GCC extension for zero-length arrays differs from
5996                    ISO flexible array members in that sizeof yields
5997                    zero.  */
5998                 if (size && integer_zerop (size))
5999                   {
6000                     gcc_assert (itype);
6001                     type = build_distinct_type_copy (TYPE_MAIN_VARIANT (type));
6002                     TYPE_SIZE (type) = bitsize_zero_node;
6003                     TYPE_SIZE_UNIT (type) = size_zero_node;
6004                     SET_TYPE_STRUCTURAL_EQUALITY (type);
6005                   }
6006                 if (array_parm_vla_unspec_p)
6007                   {
6008                     gcc_assert (itype);
6009                     /* The type is complete.  C99 6.7.5.2p4  */
6010                     type = build_distinct_type_copy (TYPE_MAIN_VARIANT (type));
6011                     TYPE_SIZE (type) = bitsize_zero_node;
6012                     TYPE_SIZE_UNIT (type) = size_zero_node;
6013                     SET_TYPE_STRUCTURAL_EQUALITY (type);
6014                   }
6015               }
6016
6017             if (decl_context != PARM
6018                 && (array_ptr_quals != TYPE_UNQUALIFIED
6019                     || array_ptr_attrs != NULL_TREE
6020                     || array_parm_static))
6021               {
6022                 error_at (loc, "static or type qualifiers in non-parameter array declarator");
6023                 array_ptr_quals = TYPE_UNQUALIFIED;
6024                 array_ptr_attrs = NULL_TREE;
6025                 array_parm_static = 0;
6026               }
6027             break;
6028           }
6029         case cdk_function:
6030           {
6031             /* Say it's a definition only for the declarator closest
6032                to the identifier, apart possibly from some
6033                attributes.  */
6034             bool really_funcdef = false;
6035             tree arg_types;
6036             if (funcdef_flag)
6037               {
6038                 const struct c_declarator *t = declarator->declarator;
6039                 while (t->kind == cdk_attrs)
6040                   t = t->declarator;
6041                 really_funcdef = (t->kind == cdk_id);
6042               }
6043
6044             /* Declaring a function type.  Make sure we have a valid
6045                type for the function to return.  */
6046             if (type == error_mark_node)
6047               continue;
6048
6049             size_varies = false;
6050
6051             /* Warn about some types functions can't return.  */
6052             if (TREE_CODE (type) == FUNCTION_TYPE)
6053               {
6054                 if (name)
6055                   error_at (loc, "%qE declared as function returning a "
6056                                  "function", name);
6057                 else
6058                   error_at (loc, "type name declared as function "
6059                             "returning a function");
6060                 type = integer_type_node;
6061               }
6062             if (TREE_CODE (type) == ARRAY_TYPE)
6063               {
6064                 if (name)
6065                   error_at (loc, "%qE declared as function returning an array",
6066                             name);
6067                 else
6068                   error_at (loc, "type name declared as function returning "
6069                             "an array");
6070                 type = integer_type_node;
6071               }
6072             errmsg = targetm.invalid_return_type (type);
6073             if (errmsg)
6074               {
6075                 error (errmsg);
6076                 type = integer_type_node;
6077               }
6078
6079             /* Construct the function type and go to the next
6080                inner layer of declarator.  */
6081             arg_info = declarator->u.arg_info;
6082             arg_types = grokparms (arg_info, really_funcdef);
6083
6084             /* Type qualifiers before the return type of the function
6085                qualify the return type, not the function type.  */
6086             if (type_quals)
6087               {
6088                 /* Type qualifiers on a function return type are
6089                    normally permitted by the standard but have no
6090                    effect, so give a warning at -Wreturn-type.
6091                    Qualifiers on a void return type are banned on
6092                    function definitions in ISO C; GCC used to used
6093                    them for noreturn functions.  */
6094                 if (VOID_TYPE_P (type) && really_funcdef)
6095                   pedwarn (loc, 0,
6096                            "function definition has qualified void return type");
6097                 else
6098                   warning_at (loc, OPT_Wignored_qualifiers,
6099                            "type qualifiers ignored on function return type");
6100
6101                 type = c_build_qualified_type (type, type_quals);
6102               }
6103             type_quals = TYPE_UNQUALIFIED;
6104
6105             type = build_function_type (type, arg_types);
6106             declarator = declarator->declarator;
6107
6108             /* Set the TYPE_CONTEXTs for each tagged type which is local to
6109                the formal parameter list of this FUNCTION_TYPE to point to
6110                the FUNCTION_TYPE node itself.  */
6111             {
6112               c_arg_tag *tag;
6113               unsigned ix;
6114
6115               FOR_EACH_VEC_SAFE_ELT_REVERSE (arg_info->tags, ix, tag)
6116                 TYPE_CONTEXT (tag->type) = type;
6117             }
6118             break;
6119           }
6120         case cdk_pointer:
6121           {
6122             /* Merge any constancy or volatility into the target type
6123                for the pointer.  */
6124             if ((type_quals & TYPE_QUAL_ATOMIC)
6125                 && TREE_CODE (type) == FUNCTION_TYPE)
6126               {
6127                 error_at (loc,
6128                           "%<_Atomic%>-qualified function type");
6129                 type_quals &= ~TYPE_QUAL_ATOMIC;
6130               }
6131             else if (pedantic && TREE_CODE (type) == FUNCTION_TYPE
6132                      && type_quals)
6133               pedwarn (loc, OPT_Wpedantic,
6134                        "ISO C forbids qualified function types");
6135             if (type_quals)
6136               type = c_build_qualified_type (type, type_quals);
6137             size_varies = false;
6138
6139             /* When the pointed-to type involves components of variable size,
6140                care must be taken to ensure that the size evaluation code is
6141                emitted early enough to dominate all the possible later uses
6142                and late enough for the variables on which it depends to have
6143                been assigned.
6144
6145                This is expected to happen automatically when the pointed-to
6146                type has a name/declaration of it's own, but special attention
6147                is required if the type is anonymous.
6148
6149                We handle the NORMAL and FIELD contexts here by attaching an
6150                artificial TYPE_DECL to such pointed-to type.  This forces the
6151                sizes evaluation at a safe point and ensures it is not deferred
6152                until e.g. within a deeper conditional context.
6153
6154                We expect nothing to be needed here for PARM or TYPENAME.
6155                Pushing a TYPE_DECL at this point for TYPENAME would actually
6156                be incorrect, as we might be in the middle of an expression
6157                with side effects on the pointed-to type size "arguments" prior
6158                to the pointer declaration point and the fake TYPE_DECL in the
6159                enclosing context would force the size evaluation prior to the
6160                side effects.  */
6161
6162             if (!TYPE_NAME (type)
6163                 && (decl_context == NORMAL || decl_context == FIELD)
6164                 && variably_modified_type_p (type, NULL_TREE))
6165               {
6166                 tree decl = build_decl (loc, TYPE_DECL, NULL_TREE, type);
6167                 DECL_ARTIFICIAL (decl) = 1;
6168                 pushdecl (decl);
6169                 finish_decl (decl, loc, NULL_TREE, NULL_TREE, NULL_TREE);
6170                 TYPE_NAME (type) = decl;
6171               }
6172
6173             type = c_build_pointer_type (type);
6174
6175             /* Process type qualifiers (such as const or volatile)
6176                that were given inside the `*'.  */
6177             type_quals = declarator->u.pointer_quals;
6178
6179             declarator = declarator->declarator;
6180             break;
6181           }
6182         default:
6183           gcc_unreachable ();
6184         }
6185     }
6186   *decl_attrs = chainon (returned_attrs, *decl_attrs);
6187
6188   /* Now TYPE has the actual type, apart from any qualifiers in
6189      TYPE_QUALS.  */
6190
6191   /* Warn about address space used for things other than static memory or
6192      pointers.  */
6193   address_space = DECODE_QUAL_ADDR_SPACE (type_quals);
6194   if (!ADDR_SPACE_GENERIC_P (address_space))
6195     {
6196       if (decl_context == NORMAL)
6197         {
6198           switch (storage_class)
6199             {
6200             case csc_auto:
6201               error ("%qs combined with %<auto%> qualifier for %qE",
6202                      c_addr_space_name (address_space), name);
6203               break;
6204             case csc_register:
6205               error ("%qs combined with %<register%> qualifier for %qE",
6206                      c_addr_space_name (address_space), name);
6207               break;
6208             case csc_none:
6209               if (current_function_scope)
6210                 {
6211                   error ("%qs specified for auto variable %qE",
6212                          c_addr_space_name (address_space), name);
6213                   break;
6214                 }
6215               break;
6216             case csc_static:
6217             case csc_extern:
6218             case csc_typedef:
6219               break;
6220             default:
6221               gcc_unreachable ();
6222             }
6223         }
6224       else if (decl_context == PARM && TREE_CODE (type) != ARRAY_TYPE)
6225         {
6226           if (name)
6227             error ("%qs specified for parameter %qE",
6228                    c_addr_space_name (address_space), name);
6229           else
6230             error ("%qs specified for unnamed parameter",
6231                    c_addr_space_name (address_space));
6232         }
6233       else if (decl_context == FIELD)
6234         {
6235           if (name)
6236             error ("%qs specified for structure field %qE",
6237                    c_addr_space_name (address_space), name);
6238           else
6239             error ("%qs specified for structure field",
6240                    c_addr_space_name (address_space));
6241         }
6242     }
6243
6244   /* Check the type and width of a bit-field.  */
6245   if (bitfield)
6246     {
6247       check_bitfield_type_and_width (&type, width, name);
6248       /* C11 makes it implementation-defined (6.7.2.1#5) whether
6249          atomic types are permitted for bit-fields; we have no code to
6250          make bit-field accesses atomic, so disallow them.  */
6251       if (type_quals & TYPE_QUAL_ATOMIC)
6252         {
6253           if (name)
6254             error ("bit-field %qE has atomic type", name);
6255           else
6256             error ("bit-field has atomic type");
6257           type_quals &= ~TYPE_QUAL_ATOMIC;
6258         }
6259     }
6260
6261   /* Reject invalid uses of _Alignas.  */
6262   if (declspecs->alignas_p)
6263     {
6264       if (storage_class == csc_typedef)
6265         error_at (loc, "alignment specified for typedef %qE", name);
6266       else if (storage_class == csc_register)
6267         error_at (loc, "alignment specified for %<register%> object %qE",
6268                   name);
6269       else if (decl_context == PARM)
6270         {
6271           if (name)
6272             error_at (loc, "alignment specified for parameter %qE", name);
6273           else
6274             error_at (loc, "alignment specified for unnamed parameter");
6275         }
6276       else if (bitfield)
6277         {
6278           if (name)
6279             error_at (loc, "alignment specified for bit-field %qE", name);
6280           else
6281             error_at (loc, "alignment specified for unnamed bit-field");
6282         }
6283       else if (TREE_CODE (type) == FUNCTION_TYPE)
6284         error_at (loc, "alignment specified for function %qE", name);
6285       else if (declspecs->align_log != -1)
6286         {
6287           alignas_align = 1U << declspecs->align_log;
6288           if (alignas_align < min_align_of_type (type))
6289             {
6290               if (name)
6291                 error_at (loc, "%<_Alignas%> specifiers cannot reduce "
6292                           "alignment of %qE", name);
6293               else
6294                 error_at (loc, "%<_Alignas%> specifiers cannot reduce "
6295                           "alignment of unnamed field");
6296               alignas_align = 0;
6297             }
6298         }
6299     }
6300
6301   /* Did array size calculations overflow or does the array cover more
6302      than half of the address-space?  */
6303   if (TREE_CODE (type) == ARRAY_TYPE
6304       && COMPLETE_TYPE_P (type)
6305       && TREE_CODE (TYPE_SIZE_UNIT (type)) == INTEGER_CST
6306       && ! valid_constant_size_p (TYPE_SIZE_UNIT (type)))
6307     {
6308       if (name)
6309         error_at (loc, "size of array %qE is too large", name);
6310       else
6311         error_at (loc, "size of unnamed array is too large");
6312       /* If we proceed with the array type as it is, we'll eventually
6313          crash in tree_to_[su]hwi().  */
6314       type = error_mark_node;
6315     }
6316
6317   /* If this is declaring a typedef name, return a TYPE_DECL.  */
6318
6319   if (storage_class == csc_typedef)
6320     {
6321       tree decl;
6322       if ((type_quals & TYPE_QUAL_ATOMIC)
6323           && TREE_CODE (type) == FUNCTION_TYPE)
6324         {
6325           error_at (loc,
6326                     "%<_Atomic%>-qualified function type");
6327           type_quals &= ~TYPE_QUAL_ATOMIC;
6328         }
6329       else if (pedantic && TREE_CODE (type) == FUNCTION_TYPE
6330                && type_quals)
6331         pedwarn (loc, OPT_Wpedantic,
6332                  "ISO C forbids qualified function types");
6333       if (type_quals)
6334         type = c_build_qualified_type (type, type_quals);
6335       decl = build_decl (declarator->id_loc,
6336                          TYPE_DECL, declarator->u.id, type);
6337       if (declspecs->explicit_signed_p)
6338         C_TYPEDEF_EXPLICITLY_SIGNED (decl) = 1;
6339       if (declspecs->inline_p)
6340         pedwarn (loc, 0,"typedef %q+D declared %<inline%>", decl);
6341       if (declspecs->noreturn_p)
6342         pedwarn (loc, 0,"typedef %q+D declared %<_Noreturn%>", decl);
6343
6344       if (warn_cxx_compat && declarator->u.id != NULL_TREE)
6345         {
6346           struct c_binding *b = I_TAG_BINDING (declarator->u.id);
6347
6348           if (b != NULL
6349               && b->decl != NULL_TREE
6350               && (B_IN_CURRENT_SCOPE (b)
6351                   || (current_scope == file_scope && B_IN_EXTERNAL_SCOPE (b)))
6352               && TYPE_MAIN_VARIANT (b->decl) != TYPE_MAIN_VARIANT (type))
6353             {
6354               warning_at (declarator->id_loc, OPT_Wc___compat,
6355                           ("using %qD as both a typedef and a tag is "
6356                            "invalid in C++"),
6357                           decl);
6358               if (b->locus != UNKNOWN_LOCATION)
6359                 inform (b->locus, "originally defined here");
6360             }
6361         }
6362
6363       return decl;
6364     }
6365
6366   /* If this is a type name (such as, in a cast or sizeof),
6367      compute the type and return it now.  */
6368
6369   if (decl_context == TYPENAME)
6370     {
6371       /* Note that the grammar rejects storage classes in typenames
6372          and fields.  */
6373       gcc_assert (storage_class == csc_none && !threadp
6374                   && !declspecs->inline_p && !declspecs->noreturn_p);
6375       if ((type_quals & TYPE_QUAL_ATOMIC)
6376           && TREE_CODE (type) == FUNCTION_TYPE)
6377         {
6378           error_at (loc,
6379                     "%<_Atomic%>-qualified function type");
6380           type_quals &= ~TYPE_QUAL_ATOMIC;
6381         }
6382       else if (pedantic && TREE_CODE (type) == FUNCTION_TYPE
6383                && type_quals)
6384         pedwarn (loc, OPT_Wpedantic,
6385                  "ISO C forbids const or volatile function types");
6386       if (type_quals)
6387         type = c_build_qualified_type (type, type_quals);
6388       return type;
6389     }
6390
6391   if (pedantic && decl_context == FIELD
6392       && variably_modified_type_p (type, NULL_TREE))
6393     {
6394       /* C99 6.7.2.1p8 */
6395       pedwarn (loc, OPT_Wpedantic, "a member of a structure or union cannot "
6396                "have a variably modified type");
6397     }
6398
6399   /* Aside from typedefs and type names (handle above),
6400      `void' at top level (not within pointer)
6401      is allowed only in public variables.
6402      We don't complain about parms either, but that is because
6403      a better error message can be made later.  */
6404
6405   if (VOID_TYPE_P (type) && decl_context != PARM
6406       && !((decl_context != FIELD && TREE_CODE (type) != FUNCTION_TYPE)
6407             && (storage_class == csc_extern
6408                 || (current_scope == file_scope
6409                     && !(storage_class == csc_static
6410                          || storage_class == csc_register)))))
6411     {
6412       error_at (loc, "variable or field %qE declared void", name);
6413       type = integer_type_node;
6414     }
6415
6416   /* Now create the decl, which may be a VAR_DECL, a PARM_DECL
6417      or a FUNCTION_DECL, depending on DECL_CONTEXT and TYPE.  */
6418
6419   {
6420     tree decl;
6421
6422     if (decl_context == PARM)
6423       {
6424         tree promoted_type;
6425         bool array_parameter_p = false;
6426
6427         /* A parameter declared as an array of T is really a pointer to T.
6428            One declared as a function is really a pointer to a function.  */
6429
6430         if (TREE_CODE (type) == ARRAY_TYPE)
6431           {
6432             /* Transfer const-ness of array into that of type pointed to.  */
6433             type = TREE_TYPE (type);
6434             if (type_quals)
6435               type = c_build_qualified_type (type, type_quals);
6436             type = c_build_pointer_type (type);
6437             type_quals = array_ptr_quals;
6438             if (type_quals)
6439               type = c_build_qualified_type (type, type_quals);
6440
6441             /* We don't yet implement attributes in this context.  */
6442             if (array_ptr_attrs != NULL_TREE)
6443               warning_at (loc, OPT_Wattributes,
6444                           "attributes in parameter array declarator ignored");
6445
6446             size_varies = false;
6447             array_parameter_p = true;
6448           }
6449         else if (TREE_CODE (type) == FUNCTION_TYPE)
6450           {
6451             if (type_quals & TYPE_QUAL_ATOMIC)
6452               {
6453                 error_at (loc,
6454                           "%<_Atomic%>-qualified function type");
6455                 type_quals &= ~TYPE_QUAL_ATOMIC;
6456               }
6457             else if (type_quals)
6458               pedwarn (loc, OPT_Wpedantic,
6459                        "ISO C forbids qualified function types");
6460             if (type_quals)
6461               type = c_build_qualified_type (type, type_quals);
6462             type = c_build_pointer_type (type);
6463             type_quals = TYPE_UNQUALIFIED;
6464           }
6465         else if (type_quals)
6466           type = c_build_qualified_type (type, type_quals);
6467
6468         decl = build_decl (declarator->id_loc,
6469                            PARM_DECL, declarator->u.id, type);
6470         if (size_varies)
6471           C_DECL_VARIABLE_SIZE (decl) = 1;
6472         C_ARRAY_PARAMETER (decl) = array_parameter_p;
6473
6474         /* Compute the type actually passed in the parmlist,
6475            for the case where there is no prototype.
6476            (For example, shorts and chars are passed as ints.)
6477            When there is a prototype, this is overridden later.  */
6478
6479         if (type == error_mark_node)
6480           promoted_type = type;
6481         else
6482           promoted_type = c_type_promotes_to (type);
6483
6484         DECL_ARG_TYPE (decl) = promoted_type;
6485         if (declspecs->inline_p)
6486           pedwarn (loc, 0, "parameter %q+D declared %<inline%>", decl);
6487         if (declspecs->noreturn_p)
6488           pedwarn (loc, 0, "parameter %q+D declared %<_Noreturn%>", decl);
6489       }
6490     else if (decl_context == FIELD)
6491       {
6492         /* Note that the grammar rejects storage classes in typenames
6493            and fields.  */
6494         gcc_assert (storage_class == csc_none && !threadp
6495                     && !declspecs->inline_p && !declspecs->noreturn_p);
6496
6497         /* Structure field.  It may not be a function.  */
6498
6499         if (TREE_CODE (type) == FUNCTION_TYPE)
6500           {
6501             error_at (loc, "field %qE declared as a function", name);
6502             type = build_pointer_type (type);
6503           }
6504         else if (TREE_CODE (type) != ERROR_MARK
6505                  && !COMPLETE_OR_UNBOUND_ARRAY_TYPE_P (type))
6506           {
6507             if (name)
6508               error_at (loc, "field %qE has incomplete type", name);
6509             else
6510               error_at (loc, "unnamed field has incomplete type");
6511             type = error_mark_node;
6512           }
6513         else if (TREE_CODE (type) == ARRAY_TYPE
6514                  && TYPE_DOMAIN (type) == NULL_TREE)
6515           {
6516             /* We have a flexible array member through a typedef.
6517                Set suitable range.  Whether this is a correct position
6518                for a flexible array member will be determined elsewhere.  */
6519             if (!in_system_header_at (input_location))
6520               pedwarn_c90 (loc, OPT_Wpedantic, "ISO C90 does not "
6521                            "support flexible array members");
6522             type = build_distinct_type_copy (TYPE_MAIN_VARIANT (type));
6523             TYPE_DOMAIN (type) = build_range_type (sizetype, size_zero_node,
6524                                                    NULL_TREE);
6525           }
6526         type = c_build_qualified_type (type, type_quals);
6527         decl = build_decl (declarator->id_loc,
6528                            FIELD_DECL, declarator->u.id, type);
6529         DECL_NONADDRESSABLE_P (decl) = bitfield;
6530         if (bitfield && !declarator->u.id)
6531           TREE_NO_WARNING (decl) = 1;
6532
6533         if (size_varies)
6534           C_DECL_VARIABLE_SIZE (decl) = 1;
6535       }
6536     else if (TREE_CODE (type) == FUNCTION_TYPE)
6537       {
6538         if (storage_class == csc_register || threadp)
6539           {
6540             error_at (loc, "invalid storage class for function %qE", name);
6541           }
6542         else if (current_scope != file_scope)
6543           {
6544             /* Function declaration not at file scope.  Storage
6545                classes other than `extern' are not allowed, C99
6546                6.7.1p5, and `extern' makes no difference.  However,
6547                GCC allows 'auto', perhaps with 'inline', to support
6548                nested functions.  */
6549             if (storage_class == csc_auto)
6550                 pedwarn (loc, OPT_Wpedantic,
6551                          "invalid storage class for function %qE", name);
6552             else if (storage_class == csc_static)
6553               {
6554                 error_at (loc, "invalid storage class for function %qE", name);
6555                 if (funcdef_flag)
6556                   storage_class = declspecs->storage_class = csc_none;
6557                 else
6558                   return 0;
6559               }
6560           }
6561
6562         decl = build_decl (declarator->id_loc,
6563                            FUNCTION_DECL, declarator->u.id, type);
6564         decl = build_decl_attribute_variant (decl, decl_attr);
6565
6566         if (type_quals & TYPE_QUAL_ATOMIC)
6567           {
6568             error_at (loc,
6569                       "%<_Atomic%>-qualified function type");
6570             type_quals &= ~TYPE_QUAL_ATOMIC;
6571           }
6572         else if (pedantic && type_quals && !DECL_IN_SYSTEM_HEADER (decl))
6573           pedwarn (loc, OPT_Wpedantic,
6574                    "ISO C forbids qualified function types");
6575
6576         /* Every function declaration is an external reference
6577            (DECL_EXTERNAL) except for those which are not at file
6578            scope and are explicitly declared "auto".  This is
6579            forbidden by standard C (C99 6.7.1p5) and is interpreted by
6580            GCC to signify a forward declaration of a nested function.  */
6581         if (storage_class == csc_auto && current_scope != file_scope)
6582           DECL_EXTERNAL (decl) = 0;
6583         /* In C99, a function which is declared 'inline' with 'extern'
6584            is not an external reference (which is confusing).  It
6585            means that the later definition of the function must be output
6586            in this file, C99 6.7.4p6.  In GNU C89, a function declared
6587            'extern inline' is an external reference.  */
6588         else if (declspecs->inline_p && storage_class != csc_static)
6589           DECL_EXTERNAL (decl) = ((storage_class == csc_extern)
6590                                   == flag_gnu89_inline);
6591         else
6592           DECL_EXTERNAL (decl) = !initialized;
6593
6594         /* Record absence of global scope for `static' or `auto'.  */
6595         TREE_PUBLIC (decl)
6596           = !(storage_class == csc_static || storage_class == csc_auto);
6597
6598         /* For a function definition, record the argument information
6599            block where store_parm_decls will look for it.  */
6600         if (funcdef_flag)
6601           current_function_arg_info = arg_info;
6602
6603         if (declspecs->default_int_p)
6604           C_FUNCTION_IMPLICIT_INT (decl) = 1;
6605
6606         /* Record presence of `inline' and `_Noreturn', if it is
6607            reasonable.  */
6608         if (flag_hosted && MAIN_NAME_P (declarator->u.id))
6609           {
6610             if (declspecs->inline_p)
6611               pedwarn (loc, 0, "cannot inline function %<main%>");
6612             if (declspecs->noreturn_p)
6613               pedwarn (loc, 0, "%<main%> declared %<_Noreturn%>");
6614           }
6615         else
6616           {
6617             if (declspecs->inline_p)
6618               /* Record that the function is declared `inline'.  */
6619               DECL_DECLARED_INLINE_P (decl) = 1;
6620             if (declspecs->noreturn_p)
6621               {
6622                 if (flag_isoc99)
6623                   pedwarn_c99 (loc, OPT_Wpedantic,
6624                                "ISO C99 does not support %<_Noreturn%>");
6625                 else
6626                   pedwarn_c99 (loc, OPT_Wpedantic,
6627                                "ISO C90 does not support %<_Noreturn%>");
6628                 TREE_THIS_VOLATILE (decl) = 1;
6629               }
6630           }
6631       }
6632     else
6633       {
6634         /* It's a variable.  */
6635         /* An uninitialized decl with `extern' is a reference.  */
6636         int extern_ref = !initialized && storage_class == csc_extern;
6637
6638         type = c_build_qualified_type (type, type_quals);
6639
6640         /* C99 6.2.2p7: It is invalid (compile-time undefined
6641            behavior) to create an 'extern' declaration for a
6642            variable if there is a global declaration that is
6643            'static' and the global declaration is not visible.
6644            (If the static declaration _is_ currently visible,
6645            the 'extern' declaration is taken to refer to that decl.) */
6646         if (extern_ref && current_scope != file_scope)
6647           {
6648             tree global_decl  = identifier_global_value (declarator->u.id);
6649             tree visible_decl = lookup_name (declarator->u.id);
6650
6651             if (global_decl
6652                 && global_decl != visible_decl
6653                 && TREE_CODE (global_decl) == VAR_DECL
6654                 && !TREE_PUBLIC (global_decl))
6655               error_at (loc, "variable previously declared %<static%> "
6656                         "redeclared %<extern%>");
6657           }
6658
6659         decl = build_decl (declarator->id_loc,
6660                            VAR_DECL, declarator->u.id, type);
6661         if (size_varies)
6662           C_DECL_VARIABLE_SIZE (decl) = 1;
6663
6664         if (declspecs->inline_p)
6665           pedwarn (loc, 0, "variable %q+D declared %<inline%>", decl);
6666         if (declspecs->noreturn_p)
6667           pedwarn (loc, 0, "variable %q+D declared %<_Noreturn%>", decl);
6668
6669         /* At file scope, an initialized extern declaration may follow
6670            a static declaration.  In that case, DECL_EXTERNAL will be
6671            reset later in start_decl.  */
6672         DECL_EXTERNAL (decl) = (storage_class == csc_extern);
6673
6674         /* At file scope, the presence of a `static' or `register' storage
6675            class specifier, or the absence of all storage class specifiers
6676            makes this declaration a definition (perhaps tentative).  Also,
6677            the absence of `static' makes it public.  */
6678         if (current_scope == file_scope)
6679           {
6680             TREE_PUBLIC (decl) = storage_class != csc_static;
6681             TREE_STATIC (decl) = !extern_ref;
6682           }
6683         /* Not at file scope, only `static' makes a static definition.  */
6684         else
6685           {
6686             TREE_STATIC (decl) = (storage_class == csc_static);
6687             TREE_PUBLIC (decl) = extern_ref;
6688           }
6689
6690         if (threadp)
6691           set_decl_tls_model (decl, decl_default_tls_model (decl));
6692       }
6693
6694     if ((storage_class == csc_extern
6695          || (storage_class == csc_none
6696              && TREE_CODE (type) == FUNCTION_TYPE
6697              && !funcdef_flag))
6698         && variably_modified_type_p (type, NULL_TREE))
6699       {
6700         /* C99 6.7.5.2p2 */
6701         if (TREE_CODE (type) == FUNCTION_TYPE)
6702           error_at (loc, "non-nested function with variably modified type");
6703         else
6704           error_at (loc, "object with variably modified type must have "
6705                     "no linkage");
6706       }
6707
6708     /* Record `register' declaration for warnings on &
6709        and in case doing stupid register allocation.  */
6710
6711     if (storage_class == csc_register)
6712       {
6713         C_DECL_REGISTER (decl) = 1;
6714         DECL_REGISTER (decl) = 1;
6715       }
6716
6717     /* Record constancy and volatility.  */
6718     c_apply_type_quals_to_decl (type_quals, decl);
6719
6720     /* Apply _Alignas specifiers.  */
6721     if (alignas_align)
6722       {
6723         DECL_ALIGN (decl) = alignas_align * BITS_PER_UNIT;
6724         DECL_USER_ALIGN (decl) = 1;
6725       }
6726
6727     /* If a type has volatile components, it should be stored in memory.
6728        Otherwise, the fact that those components are volatile
6729        will be ignored, and would even crash the compiler.
6730        Of course, this only makes sense on  VAR,PARM, and RESULT decl's.   */
6731     if (C_TYPE_FIELDS_VOLATILE (TREE_TYPE (decl))
6732         && (TREE_CODE (decl) == VAR_DECL ||  TREE_CODE (decl) == PARM_DECL
6733           || TREE_CODE (decl) == RESULT_DECL))
6734       {
6735         /* It is not an error for a structure with volatile fields to
6736            be declared register, but reset DECL_REGISTER since it
6737            cannot actually go in a register.  */
6738         int was_reg = C_DECL_REGISTER (decl);
6739         C_DECL_REGISTER (decl) = 0;
6740         DECL_REGISTER (decl) = 0;
6741         c_mark_addressable (decl);
6742         C_DECL_REGISTER (decl) = was_reg;
6743       }
6744
6745   /* This is the earliest point at which we might know the assembler
6746      name of a variable.  Thus, if it's known before this, die horribly.  */
6747     gcc_assert (!DECL_ASSEMBLER_NAME_SET_P (decl));
6748
6749     if (warn_cxx_compat
6750         && TREE_CODE (decl) == VAR_DECL
6751         && TREE_PUBLIC (decl)
6752         && TREE_STATIC (decl)
6753         && (TREE_CODE (TREE_TYPE (decl)) == RECORD_TYPE
6754             || TREE_CODE (TREE_TYPE (decl)) == UNION_TYPE
6755             || TREE_CODE (TREE_TYPE (decl)) == ENUMERAL_TYPE)
6756         && TYPE_NAME (TREE_TYPE (decl)) == NULL_TREE)
6757       warning_at (DECL_SOURCE_LOCATION (decl), OPT_Wc___compat,
6758                   ("non-local variable %qD with anonymous type is "
6759                    "questionable in C++"),
6760                   decl);
6761
6762     return decl;
6763   }
6764 }
6765 \f
6766 /* Decode the parameter-list info for a function type or function definition.
6767    The argument is the value returned by `get_parm_info' (or made in c-parse.c
6768    if there is an identifier list instead of a parameter decl list).
6769    These two functions are separate because when a function returns
6770    or receives functions then each is called multiple times but the order
6771    of calls is different.  The last call to `grokparms' is always the one
6772    that contains the formal parameter names of a function definition.
6773
6774    Return a list of arg types to use in the FUNCTION_TYPE for this function.
6775
6776    FUNCDEF_FLAG is true for a function definition, false for
6777    a mere declaration.  A nonempty identifier-list gets an error message
6778    when FUNCDEF_FLAG is false.  */
6779
6780 static tree
6781 grokparms (struct c_arg_info *arg_info, bool funcdef_flag)
6782 {
6783   tree arg_types = arg_info->types;
6784
6785   if (funcdef_flag && arg_info->had_vla_unspec)
6786     {
6787       /* A function definition isn't function prototype scope C99 6.2.1p4.  */
6788       /* C99 6.7.5.2p4 */
6789       error ("%<[*]%> not allowed in other than function prototype scope");
6790     }
6791
6792   if (arg_types == 0 && !funcdef_flag
6793       && !in_system_header_at (input_location))
6794     warning (OPT_Wstrict_prototypes,
6795              "function declaration isn%'t a prototype");
6796
6797   if (arg_types == error_mark_node)
6798     return 0;  /* don't set TYPE_ARG_TYPES in this case */
6799
6800   else if (arg_types && TREE_CODE (TREE_VALUE (arg_types)) == IDENTIFIER_NODE)
6801     {
6802       if (!funcdef_flag)
6803         {
6804           pedwarn (input_location, 0, "parameter names (without types) in function declaration");
6805           arg_info->parms = NULL_TREE;
6806         }
6807       else
6808         arg_info->parms = arg_info->types;
6809
6810       arg_info->types = 0;
6811       return 0;
6812     }
6813   else
6814     {
6815       tree parm, type, typelt;
6816       unsigned int parmno;
6817       const char *errmsg;
6818
6819       /* If there is a parameter of incomplete type in a definition,
6820          this is an error.  In a declaration this is valid, and a
6821          struct or union type may be completed later, before any calls
6822          or definition of the function.  In the case where the tag was
6823          first declared within the parameter list, a warning has
6824          already been given.  If a parameter has void type, then
6825          however the function cannot be defined or called, so
6826          warn.  */
6827
6828       for (parm = arg_info->parms, typelt = arg_types, parmno = 1;
6829            parm;
6830            parm = DECL_CHAIN (parm), typelt = TREE_CHAIN (typelt), parmno++)
6831         {
6832           type = TREE_VALUE (typelt);
6833           if (type == error_mark_node)
6834             continue;
6835
6836           if (!COMPLETE_TYPE_P (type))
6837             {
6838               if (funcdef_flag)
6839                 {
6840                   if (DECL_NAME (parm))
6841                     error_at (input_location,
6842                               "parameter %u (%q+D) has incomplete type",
6843                               parmno, parm);
6844                   else
6845                     error_at (DECL_SOURCE_LOCATION (parm),
6846                               "parameter %u has incomplete type",
6847                               parmno);
6848
6849                   TREE_VALUE (typelt) = error_mark_node;
6850                   TREE_TYPE (parm) = error_mark_node;
6851                   arg_types = NULL_TREE;
6852                 }
6853               else if (VOID_TYPE_P (type))
6854                 {
6855                   if (DECL_NAME (parm))
6856                     warning_at (input_location, 0,
6857                                 "parameter %u (%q+D) has void type",
6858                                 parmno, parm);
6859                   else
6860                     warning_at (DECL_SOURCE_LOCATION (parm), 0,
6861                                 "parameter %u has void type",
6862                                 parmno);
6863                 }
6864             }
6865
6866           errmsg = targetm.invalid_parameter_type (type);
6867           if (errmsg)
6868             {
6869               error (errmsg);
6870               TREE_VALUE (typelt) = error_mark_node;
6871               TREE_TYPE (parm) = error_mark_node;
6872               arg_types = NULL_TREE;
6873             }
6874
6875           if (DECL_NAME (parm) && TREE_USED (parm))
6876             warn_if_shadowing (parm);
6877         }
6878       return arg_types;
6879     }
6880 }
6881
6882 /* Allocate and initialize a c_arg_info structure from the parser's
6883    obstack.  */
6884
6885 struct c_arg_info *
6886 build_arg_info (void)
6887 {
6888   struct c_arg_info *ret = XOBNEW (&parser_obstack, struct c_arg_info);
6889   ret->parms = NULL_TREE;
6890   ret->tags = NULL;
6891   ret->types = NULL_TREE;
6892   ret->others = NULL_TREE;
6893   ret->pending_sizes = NULL;
6894   ret->had_vla_unspec = 0;
6895   return ret;
6896 }
6897
6898 /* Take apart the current scope and return a c_arg_info structure with
6899    info on a parameter list just parsed.
6900
6901    This structure is later fed to 'grokparms' and 'store_parm_decls'.
6902
6903    ELLIPSIS being true means the argument list ended in '...' so don't
6904    append a sentinel (void_list_node) to the end of the type-list.
6905
6906    EXPR is NULL or an expression that needs to be evaluated for the
6907    side effects of array size expressions in the parameters.  */
6908
6909 struct c_arg_info *
6910 get_parm_info (bool ellipsis, tree expr)
6911 {
6912   struct c_binding *b = current_scope->bindings;
6913   struct c_arg_info *arg_info = build_arg_info ();
6914
6915   tree parms    = 0;
6916   vec<c_arg_tag, va_gc> *tags = NULL;
6917   tree types    = 0;
6918   tree others   = 0;
6919
6920   static bool explained_incomplete_types = false;
6921   bool gave_void_only_once_err = false;
6922
6923   arg_info->had_vla_unspec = current_scope->had_vla_unspec;
6924
6925   /* The bindings in this scope must not get put into a block.
6926      We will take care of deleting the binding nodes.  */
6927   current_scope->bindings = 0;
6928
6929   /* This function is only called if there was *something* on the
6930      parameter list.  */
6931   gcc_assert (b);
6932
6933   /* A parameter list consisting solely of 'void' indicates that the
6934      function takes no arguments.  But if the 'void' is qualified
6935      (by 'const' or 'volatile'), or has a storage class specifier
6936      ('register'), then the behavior is undefined; issue an error.
6937      Typedefs for 'void' are OK (see DR#157).  */
6938   if (b->prev == 0                          /* one binding */
6939       && TREE_CODE (b->decl) == PARM_DECL   /* which is a parameter */
6940       && !DECL_NAME (b->decl)               /* anonymous */
6941       && VOID_TYPE_P (TREE_TYPE (b->decl))) /* of void type */
6942     {
6943       if (TYPE_QUALS (TREE_TYPE (b->decl)) != TYPE_UNQUALIFIED
6944           || C_DECL_REGISTER (b->decl))
6945         error ("%<void%> as only parameter may not be qualified");
6946
6947       /* There cannot be an ellipsis.  */
6948       if (ellipsis)
6949         error ("%<void%> must be the only parameter");
6950
6951       arg_info->types = void_list_node;
6952       return arg_info;
6953     }
6954
6955   if (!ellipsis)
6956     types = void_list_node;
6957
6958   /* Break up the bindings list into parms, tags, types, and others;
6959      apply sanity checks; purge the name-to-decl bindings.  */
6960   while (b)
6961     {
6962       tree decl = b->decl;
6963       tree type = TREE_TYPE (decl);
6964       c_arg_tag tag;
6965       const char *keyword;
6966
6967       switch (TREE_CODE (decl))
6968         {
6969         case PARM_DECL:
6970           if (b->id)
6971             {
6972               gcc_assert (I_SYMBOL_BINDING (b->id) == b);
6973               I_SYMBOL_BINDING (b->id) = b->shadowed;
6974             }
6975
6976           /* Check for forward decls that never got their actual decl.  */
6977           if (TREE_ASM_WRITTEN (decl))
6978             error ("parameter %q+D has just a forward declaration", decl);
6979           /* Check for (..., void, ...) and issue an error.  */
6980           else if (VOID_TYPE_P (type) && !DECL_NAME (decl))
6981             {
6982               if (!gave_void_only_once_err)
6983                 {
6984                   error ("%<void%> must be the only parameter");
6985                   gave_void_only_once_err = true;
6986                 }
6987             }
6988           else
6989             {
6990               /* Valid parameter, add it to the list.  */
6991               DECL_CHAIN (decl) = parms;
6992               parms = decl;
6993
6994               /* Since there is a prototype, args are passed in their
6995                  declared types.  The back end may override this later.  */
6996               DECL_ARG_TYPE (decl) = type;
6997               types = tree_cons (0, type, types);
6998             }
6999           break;
7000
7001         case ENUMERAL_TYPE: keyword = "enum"; goto tag;
7002         case UNION_TYPE:    keyword = "union"; goto tag;
7003         case RECORD_TYPE:   keyword = "struct"; goto tag;
7004         tag:
7005           /* Types may not have tag-names, in which case the type
7006              appears in the bindings list with b->id NULL.  */
7007           if (b->id)
7008             {
7009               gcc_assert (I_TAG_BINDING (b->id) == b);
7010               I_TAG_BINDING (b->id) = b->shadowed;
7011             }
7012
7013           /* Warn about any struct, union or enum tags defined in a
7014              parameter list.  The scope of such types is limited to
7015              the parameter list, which is rarely if ever desirable
7016              (it's impossible to call such a function with type-
7017              correct arguments).  An anonymous union parm type is
7018              meaningful as a GNU extension, so don't warn for that.  */
7019           if (TREE_CODE (decl) != UNION_TYPE || b->id != 0)
7020             {
7021               if (b->id)
7022                 /* The %s will be one of 'struct', 'union', or 'enum'.  */
7023                 warning (0, "%<%s %E%> declared inside parameter list",
7024                          keyword, b->id);
7025               else
7026                 /* The %s will be one of 'struct', 'union', or 'enum'.  */
7027                 warning (0, "anonymous %s declared inside parameter list",
7028                          keyword);
7029
7030               if (!explained_incomplete_types)
7031                 {
7032                   warning (0, "its scope is only this definition or declaration,"
7033                            " which is probably not what you want");
7034                   explained_incomplete_types = true;
7035                 }
7036             }
7037
7038           tag.id = b->id;
7039           tag.type = decl;
7040           vec_safe_push (tags, tag);
7041           break;
7042
7043         case CONST_DECL:
7044         case TYPE_DECL:
7045         case FUNCTION_DECL:
7046           /* CONST_DECLs appear here when we have an embedded enum,
7047              and TYPE_DECLs appear here when we have an embedded struct
7048              or union.  No warnings for this - we already warned about the
7049              type itself.  FUNCTION_DECLs appear when there is an implicit
7050              function declaration in the parameter list.  */
7051
7052           /* When we reinsert this decl in the function body, we need
7053              to reconstruct whether it was marked as nested.  */
7054           gcc_assert (TREE_CODE (decl) == FUNCTION_DECL
7055                       ? b->nested
7056                       : !b->nested);
7057           DECL_CHAIN (decl) = others;
7058           others = decl;
7059           /* fall through */
7060
7061         case ERROR_MARK:
7062           /* error_mark_node appears here when we have an undeclared
7063              variable.  Just throw it away.  */
7064           if (b->id)
7065             {
7066               gcc_assert (I_SYMBOL_BINDING (b->id) == b);
7067               I_SYMBOL_BINDING (b->id) = b->shadowed;
7068             }
7069           break;
7070
7071           /* Other things that might be encountered.  */
7072         case LABEL_DECL:
7073         case VAR_DECL:
7074         default:
7075           gcc_unreachable ();
7076         }
7077
7078       b = free_binding_and_advance (b);
7079     }
7080
7081   arg_info->parms = parms;
7082   arg_info->tags = tags;
7083   arg_info->types = types;
7084   arg_info->others = others;
7085   arg_info->pending_sizes = expr;
7086   return arg_info;
7087 }
7088 \f
7089 /* Get the struct, enum or union (CODE says which) with tag NAME.
7090    Define the tag as a forward-reference with location LOC if it is
7091    not defined.  Return a c_typespec structure for the type
7092    specifier.  */
7093
7094 struct c_typespec
7095 parser_xref_tag (location_t loc, enum tree_code code, tree name)
7096 {
7097   struct c_typespec ret;
7098   tree ref;
7099   location_t refloc;
7100
7101   ret.expr = NULL_TREE;
7102   ret.expr_const_operands = true;
7103
7104   /* If a cross reference is requested, look up the type
7105      already defined for this tag and return it.  */
7106
7107   ref = lookup_tag (code, name, 0, &refloc);
7108   /* If this is the right type of tag, return what we found.
7109      (This reference will be shadowed by shadow_tag later if appropriate.)
7110      If this is the wrong type of tag, do not return it.  If it was the
7111      wrong type in the same scope, we will have had an error
7112      message already; if in a different scope and declaring
7113      a name, pending_xref_error will give an error message; but if in a
7114      different scope and not declaring a name, this tag should
7115      shadow the previous declaration of a different type of tag, and
7116      this would not work properly if we return the reference found.
7117      (For example, with "struct foo" in an outer scope, "union foo;"
7118      must shadow that tag with a new one of union type.)  */
7119   ret.kind = (ref ? ctsk_tagref : ctsk_tagfirstref);
7120   if (ref && TREE_CODE (ref) == code)
7121     {
7122       if (C_TYPE_DEFINED_IN_STRUCT (ref)
7123           && loc != UNKNOWN_LOCATION
7124           && warn_cxx_compat)
7125         {
7126           switch (code)
7127             {
7128             case ENUMERAL_TYPE:
7129               warning_at (loc, OPT_Wc___compat,
7130                           ("enum type defined in struct or union "
7131                            "is not visible in C++"));
7132               inform (refloc, "enum type defined here");
7133               break;
7134             case RECORD_TYPE:
7135               warning_at (loc, OPT_Wc___compat,
7136                           ("struct defined in struct or union "
7137                            "is not visible in C++"));
7138               inform (refloc, "struct defined here");
7139               break;
7140             case UNION_TYPE:
7141               warning_at (loc, OPT_Wc___compat,
7142                           ("union defined in struct or union "
7143                            "is not visible in C++"));
7144               inform (refloc, "union defined here");
7145               break;
7146             default:
7147               gcc_unreachable();
7148             }
7149         }
7150
7151       ret.spec = ref;
7152       return ret;
7153     }
7154
7155   /* If no such tag is yet defined, create a forward-reference node
7156      and record it as the "definition".
7157      When a real declaration of this type is found,
7158      the forward-reference will be altered into a real type.  */
7159
7160   ref = make_node (code);
7161   if (code == ENUMERAL_TYPE)
7162     {
7163       /* Give the type a default layout like unsigned int
7164          to avoid crashing if it does not get defined.  */
7165       SET_TYPE_MODE (ref, TYPE_MODE (unsigned_type_node));
7166       TYPE_ALIGN (ref) = TYPE_ALIGN (unsigned_type_node);
7167       TYPE_USER_ALIGN (ref) = 0;
7168       TYPE_UNSIGNED (ref) = 1;
7169       TYPE_PRECISION (ref) = TYPE_PRECISION (unsigned_type_node);
7170       TYPE_MIN_VALUE (ref) = TYPE_MIN_VALUE (unsigned_type_node);
7171       TYPE_MAX_VALUE (ref) = TYPE_MAX_VALUE (unsigned_type_node);
7172     }
7173
7174   pushtag (loc, name, ref);
7175
7176   ret.spec = ref;
7177   return ret;
7178 }
7179
7180 /* Get the struct, enum or union (CODE says which) with tag NAME.
7181    Define the tag as a forward-reference if it is not defined.
7182    Return a tree for the type.  */
7183
7184 tree
7185 xref_tag (enum tree_code code, tree name)
7186 {
7187   return parser_xref_tag (input_location, code, name).spec;
7188 }
7189 \f
7190 /* Make sure that the tag NAME is defined *in the current scope*
7191    at least as a forward reference.
7192    LOC is the location of the struct's definition.
7193    CODE says which kind of tag NAME ought to be.
7194
7195    This stores the current value of the file static STRUCT_PARSE_INFO
7196    in *ENCLOSING_STRUCT_PARSE_INFO, and points STRUCT_PARSE_INFO at a
7197    new c_struct_parse_info structure.  The old value of
7198    STRUCT_PARSE_INFO is restored in finish_struct.  */
7199
7200 tree
7201 start_struct (location_t loc, enum tree_code code, tree name,
7202               struct c_struct_parse_info **enclosing_struct_parse_info)
7203 {
7204   /* If there is already a tag defined at this scope
7205      (as a forward reference), just return it.  */
7206
7207   tree ref = NULL_TREE;
7208   location_t refloc = UNKNOWN_LOCATION;
7209
7210   if (name != NULL_TREE)
7211     ref = lookup_tag (code, name, 1, &refloc);
7212   if (ref && TREE_CODE (ref) == code)
7213     {
7214       if (TYPE_SIZE (ref))
7215         {
7216           if (code == UNION_TYPE)
7217             error_at (loc, "redefinition of %<union %E%>", name);
7218           else
7219             error_at (loc, "redefinition of %<struct %E%>", name);
7220           if (refloc != UNKNOWN_LOCATION)
7221             inform (refloc, "originally defined here");
7222           /* Don't create structures using a name already in use.  */
7223           ref = NULL_TREE;
7224         }
7225       else if (C_TYPE_BEING_DEFINED (ref))
7226         {
7227           if (code == UNION_TYPE)
7228             error_at (loc, "nested redefinition of %<union %E%>", name);
7229           else
7230             error_at (loc, "nested redefinition of %<struct %E%>", name);
7231           /* Don't bother to report "originally defined here" for a
7232              nested redefinition; the original definition should be
7233              obvious.  */
7234           /* Don't create structures that contain themselves.  */
7235           ref = NULL_TREE;
7236         }
7237     }
7238
7239   /* Otherwise create a forward-reference just so the tag is in scope.  */
7240
7241   if (ref == NULL_TREE || TREE_CODE (ref) != code)
7242     {
7243       ref = make_node (code);
7244       pushtag (loc, name, ref);
7245     }
7246
7247   C_TYPE_BEING_DEFINED (ref) = 1;
7248   TYPE_PACKED (ref) = flag_pack_struct;
7249
7250   *enclosing_struct_parse_info = struct_parse_info;
7251   struct_parse_info = XNEW (struct c_struct_parse_info);
7252   struct_parse_info->struct_types.create (0);
7253   struct_parse_info->fields.create (0);
7254   struct_parse_info->typedefs_seen.create (0);
7255
7256   /* FIXME: This will issue a warning for a use of a type defined
7257      within a statement expr used within sizeof, et. al.  This is not
7258      terribly serious as C++ doesn't permit statement exprs within
7259      sizeof anyhow.  */
7260   if (warn_cxx_compat && (in_sizeof || in_typeof || in_alignof))
7261     warning_at (loc, OPT_Wc___compat,
7262                 "defining type in %qs expression is invalid in C++",
7263                 (in_sizeof
7264                  ? "sizeof"
7265                  : (in_typeof ? "typeof" : "alignof")));
7266
7267   return ref;
7268 }
7269
7270 /* Process the specs, declarator and width (NULL if omitted)
7271    of a structure component, returning a FIELD_DECL node.
7272    WIDTH is non-NULL for bit-fields only, and is an INTEGER_CST node.
7273    DECL_ATTRS is as for grokdeclarator.
7274
7275    LOC is the location of the structure component.
7276
7277    This is done during the parsing of the struct declaration.
7278    The FIELD_DECL nodes are chained together and the lot of them
7279    are ultimately passed to `build_struct' to make the RECORD_TYPE node.  */
7280
7281 tree
7282 grokfield (location_t loc,
7283            struct c_declarator *declarator, struct c_declspecs *declspecs,
7284            tree width, tree *decl_attrs)
7285 {
7286   tree value;
7287
7288   if (declarator->kind == cdk_id && declarator->u.id == NULL_TREE
7289       && width == NULL_TREE)
7290     {
7291       /* This is an unnamed decl.
7292
7293          If we have something of the form "union { list } ;" then this
7294          is the anonymous union extension.  Similarly for struct.
7295
7296          If this is something of the form "struct foo;", then
7297            If MS or Plan 9 extensions are enabled, this is handled as
7298              an anonymous struct.
7299            Otherwise this is a forward declaration of a structure tag.
7300
7301          If this is something of the form "foo;" and foo is a TYPE_DECL, then
7302            If foo names a structure or union without a tag, then this
7303              is an anonymous struct (this is permitted by C11).
7304            If MS or Plan 9 extensions are enabled and foo names a
7305              structure, then again this is an anonymous struct.
7306            Otherwise this is an error.
7307
7308          Oh what a horrid tangled web we weave.  I wonder if MS consciously
7309          took this from Plan 9 or if it was an accident of implementation
7310          that took root before someone noticed the bug...  */
7311
7312       tree type = declspecs->type;
7313       bool type_ok = (TREE_CODE (type) == RECORD_TYPE
7314                       || TREE_CODE (type) == UNION_TYPE);
7315       bool ok = false;
7316
7317       if (type_ok
7318           && (flag_ms_extensions
7319               || flag_plan9_extensions
7320               || !declspecs->typedef_p))
7321         {
7322           if (flag_ms_extensions || flag_plan9_extensions)
7323             ok = true;
7324           else if (TYPE_NAME (type) == NULL)
7325             ok = true;
7326           else
7327             ok = false;
7328         }
7329       if (!ok)
7330         {
7331           pedwarn (loc, 0, "declaration does not declare anything");
7332           return NULL_TREE;
7333         }
7334       if (flag_isoc99)
7335         pedwarn_c99 (loc, OPT_Wpedantic,
7336                      "ISO C99 doesn%'t support unnamed structs/unions");
7337       else
7338         pedwarn_c99 (loc, OPT_Wpedantic,
7339                      "ISO C90 doesn%'t support unnamed structs/unions");
7340     }
7341
7342   value = grokdeclarator (declarator, declspecs, FIELD, false,
7343                           width ? &width : NULL, decl_attrs, NULL, NULL,
7344                           DEPRECATED_NORMAL);
7345
7346   finish_decl (value, loc, NULL_TREE, NULL_TREE, NULL_TREE);
7347   DECL_INITIAL (value) = width;
7348
7349   if (warn_cxx_compat && DECL_NAME (value) != NULL_TREE)
7350     {
7351       /* If we currently have a binding for this field, set the
7352          in_struct field in the binding, so that we warn about lookups
7353          which find it.  */
7354       struct c_binding *b = I_SYMBOL_BINDING (DECL_NAME (value));
7355       if (b != NULL)
7356         {
7357           /* If the in_struct field is not yet set, push it on a list
7358              to be cleared when this struct is finished.  */
7359           if (!b->in_struct)
7360             {
7361               struct_parse_info->fields.safe_push (b);
7362               b->in_struct = 1;
7363             }
7364         }
7365     }
7366
7367   return value;
7368 }
7369 \f
7370 /* Subroutine of detect_field_duplicates: return whether X and Y,
7371    which are both fields in the same struct, have duplicate field
7372    names.  */
7373
7374 static bool
7375 is_duplicate_field (tree x, tree y)
7376 {
7377   if (DECL_NAME (x) != NULL_TREE && DECL_NAME (x) == DECL_NAME (y))
7378     return true;
7379
7380   /* When using -fplan9-extensions, an anonymous field whose name is a
7381      typedef can duplicate a field name.  */
7382   if (flag_plan9_extensions
7383       && (DECL_NAME (x) == NULL_TREE || DECL_NAME (y) == NULL_TREE))
7384     {
7385       tree xt, xn, yt, yn;
7386
7387       xt = TREE_TYPE (x);
7388       if (DECL_NAME (x) != NULL_TREE)
7389         xn = DECL_NAME (x);
7390       else if ((TREE_CODE (xt) == RECORD_TYPE || TREE_CODE (xt) == UNION_TYPE)
7391                && TYPE_NAME (xt) != NULL_TREE
7392                && TREE_CODE (TYPE_NAME (xt)) == TYPE_DECL)
7393         xn = DECL_NAME (TYPE_NAME (xt));
7394       else
7395         xn = NULL_TREE;
7396
7397       yt = TREE_TYPE (y);
7398       if (DECL_NAME (y) != NULL_TREE)
7399         yn = DECL_NAME (y);
7400       else if ((TREE_CODE (yt) == RECORD_TYPE || TREE_CODE (yt) == UNION_TYPE)
7401                && TYPE_NAME (yt) != NULL_TREE
7402                && TREE_CODE (TYPE_NAME (yt)) == TYPE_DECL)
7403         yn = DECL_NAME (TYPE_NAME (yt));
7404       else
7405         yn = NULL_TREE;
7406
7407       if (xn != NULL_TREE && xn == yn)
7408         return true;
7409     }
7410
7411   return false;
7412 }
7413
7414 /* Subroutine of detect_field_duplicates: add the fields of FIELDLIST
7415    to HTAB, giving errors for any duplicates.  */
7416
7417 static void
7418 detect_field_duplicates_hash (tree fieldlist,
7419                               hash_table<pointer_hash <tree_node> > *htab)
7420 {
7421   tree x, y;
7422   tree_node **slot;
7423
7424   for (x = fieldlist; x ; x = DECL_CHAIN (x))
7425     if ((y = DECL_NAME (x)) != 0)
7426       {
7427         slot = htab->find_slot (y, INSERT);
7428         if (*slot)
7429           {
7430             error ("duplicate member %q+D", x);
7431             DECL_NAME (x) = NULL_TREE;
7432           }
7433         *slot = y;
7434       }
7435     else if (TREE_CODE (TREE_TYPE (x)) == RECORD_TYPE
7436              || TREE_CODE (TREE_TYPE (x)) == UNION_TYPE)
7437       {
7438         detect_field_duplicates_hash (TYPE_FIELDS (TREE_TYPE (x)), htab);
7439
7440         /* When using -fplan9-extensions, an anonymous field whose
7441            name is a typedef can duplicate a field name.  */
7442         if (flag_plan9_extensions
7443             && TYPE_NAME (TREE_TYPE (x)) != NULL_TREE
7444             && TREE_CODE (TYPE_NAME (TREE_TYPE (x))) == TYPE_DECL)
7445           {
7446             tree xn = DECL_NAME (TYPE_NAME (TREE_TYPE (x)));
7447             slot = htab->find_slot (xn, INSERT);
7448             if (*slot)
7449               error ("duplicate member %q+D", TYPE_NAME (TREE_TYPE (x)));
7450             *slot = xn;
7451           }
7452       }
7453 }
7454
7455 /* Generate an error for any duplicate field names in FIELDLIST.  Munge
7456    the list such that this does not present a problem later.  */
7457
7458 static void
7459 detect_field_duplicates (tree fieldlist)
7460 {
7461   tree x, y;
7462   int timeout = 10;
7463
7464   /* If the struct is the list of instance variables of an Objective-C
7465      class, then we need to check all the instance variables of
7466      superclasses when checking for duplicates (since you can't have
7467      an instance variable in a subclass with the same name as an
7468      instance variable in a superclass).  We pass on this job to the
7469      Objective-C compiler.  objc_detect_field_duplicates() will return
7470      false if we are not checking the list of instance variables and
7471      the C frontend should proceed with the standard field duplicate
7472      checks.  If we are checking the list of instance variables, the
7473      ObjC frontend will do the check, emit the errors if needed, and
7474      then return true.  */
7475   if (c_dialect_objc ())
7476     if (objc_detect_field_duplicates (false))
7477       return;
7478
7479   /* First, see if there are more than "a few" fields.
7480      This is trivially true if there are zero or one fields.  */
7481   if (!fieldlist || !DECL_CHAIN (fieldlist))
7482     return;
7483   x = fieldlist;
7484   do {
7485     timeout--;
7486     if (DECL_NAME (x) == NULL_TREE
7487         && (TREE_CODE (TREE_TYPE (x)) == RECORD_TYPE
7488             || TREE_CODE (TREE_TYPE (x)) == UNION_TYPE))
7489       timeout = 0;
7490     x = DECL_CHAIN (x);
7491   } while (timeout > 0 && x);
7492
7493   /* If there were "few" fields and no anonymous structures or unions,
7494      avoid the overhead of allocating a hash table.  Instead just do
7495      the nested traversal thing.  */
7496   if (timeout > 0)
7497     {
7498       for (x = DECL_CHAIN (fieldlist); x; x = DECL_CHAIN (x))
7499         /* When using -fplan9-extensions, we can have duplicates
7500            between typedef names and fields.  */
7501         if (DECL_NAME (x)
7502             || (flag_plan9_extensions
7503                 && DECL_NAME (x) == NULL_TREE
7504                 && (TREE_CODE (TREE_TYPE (x)) == RECORD_TYPE
7505                     || TREE_CODE (TREE_TYPE (x)) == UNION_TYPE)
7506                 && TYPE_NAME (TREE_TYPE (x)) != NULL_TREE
7507                 && TREE_CODE (TYPE_NAME (TREE_TYPE (x))) == TYPE_DECL))
7508           {
7509             for (y = fieldlist; y != x; y = TREE_CHAIN (y))
7510               if (is_duplicate_field (y, x))
7511                 {
7512                   error ("duplicate member %q+D", x);
7513                   DECL_NAME (x) = NULL_TREE;
7514                 }
7515           }
7516     }
7517   else
7518     {
7519       hash_table<pointer_hash <tree_node> > htab (37);
7520       detect_field_duplicates_hash (fieldlist, &htab);
7521     }
7522 }
7523
7524 /* Finish up struct info used by -Wc++-compat.  */
7525
7526 static void
7527 warn_cxx_compat_finish_struct (tree fieldlist)
7528 {
7529   unsigned int ix;
7530   tree x;
7531   struct c_binding *b;
7532
7533   /* Set the C_TYPE_DEFINED_IN_STRUCT flag for each type defined in
7534      the current struct.  We do this now at the end of the struct
7535      because the flag is used to issue visibility warnings, and we
7536      only want to issue those warnings if the type is referenced
7537      outside of the struct declaration.  */
7538   FOR_EACH_VEC_ELT (struct_parse_info->struct_types, ix, x)
7539     C_TYPE_DEFINED_IN_STRUCT (x) = 1;
7540
7541   /* The TYPEDEFS_SEEN field of STRUCT_PARSE_INFO is a list of
7542      typedefs used when declaring fields in this struct.  If the name
7543      of any of the fields is also a typedef name then the struct would
7544      not parse in C++, because the C++ lookup rules say that the
7545      typedef name would be looked up in the context of the struct, and
7546      would thus be the field rather than the typedef.  */
7547   if (!struct_parse_info->typedefs_seen.is_empty ()
7548       && fieldlist != NULL_TREE)
7549     {
7550       /* Use a hash_set<tree> using the name of the typedef.  We can use
7551          a hash_set<tree> because identifiers are interned.  */
7552       hash_set<tree> tset;
7553
7554       FOR_EACH_VEC_ELT (struct_parse_info->typedefs_seen, ix, x)
7555         tset.add (DECL_NAME (x));
7556
7557       for (x = fieldlist; x != NULL_TREE; x = DECL_CHAIN (x))
7558         {
7559           if (DECL_NAME (x) != NULL_TREE
7560               && tset.contains (DECL_NAME (x)))
7561             {
7562               warning_at (DECL_SOURCE_LOCATION (x), OPT_Wc___compat,
7563                           ("using %qD as both field and typedef name is "
7564                            "invalid in C++"),
7565                           x);
7566               /* FIXME: It would be nice to report the location where
7567                  the typedef name is used.  */
7568             }
7569         }
7570     }
7571
7572   /* For each field which has a binding and which was not defined in
7573      an enclosing struct, clear the in_struct field.  */
7574   FOR_EACH_VEC_ELT (struct_parse_info->fields, ix, b)
7575     b->in_struct = 0;
7576 }
7577
7578 /* Fill in the fields of a RECORD_TYPE or UNION_TYPE node, T.
7579    LOC is the location of the RECORD_TYPE or UNION_TYPE's definition.
7580    FIELDLIST is a chain of FIELD_DECL nodes for the fields.
7581    ATTRIBUTES are attributes to be applied to the structure.
7582
7583    ENCLOSING_STRUCT_PARSE_INFO is the value of STRUCT_PARSE_INFO when
7584    the struct was started.  */
7585
7586 tree
7587 finish_struct (location_t loc, tree t, tree fieldlist, tree attributes,
7588                struct c_struct_parse_info *enclosing_struct_parse_info)
7589 {
7590   tree x;
7591   bool toplevel = file_scope == current_scope;
7592   int saw_named_field;
7593
7594   /* If this type was previously laid out as a forward reference,
7595      make sure we lay it out again.  */
7596
7597   TYPE_SIZE (t) = 0;
7598
7599   decl_attributes (&t, attributes, (int) ATTR_FLAG_TYPE_IN_PLACE);
7600
7601   if (pedantic)
7602     {
7603       for (x = fieldlist; x; x = DECL_CHAIN (x))
7604         {
7605           if (DECL_NAME (x) != 0)
7606             break;
7607           if (flag_isoc11
7608               && (TREE_CODE (TREE_TYPE (x)) == RECORD_TYPE
7609                   || TREE_CODE (TREE_TYPE (x)) == UNION_TYPE))
7610             break;
7611         }
7612
7613       if (x == 0)
7614         {
7615           if (TREE_CODE (t) == UNION_TYPE)
7616             {
7617               if (fieldlist)
7618                 pedwarn (loc, OPT_Wpedantic, "union has no named members");
7619               else
7620                 pedwarn (loc, OPT_Wpedantic, "union has no members");
7621             }
7622           else
7623             {
7624               if (fieldlist)
7625                 pedwarn (loc, OPT_Wpedantic, "struct has no named members");
7626               else
7627                 pedwarn (loc, OPT_Wpedantic, "struct has no members");
7628             }
7629         }
7630     }
7631
7632   /* Install struct as DECL_CONTEXT of each field decl.
7633      Also process specified field sizes, found in the DECL_INITIAL,
7634      storing 0 there after the type has been changed to precision equal
7635      to its width, rather than the precision of the specified standard
7636      type.  (Correct layout requires the original type to have been preserved
7637      until now.)  */
7638
7639   saw_named_field = 0;
7640   for (x = fieldlist; x; x = DECL_CHAIN (x))
7641     {
7642       if (TREE_TYPE (x) == error_mark_node)
7643         continue;
7644
7645       DECL_CONTEXT (x) = t;
7646
7647       /* If any field is const, the structure type is pseudo-const.  */
7648       if (TREE_READONLY (x))
7649         C_TYPE_FIELDS_READONLY (t) = 1;
7650       else
7651         {
7652           /* A field that is pseudo-const makes the structure likewise.  */
7653           tree t1 = strip_array_types (TREE_TYPE (x));
7654           if ((TREE_CODE (t1) == RECORD_TYPE || TREE_CODE (t1) == UNION_TYPE)
7655               && C_TYPE_FIELDS_READONLY (t1))
7656             C_TYPE_FIELDS_READONLY (t) = 1;
7657         }
7658
7659       /* Any field that is volatile means variables of this type must be
7660          treated in some ways as volatile.  */
7661       if (TREE_THIS_VOLATILE (x))
7662         C_TYPE_FIELDS_VOLATILE (t) = 1;
7663
7664       /* Any field of nominal variable size implies structure is too.  */
7665       if (C_DECL_VARIABLE_SIZE (x))
7666         C_TYPE_VARIABLE_SIZE (t) = 1;
7667
7668       if (DECL_INITIAL (x))
7669         {
7670           unsigned HOST_WIDE_INT width = tree_to_uhwi (DECL_INITIAL (x));
7671           DECL_SIZE (x) = bitsize_int (width);
7672           DECL_BIT_FIELD (x) = 1;
7673           SET_DECL_C_BIT_FIELD (x);
7674         }
7675
7676       if (TYPE_PACKED (t)
7677           && (DECL_BIT_FIELD (x)
7678               || TYPE_ALIGN (TREE_TYPE (x)) > BITS_PER_UNIT))
7679         DECL_PACKED (x) = 1;
7680
7681       /* Detect flexible array member in an invalid context.  */
7682       if (TREE_CODE (TREE_TYPE (x)) == ARRAY_TYPE
7683           && TYPE_SIZE (TREE_TYPE (x)) == NULL_TREE
7684           && TYPE_DOMAIN (TREE_TYPE (x)) != NULL_TREE
7685           && TYPE_MAX_VALUE (TYPE_DOMAIN (TREE_TYPE (x))) == NULL_TREE)
7686         {
7687           if (TREE_CODE (t) == UNION_TYPE)
7688             {
7689               error_at (DECL_SOURCE_LOCATION (x),
7690                         "flexible array member in union");
7691               TREE_TYPE (x) = error_mark_node;
7692             }
7693           else if (DECL_CHAIN (x) != NULL_TREE)
7694             {
7695               error_at (DECL_SOURCE_LOCATION (x),
7696                         "flexible array member not at end of struct");
7697               TREE_TYPE (x) = error_mark_node;
7698             }
7699           else if (!saw_named_field)
7700             {
7701               error_at (DECL_SOURCE_LOCATION (x),
7702                         "flexible array member in otherwise empty struct");
7703               TREE_TYPE (x) = error_mark_node;
7704             }
7705         }
7706
7707       if (pedantic && TREE_CODE (t) == RECORD_TYPE
7708           && flexible_array_type_p (TREE_TYPE (x)))
7709         pedwarn (DECL_SOURCE_LOCATION (x), OPT_Wpedantic,
7710                  "invalid use of structure with flexible array member");
7711
7712       if (DECL_NAME (x)
7713           || TREE_CODE (TREE_TYPE (x)) == RECORD_TYPE
7714           || TREE_CODE (TREE_TYPE (x)) == UNION_TYPE)
7715         saw_named_field = 1;
7716     }
7717
7718   detect_field_duplicates (fieldlist);
7719
7720   /* Now we have the nearly final fieldlist.  Record it,
7721      then lay out the structure or union (including the fields).  */
7722
7723   TYPE_FIELDS (t) = fieldlist;
7724
7725   layout_type (t);
7726
7727   if (TYPE_SIZE_UNIT (t)
7728       && TREE_CODE (TYPE_SIZE_UNIT (t)) == INTEGER_CST
7729       && !TREE_OVERFLOW (TYPE_SIZE_UNIT (t))
7730       && !valid_constant_size_p (TYPE_SIZE_UNIT (t)))
7731     error ("type %qT is too large", t);
7732
7733   /* Give bit-fields their proper types.  */
7734   {
7735     tree *fieldlistp = &fieldlist;
7736     while (*fieldlistp)
7737       if (TREE_CODE (*fieldlistp) == FIELD_DECL && DECL_INITIAL (*fieldlistp)
7738           && TREE_TYPE (*fieldlistp) != error_mark_node)
7739         {
7740           unsigned HOST_WIDE_INT width
7741             = tree_to_uhwi (DECL_INITIAL (*fieldlistp));
7742           tree type = TREE_TYPE (*fieldlistp);
7743           if (width != TYPE_PRECISION (type))
7744             {
7745               TREE_TYPE (*fieldlistp)
7746                 = c_build_bitfield_integer_type (width, TYPE_UNSIGNED (type));
7747               DECL_MODE (*fieldlistp) = TYPE_MODE (TREE_TYPE (*fieldlistp));
7748             }
7749           DECL_INITIAL (*fieldlistp) = 0;
7750         }
7751       else
7752         fieldlistp = &DECL_CHAIN (*fieldlistp);
7753   }
7754
7755   /* Now we have the truly final field list.
7756      Store it in this type and in the variants.  */
7757
7758   TYPE_FIELDS (t) = fieldlist;
7759
7760   /* If there are lots of fields, sort so we can look through them fast.
7761      We arbitrarily consider 16 or more elts to be "a lot".  */
7762
7763   {
7764     int len = 0;
7765
7766     for (x = fieldlist; x; x = DECL_CHAIN (x))
7767       {
7768         if (len > 15 || DECL_NAME (x) == NULL)
7769           break;
7770         len += 1;
7771       }
7772
7773     if (len > 15)
7774       {
7775         tree *field_array;
7776         struct lang_type *space;
7777         struct sorted_fields_type *space2;
7778
7779         len += list_length (x);
7780
7781         /* Use the same allocation policy here that make_node uses, to
7782           ensure that this lives as long as the rest of the struct decl.
7783           All decls in an inline function need to be saved.  */
7784
7785         space = ggc_cleared_alloc<struct lang_type> ();
7786         space2 = (sorted_fields_type *) ggc_internal_alloc
7787           (sizeof (struct sorted_fields_type) + len * sizeof (tree));
7788
7789         len = 0;
7790         space->s = space2;
7791         field_array = &space2->elts[0];
7792         for (x = fieldlist; x; x = DECL_CHAIN (x))
7793           {
7794             field_array[len++] = x;
7795
7796             /* If there is anonymous struct or union, break out of the loop.  */
7797             if (DECL_NAME (x) == NULL)
7798               break;
7799           }
7800         /* Found no anonymous struct/union.  Add the TYPE_LANG_SPECIFIC.  */
7801         if (x == NULL)
7802           {
7803             TYPE_LANG_SPECIFIC (t) = space;
7804             TYPE_LANG_SPECIFIC (t)->s->len = len;
7805             field_array = TYPE_LANG_SPECIFIC (t)->s->elts;
7806             qsort (field_array, len, sizeof (tree), field_decl_cmp);
7807           }
7808       }
7809   }
7810
7811   for (x = TYPE_MAIN_VARIANT (t); x; x = TYPE_NEXT_VARIANT (x))
7812     {
7813       TYPE_FIELDS (x) = TYPE_FIELDS (t);
7814       TYPE_LANG_SPECIFIC (x) = TYPE_LANG_SPECIFIC (t);
7815       C_TYPE_FIELDS_READONLY (x) = C_TYPE_FIELDS_READONLY (t);
7816       C_TYPE_FIELDS_VOLATILE (x) = C_TYPE_FIELDS_VOLATILE (t);
7817       C_TYPE_VARIABLE_SIZE (x) = C_TYPE_VARIABLE_SIZE (t);
7818     }
7819
7820   /* If this was supposed to be a transparent union, but we can't
7821      make it one, warn and turn off the flag.  */
7822   if (TREE_CODE (t) == UNION_TYPE
7823       && TYPE_TRANSPARENT_AGGR (t)
7824       && (!TYPE_FIELDS (t) || TYPE_MODE (t) != DECL_MODE (TYPE_FIELDS (t))))
7825     {
7826       TYPE_TRANSPARENT_AGGR (t) = 0;
7827       warning_at (loc, 0, "union cannot be made transparent");
7828     }
7829
7830   /* If this structure or union completes the type of any previous
7831      variable declaration, lay it out and output its rtl.  */
7832   for (x = C_TYPE_INCOMPLETE_VARS (TYPE_MAIN_VARIANT (t));
7833        x;
7834        x = TREE_CHAIN (x))
7835     {
7836       tree decl = TREE_VALUE (x);
7837       if (TREE_CODE (TREE_TYPE (decl)) == ARRAY_TYPE)
7838         layout_array_type (TREE_TYPE (decl));
7839       if (TREE_CODE (decl) != TYPE_DECL)
7840         {
7841           layout_decl (decl, 0);
7842           if (c_dialect_objc ())
7843             objc_check_decl (decl);
7844           rest_of_decl_compilation (decl, toplevel, 0);
7845         }
7846     }
7847   C_TYPE_INCOMPLETE_VARS (TYPE_MAIN_VARIANT (t)) = 0;
7848
7849   /* Update type location to the one of the definition, instead of e.g.
7850      a forward declaration.  */
7851   if (TYPE_STUB_DECL (t))
7852     DECL_SOURCE_LOCATION (TYPE_STUB_DECL (t)) = loc;
7853
7854   /* Finish debugging output for this type.  */
7855   rest_of_type_compilation (t, toplevel);
7856
7857   /* If we're inside a function proper, i.e. not file-scope and not still
7858      parsing parameters, then arrange for the size of a variable sized type
7859      to be bound now.  */
7860   if (building_stmt_list_p () && variably_modified_type_p (t, NULL_TREE))
7861     add_stmt (build_stmt (loc,
7862                           DECL_EXPR, build_decl (loc, TYPE_DECL, NULL, t)));
7863
7864   if (warn_cxx_compat)
7865     warn_cxx_compat_finish_struct (fieldlist);
7866
7867   struct_parse_info->struct_types.release ();
7868   struct_parse_info->fields.release ();
7869   struct_parse_info->typedefs_seen.release ();
7870   XDELETE (struct_parse_info);
7871
7872   struct_parse_info = enclosing_struct_parse_info;
7873
7874   /* If this struct is defined inside a struct, add it to
7875      struct_types.  */
7876   if (warn_cxx_compat
7877       && struct_parse_info != NULL
7878       && !in_sizeof && !in_typeof && !in_alignof)
7879     struct_parse_info->struct_types.safe_push (t);
7880
7881   return t;
7882 }
7883
7884 /* Lay out the type T, and its element type, and so on.  */
7885
7886 static void
7887 layout_array_type (tree t)
7888 {
7889   if (TREE_CODE (TREE_TYPE (t)) == ARRAY_TYPE)
7890     layout_array_type (TREE_TYPE (t));
7891   layout_type (t);
7892 }
7893 \f
7894 /* Begin compiling the definition of an enumeration type.
7895    NAME is its name (or null if anonymous).
7896    LOC is the enum's location.
7897    Returns the type object, as yet incomplete.
7898    Also records info about it so that build_enumerator
7899    may be used to declare the individual values as they are read.  */
7900
7901 tree
7902 start_enum (location_t loc, struct c_enum_contents *the_enum, tree name)
7903 {
7904   tree enumtype = NULL_TREE;
7905   location_t enumloc = UNKNOWN_LOCATION;
7906
7907   /* If this is the real definition for a previous forward reference,
7908      fill in the contents in the same object that used to be the
7909      forward reference.  */
7910
7911   if (name != NULL_TREE)
7912     enumtype = lookup_tag (ENUMERAL_TYPE, name, 1, &enumloc);
7913
7914   if (enumtype == 0 || TREE_CODE (enumtype) != ENUMERAL_TYPE)
7915     {
7916       enumtype = make_node (ENUMERAL_TYPE);
7917       pushtag (loc, name, enumtype);
7918     }
7919
7920   if (C_TYPE_BEING_DEFINED (enumtype))
7921     error_at (loc, "nested redefinition of %<enum %E%>", name);
7922
7923   C_TYPE_BEING_DEFINED (enumtype) = 1;
7924
7925   if (TYPE_VALUES (enumtype) != 0)
7926     {
7927       /* This enum is a named one that has been declared already.  */
7928       error_at (loc, "redeclaration of %<enum %E%>", name);
7929       if (enumloc != UNKNOWN_LOCATION)
7930         inform (enumloc, "originally defined here");
7931
7932       /* Completely replace its old definition.
7933          The old enumerators remain defined, however.  */
7934       TYPE_VALUES (enumtype) = 0;
7935     }
7936
7937   the_enum->enum_next_value = integer_zero_node;
7938   the_enum->enum_overflow = 0;
7939
7940   if (flag_short_enums)
7941     TYPE_PACKED (enumtype) = 1;
7942
7943   /* FIXME: This will issue a warning for a use of a type defined
7944      within sizeof in a statement expr.  This is not terribly serious
7945      as C++ doesn't permit statement exprs within sizeof anyhow.  */
7946   if (warn_cxx_compat && (in_sizeof || in_typeof || in_alignof))
7947     warning_at (loc, OPT_Wc___compat,
7948                 "defining type in %qs expression is invalid in C++",
7949                 (in_sizeof
7950                  ? "sizeof"
7951                  : (in_typeof ? "typeof" : "alignof")));
7952
7953   return enumtype;
7954 }
7955
7956 /* After processing and defining all the values of an enumeration type,
7957    install their decls in the enumeration type and finish it off.
7958    ENUMTYPE is the type object, VALUES a list of decl-value pairs,
7959    and ATTRIBUTES are the specified attributes.
7960    Returns ENUMTYPE.  */
7961
7962 tree
7963 finish_enum (tree enumtype, tree values, tree attributes)
7964 {
7965   tree pair, tem;
7966   tree minnode = 0, maxnode = 0;
7967   int precision;
7968   signop sign;
7969   bool toplevel = (file_scope == current_scope);
7970   struct lang_type *lt;
7971
7972   decl_attributes (&enumtype, attributes, (int) ATTR_FLAG_TYPE_IN_PLACE);
7973
7974   /* Calculate the maximum value of any enumerator in this type.  */
7975
7976   if (values == error_mark_node)
7977     minnode = maxnode = integer_zero_node;
7978   else
7979     {
7980       minnode = maxnode = TREE_VALUE (values);
7981       for (pair = TREE_CHAIN (values); pair; pair = TREE_CHAIN (pair))
7982         {
7983           tree value = TREE_VALUE (pair);
7984           if (tree_int_cst_lt (maxnode, value))
7985             maxnode = value;
7986           if (tree_int_cst_lt (value, minnode))
7987             minnode = value;
7988         }
7989     }
7990
7991   /* Construct the final type of this enumeration.  It is the same
7992      as one of the integral types - the narrowest one that fits, except
7993      that normally we only go as narrow as int - and signed iff any of
7994      the values are negative.  */
7995   sign = (tree_int_cst_sgn (minnode) >= 0) ? UNSIGNED : SIGNED;
7996   precision = MAX (tree_int_cst_min_precision (minnode, sign),
7997                    tree_int_cst_min_precision (maxnode, sign));
7998
7999   if (TYPE_PACKED (enumtype) || precision > TYPE_PRECISION (integer_type_node))
8000     {
8001       tem = c_common_type_for_size (precision, sign == UNSIGNED ? 1 : 0);
8002       if (tem == NULL)
8003         {
8004           warning (0, "enumeration values exceed range of largest integer");
8005           tem = long_long_integer_type_node;
8006         }
8007     }
8008   else
8009     tem = sign == UNSIGNED ? unsigned_type_node : integer_type_node;
8010
8011   TYPE_MIN_VALUE (enumtype) = TYPE_MIN_VALUE (tem);
8012   TYPE_MAX_VALUE (enumtype) = TYPE_MAX_VALUE (tem);
8013   TYPE_UNSIGNED (enumtype) = TYPE_UNSIGNED (tem);
8014   TYPE_SIZE (enumtype) = 0;
8015
8016   /* If the precision of the type was specific with an attribute and it
8017      was too small, give an error.  Otherwise, use it.  */
8018   if (TYPE_PRECISION (enumtype))
8019     {
8020       if (precision > TYPE_PRECISION (enumtype))
8021         error ("specified mode too small for enumeral values");
8022     }
8023   else
8024     TYPE_PRECISION (enumtype) = TYPE_PRECISION (tem);
8025
8026   layout_type (enumtype);
8027
8028   if (values != error_mark_node)
8029     {
8030       /* Change the type of the enumerators to be the enum type.  We
8031          need to do this irrespective of the size of the enum, for
8032          proper type checking.  Replace the DECL_INITIALs of the
8033          enumerators, and the value slots of the list, with copies
8034          that have the enum type; they cannot be modified in place
8035          because they may be shared (e.g.  integer_zero_node) Finally,
8036          change the purpose slots to point to the names of the decls.  */
8037       for (pair = values; pair; pair = TREE_CHAIN (pair))
8038         {
8039           tree enu = TREE_PURPOSE (pair);
8040           tree ini = DECL_INITIAL (enu);
8041
8042           TREE_TYPE (enu) = enumtype;
8043
8044           /* The ISO C Standard mandates enumerators to have type int,
8045              even though the underlying type of an enum type is
8046              unspecified.  However, GCC allows enumerators of any
8047              integer type as an extensions.  build_enumerator()
8048              converts any enumerators that fit in an int to type int,
8049              to avoid promotions to unsigned types when comparing
8050              integers with enumerators that fit in the int range.
8051              When -pedantic is given, build_enumerator() would have
8052              already warned about those that don't fit. Here we
8053              convert the rest to the enumerator type. */
8054           if (TREE_TYPE (ini) != integer_type_node)
8055             ini = convert (enumtype, ini);
8056
8057           DECL_INITIAL (enu) = ini;
8058           TREE_PURPOSE (pair) = DECL_NAME (enu);
8059           TREE_VALUE (pair) = ini;
8060         }
8061
8062       TYPE_VALUES (enumtype) = values;
8063     }
8064
8065   /* Record the min/max values so that we can warn about bit-field
8066      enumerations that are too small for the values.  */
8067   lt = ggc_cleared_alloc<struct lang_type> ();
8068   lt->enum_min = minnode;
8069   lt->enum_max = maxnode;
8070   TYPE_LANG_SPECIFIC (enumtype) = lt;
8071
8072   /* Fix up all variant types of this enum type.  */
8073   for (tem = TYPE_MAIN_VARIANT (enumtype); tem; tem = TYPE_NEXT_VARIANT (tem))
8074     {
8075       if (tem == enumtype)
8076         continue;
8077       TYPE_VALUES (tem) = TYPE_VALUES (enumtype);
8078       TYPE_MIN_VALUE (tem) = TYPE_MIN_VALUE (enumtype);
8079       TYPE_MAX_VALUE (tem) = TYPE_MAX_VALUE (enumtype);
8080       TYPE_SIZE (tem) = TYPE_SIZE (enumtype);
8081       TYPE_SIZE_UNIT (tem) = TYPE_SIZE_UNIT (enumtype);
8082       SET_TYPE_MODE (tem, TYPE_MODE (enumtype));
8083       TYPE_PRECISION (tem) = TYPE_PRECISION (enumtype);
8084       TYPE_ALIGN (tem) = TYPE_ALIGN (enumtype);
8085       TYPE_USER_ALIGN (tem) = TYPE_USER_ALIGN (enumtype);
8086       TYPE_UNSIGNED (tem) = TYPE_UNSIGNED (enumtype);
8087       TYPE_LANG_SPECIFIC (tem) = TYPE_LANG_SPECIFIC (enumtype);
8088     }
8089
8090   /* Finish debugging output for this type.  */
8091   rest_of_type_compilation (enumtype, toplevel);
8092
8093   /* If this enum is defined inside a struct, add it to
8094      struct_types.  */
8095   if (warn_cxx_compat
8096       && struct_parse_info != NULL
8097       && !in_sizeof && !in_typeof && !in_alignof)
8098     struct_parse_info->struct_types.safe_push (enumtype);
8099
8100   return enumtype;
8101 }
8102
8103 /* Build and install a CONST_DECL for one value of the
8104    current enumeration type (one that was begun with start_enum).
8105    DECL_LOC is the location of the enumerator.
8106    LOC is the location of the '=' operator if any, DECL_LOC otherwise.
8107    Return a tree-list containing the CONST_DECL and its value.
8108    Assignment of sequential values by default is handled here.  */
8109
8110 tree
8111 build_enumerator (location_t decl_loc, location_t loc,
8112                   struct c_enum_contents *the_enum, tree name, tree value)
8113 {
8114   tree decl, type;
8115
8116   /* Validate and default VALUE.  */
8117
8118   if (value != 0)
8119     {
8120       /* Don't issue more errors for error_mark_node (i.e. an
8121          undeclared identifier) - just ignore the value expression.  */
8122       if (value == error_mark_node)
8123         value = 0;
8124       else if (!INTEGRAL_TYPE_P (TREE_TYPE (value)))
8125         {
8126           error_at (loc, "enumerator value for %qE is not an integer constant",
8127                     name);
8128           value = 0;
8129         }
8130       else
8131         {
8132           if (TREE_CODE (value) != INTEGER_CST)
8133             {
8134               value = c_fully_fold (value, false, NULL);
8135               if (TREE_CODE (value) == INTEGER_CST)
8136                 pedwarn (loc, OPT_Wpedantic,
8137                          "enumerator value for %qE is not an integer "
8138                          "constant expression", name);
8139             }
8140           if (TREE_CODE (value) != INTEGER_CST)
8141             {
8142               error ("enumerator value for %qE is not an integer constant",
8143                      name);
8144               value = 0;
8145             }
8146           else
8147             {
8148               value = default_conversion (value);
8149               constant_expression_warning (value);
8150             }
8151         }
8152     }
8153
8154   /* Default based on previous value.  */
8155   /* It should no longer be possible to have NON_LVALUE_EXPR
8156      in the default.  */
8157   if (value == 0)
8158     {
8159       value = the_enum->enum_next_value;
8160       if (the_enum->enum_overflow)
8161         error_at (loc, "overflow in enumeration values");
8162     }
8163   /* Even though the underlying type of an enum is unspecified, the
8164      type of enumeration constants is explicitly defined as int
8165      (6.4.4.3/2 in the C99 Standard).  GCC allows any integer type as
8166      an extension.  */
8167   else if (!int_fits_type_p (value, integer_type_node))
8168     pedwarn (loc, OPT_Wpedantic,
8169              "ISO C restricts enumerator values to range of %<int%>");
8170
8171   /* The ISO C Standard mandates enumerators to have type int, even
8172      though the underlying type of an enum type is unspecified.
8173      However, GCC allows enumerators of any integer type as an
8174      extensions.  Here we convert any enumerators that fit in an int
8175      to type int, to avoid promotions to unsigned types when comparing
8176      integers with enumerators that fit in the int range.  When
8177      -pedantic is given, we would have already warned about those that
8178      don't fit. We have to do this here rather than in finish_enum
8179      because this value may be used to define more enumerators.  */
8180   if (int_fits_type_p (value, integer_type_node))
8181     value = convert (integer_type_node, value);
8182
8183   /* Set basis for default for next value.  */
8184   the_enum->enum_next_value
8185     = build_binary_op (EXPR_LOC_OR_LOC (value, input_location),
8186                        PLUS_EXPR, value, integer_one_node, 0);
8187   the_enum->enum_overflow = tree_int_cst_lt (the_enum->enum_next_value, value);
8188
8189   /* Now create a declaration for the enum value name.  */
8190
8191   type = TREE_TYPE (value);
8192   type = c_common_type_for_size (MAX (TYPE_PRECISION (type),
8193                                       TYPE_PRECISION (integer_type_node)),
8194                                  (TYPE_PRECISION (type)
8195                                   >= TYPE_PRECISION (integer_type_node)
8196                                   && TYPE_UNSIGNED (type)));
8197
8198   decl = build_decl (decl_loc, CONST_DECL, name, type);
8199   DECL_INITIAL (decl) = convert (type, value);
8200   pushdecl (decl);
8201
8202   return tree_cons (decl, value, NULL_TREE);
8203 }
8204
8205 \f
8206 /* Create the FUNCTION_DECL for a function definition.
8207    DECLSPECS, DECLARATOR and ATTRIBUTES are the parts of
8208    the declaration; they describe the function's name and the type it returns,
8209    but twisted together in a fashion that parallels the syntax of C.
8210
8211    This function creates a binding context for the function body
8212    as well as setting up the FUNCTION_DECL in current_function_decl.
8213
8214    Returns 1 on success.  If the DECLARATOR is not suitable for a function
8215    (it defines a datum instead), we return 0, which tells
8216    yyparse to report a parse error.  */
8217
8218 int
8219 start_function (struct c_declspecs *declspecs, struct c_declarator *declarator,
8220                 tree attributes)
8221 {
8222   tree decl1, old_decl;
8223   tree restype, resdecl;
8224   location_t loc;
8225
8226   current_function_returns_value = 0;  /* Assume, until we see it does.  */
8227   current_function_returns_null = 0;
8228   current_function_returns_abnormally = 0;
8229   warn_about_return_type = 0;
8230   c_switch_stack = NULL;
8231
8232   /* Indicate no valid break/continue context by setting these variables
8233      to some non-null, non-label value.  We'll notice and emit the proper
8234      error message in c_finish_bc_stmt.  */
8235   c_break_label = c_cont_label = size_zero_node;
8236
8237   decl1 = grokdeclarator (declarator, declspecs, FUNCDEF, true, NULL,
8238                           &attributes, NULL, NULL, DEPRECATED_NORMAL);
8239
8240   /* If the declarator is not suitable for a function definition,
8241      cause a syntax error.  */
8242   if (decl1 == 0
8243       || TREE_CODE (decl1) != FUNCTION_DECL)
8244     return 0;
8245
8246   loc = DECL_SOURCE_LOCATION (decl1);
8247
8248   c_decl_attributes (&decl1, attributes, 0);
8249
8250   if (DECL_DECLARED_INLINE_P (decl1)
8251       && DECL_UNINLINABLE (decl1)
8252       && lookup_attribute ("noinline", DECL_ATTRIBUTES (decl1)))
8253     warning_at (loc, OPT_Wattributes,
8254                 "inline function %qD given attribute noinline",
8255                 decl1);
8256
8257   /* Handle gnu_inline attribute.  */
8258   if (declspecs->inline_p
8259       && !flag_gnu89_inline
8260       && TREE_CODE (decl1) == FUNCTION_DECL
8261       && (lookup_attribute ("gnu_inline", DECL_ATTRIBUTES (decl1))
8262           || current_function_decl))
8263     {
8264       if (declspecs->storage_class != csc_static)
8265         DECL_EXTERNAL (decl1) = !DECL_EXTERNAL (decl1);
8266     }
8267
8268   announce_function (decl1);
8269
8270   if (!COMPLETE_OR_VOID_TYPE_P (TREE_TYPE (TREE_TYPE (decl1))))
8271     {
8272       error_at (loc, "return type is an incomplete type");
8273       /* Make it return void instead.  */
8274       TREE_TYPE (decl1)
8275         = build_function_type (void_type_node,
8276                                TYPE_ARG_TYPES (TREE_TYPE (decl1)));
8277     }
8278
8279   if (warn_about_return_type)
8280     warn_defaults_to (loc, flag_isoc99 ? OPT_Wimplicit_int
8281                            : (warn_return_type ? OPT_Wreturn_type
8282                               : OPT_Wimplicit_int),
8283                       "return type defaults to %<int%>");
8284
8285   /* Make the init_value nonzero so pushdecl knows this is not tentative.
8286      error_mark_node is replaced below (in pop_scope) with the BLOCK.  */
8287   DECL_INITIAL (decl1) = error_mark_node;
8288
8289   /* A nested function is not global.  */
8290   if (current_function_decl != 0)
8291     TREE_PUBLIC (decl1) = 0;
8292
8293   /* If this definition isn't a prototype and we had a prototype declaration
8294      before, copy the arg type info from that prototype.  */
8295   old_decl = lookup_name_in_scope (DECL_NAME (decl1), current_scope);
8296   if (old_decl && TREE_CODE (old_decl) != FUNCTION_DECL)
8297     old_decl = 0;
8298   current_function_prototype_locus = UNKNOWN_LOCATION;
8299   current_function_prototype_built_in = false;
8300   current_function_prototype_arg_types = NULL_TREE;
8301   if (!prototype_p (TREE_TYPE (decl1)))
8302     {
8303       if (old_decl != 0 && TREE_CODE (TREE_TYPE (old_decl)) == FUNCTION_TYPE
8304           && comptypes (TREE_TYPE (TREE_TYPE (decl1)),
8305                         TREE_TYPE (TREE_TYPE (old_decl))))
8306         {
8307           TREE_TYPE (decl1) = composite_type (TREE_TYPE (old_decl),
8308                                               TREE_TYPE (decl1));
8309           current_function_prototype_locus = DECL_SOURCE_LOCATION (old_decl);
8310           current_function_prototype_built_in
8311             = C_DECL_BUILTIN_PROTOTYPE (old_decl);
8312           current_function_prototype_arg_types
8313             = TYPE_ARG_TYPES (TREE_TYPE (decl1));
8314         }
8315       if (TREE_PUBLIC (decl1))
8316         {
8317           /* If there is an external prototype declaration of this
8318              function, record its location but do not copy information
8319              to this decl.  This may be an invisible declaration
8320              (built-in or in a scope which has finished) or simply
8321              have more refined argument types than any declaration
8322              found above.  */
8323           struct c_binding *b;
8324           for (b = I_SYMBOL_BINDING (DECL_NAME (decl1)); b; b = b->shadowed)
8325             if (B_IN_SCOPE (b, external_scope))
8326               break;
8327           if (b)
8328             {
8329               tree ext_decl, ext_type;
8330               ext_decl = b->decl;
8331               ext_type = b->u.type ? b->u.type : TREE_TYPE (ext_decl);
8332               if (TREE_CODE (ext_type) == FUNCTION_TYPE
8333                   && comptypes (TREE_TYPE (TREE_TYPE (decl1)),
8334                                 TREE_TYPE (ext_type)))
8335                 {
8336                   current_function_prototype_locus
8337                     = DECL_SOURCE_LOCATION (ext_decl);
8338                   current_function_prototype_built_in
8339                     = C_DECL_BUILTIN_PROTOTYPE (ext_decl);
8340                   current_function_prototype_arg_types
8341                     = TYPE_ARG_TYPES (ext_type);
8342                 }
8343             }
8344         }
8345     }
8346
8347   /* Optionally warn of old-fashioned def with no previous prototype.  */
8348   if (warn_strict_prototypes
8349       && old_decl != error_mark_node
8350       && !prototype_p (TREE_TYPE (decl1))
8351       && C_DECL_ISNT_PROTOTYPE (old_decl))
8352     warning_at (loc, OPT_Wstrict_prototypes,
8353                 "function declaration isn%'t a prototype");
8354   /* Optionally warn of any global def with no previous prototype.  */
8355   else if (warn_missing_prototypes
8356            && old_decl != error_mark_node
8357            && TREE_PUBLIC (decl1)
8358            && !MAIN_NAME_P (DECL_NAME (decl1))
8359            && C_DECL_ISNT_PROTOTYPE (old_decl)
8360            && !DECL_DECLARED_INLINE_P (decl1))
8361     warning_at (loc, OPT_Wmissing_prototypes,
8362                 "no previous prototype for %qD", decl1);
8363   /* Optionally warn of any def with no previous prototype
8364      if the function has already been used.  */
8365   else if (warn_missing_prototypes
8366            && old_decl != 0
8367            && old_decl != error_mark_node
8368            && TREE_USED (old_decl)
8369            && !prototype_p (TREE_TYPE (old_decl)))
8370     warning_at (loc, OPT_Wmissing_prototypes,
8371                 "%qD was used with no prototype before its definition", decl1);
8372   /* Optionally warn of any global def with no previous declaration.  */
8373   else if (warn_missing_declarations
8374            && TREE_PUBLIC (decl1)
8375            && old_decl == 0
8376            && !MAIN_NAME_P (DECL_NAME (decl1))
8377            && !DECL_DECLARED_INLINE_P (decl1))
8378     warning_at (loc, OPT_Wmissing_declarations,
8379                 "no previous declaration for %qD",
8380                 decl1);
8381   /* Optionally warn of any def with no previous declaration
8382      if the function has already been used.  */
8383   else if (warn_missing_declarations
8384            && old_decl != 0
8385            && old_decl != error_mark_node
8386            && TREE_USED (old_decl)
8387            && C_DECL_IMPLICIT (old_decl))
8388     warning_at (loc, OPT_Wmissing_declarations,
8389                 "%qD was used with no declaration before its definition", decl1);
8390
8391   /* This function exists in static storage.
8392      (This does not mean `static' in the C sense!)  */
8393   TREE_STATIC (decl1) = 1;
8394
8395   /* This is the earliest point at which we might know the assembler
8396      name of the function.  Thus, if it's set before this, die horribly.  */
8397   gcc_assert (!DECL_ASSEMBLER_NAME_SET_P (decl1));
8398
8399   /* If #pragma weak was used, mark the decl weak now.  */
8400   if (current_scope == file_scope)
8401     maybe_apply_pragma_weak (decl1);
8402
8403   /* Warn for unlikely, improbable, or stupid declarations of `main'.  */
8404   if (warn_main && MAIN_NAME_P (DECL_NAME (decl1)))
8405     {
8406       if (TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (decl1)))
8407           != integer_type_node)
8408         pedwarn (loc, OPT_Wmain, "return type of %qD is not %<int%>", decl1);
8409       else if (TYPE_ATOMIC (TREE_TYPE (TREE_TYPE (decl1))))
8410         pedwarn (loc, OPT_Wmain, "%<_Atomic%>-qualified return type of %qD",
8411                  decl1);
8412
8413       check_main_parameter_types (decl1);
8414
8415       if (!TREE_PUBLIC (decl1))
8416         pedwarn (loc, OPT_Wmain,
8417                  "%qD is normally a non-static function", decl1);
8418     }
8419
8420   /* Record the decl so that the function name is defined.
8421      If we already have a decl for this name, and it is a FUNCTION_DECL,
8422      use the old decl.  */
8423
8424   current_function_decl = pushdecl (decl1);
8425
8426   push_scope ();
8427   declare_parm_level ();
8428
8429   restype = TREE_TYPE (TREE_TYPE (current_function_decl));
8430   resdecl = build_decl (loc, RESULT_DECL, NULL_TREE, restype);
8431   DECL_ARTIFICIAL (resdecl) = 1;
8432   DECL_IGNORED_P (resdecl) = 1;
8433   DECL_RESULT (current_function_decl) = resdecl;
8434
8435   start_fname_decls ();
8436
8437   return 1;
8438 }
8439 \f
8440 /* Subroutine of store_parm_decls which handles new-style function
8441    definitions (prototype format). The parms already have decls, so we
8442    need only record them as in effect and complain if any redundant
8443    old-style parm decls were written.  */
8444 static void
8445 store_parm_decls_newstyle (tree fndecl, const struct c_arg_info *arg_info)
8446 {
8447   tree decl;
8448   c_arg_tag *tag;
8449   unsigned ix;
8450
8451   if (current_scope->bindings)
8452     {
8453       error_at (DECL_SOURCE_LOCATION (fndecl),
8454                 "old-style parameter declarations in prototyped "
8455                 "function definition");
8456
8457       /* Get rid of the old-style declarations.  */
8458       pop_scope ();
8459       push_scope ();
8460     }
8461   /* Don't issue this warning for nested functions, and don't issue this
8462      warning if we got here because ARG_INFO_TYPES was error_mark_node
8463      (this happens when a function definition has just an ellipsis in
8464      its parameter list).  */
8465   else if (!in_system_header_at (input_location)
8466            && !current_function_scope
8467            && arg_info->types != error_mark_node)
8468     warning_at (DECL_SOURCE_LOCATION (fndecl), OPT_Wtraditional,
8469                 "traditional C rejects ISO C style function definitions");
8470
8471   /* Now make all the parameter declarations visible in the function body.
8472      We can bypass most of the grunt work of pushdecl.  */
8473   for (decl = arg_info->parms; decl; decl = DECL_CHAIN (decl))
8474     {
8475       DECL_CONTEXT (decl) = current_function_decl;
8476       if (DECL_NAME (decl))
8477         {
8478           bind (DECL_NAME (decl), decl, current_scope,
8479                 /*invisible=*/false, /*nested=*/false,
8480                 UNKNOWN_LOCATION);
8481           if (!TREE_USED (decl))
8482             warn_if_shadowing (decl);
8483         }
8484       else
8485         error_at (DECL_SOURCE_LOCATION (decl), "parameter name omitted");
8486     }
8487
8488   /* Record the parameter list in the function declaration.  */
8489   DECL_ARGUMENTS (fndecl) = arg_info->parms;
8490
8491   /* Now make all the ancillary declarations visible, likewise.  */
8492   for (decl = arg_info->others; decl; decl = DECL_CHAIN (decl))
8493     {
8494       DECL_CONTEXT (decl) = current_function_decl;
8495       if (DECL_NAME (decl))
8496         bind (DECL_NAME (decl), decl, current_scope,
8497               /*invisible=*/false,
8498               /*nested=*/(TREE_CODE (decl) == FUNCTION_DECL),
8499               UNKNOWN_LOCATION);
8500     }
8501
8502   /* And all the tag declarations.  */
8503   FOR_EACH_VEC_SAFE_ELT_REVERSE (arg_info->tags, ix, tag)
8504     if (tag->id)
8505       bind (tag->id, tag->type, current_scope,
8506             /*invisible=*/false, /*nested=*/false, UNKNOWN_LOCATION);
8507 }
8508
8509 /* Subroutine of store_parm_decls which handles old-style function
8510    definitions (separate parameter list and declarations).  */
8511
8512 static void
8513 store_parm_decls_oldstyle (tree fndecl, const struct c_arg_info *arg_info)
8514 {
8515   struct c_binding *b;
8516   tree parm, decl, last;
8517   tree parmids = arg_info->parms;
8518   hash_set<tree> seen_args;
8519
8520   if (!in_system_header_at (input_location))
8521     warning_at (DECL_SOURCE_LOCATION (fndecl),
8522                 OPT_Wold_style_definition, "old-style function definition");
8523
8524   /* Match each formal parameter name with its declaration.  Save each
8525      decl in the appropriate TREE_PURPOSE slot of the parmids chain.  */
8526   for (parm = parmids; parm; parm = TREE_CHAIN (parm))
8527     {
8528       if (TREE_VALUE (parm) == 0)
8529         {
8530           error_at (DECL_SOURCE_LOCATION (fndecl),
8531                     "parameter name missing from parameter list");
8532           TREE_PURPOSE (parm) = 0;
8533           continue;
8534         }
8535
8536       b = I_SYMBOL_BINDING (TREE_VALUE (parm));
8537       if (b && B_IN_CURRENT_SCOPE (b))
8538         {
8539           decl = b->decl;
8540           /* Skip erroneous parameters.  */
8541           if (decl == error_mark_node)
8542             continue;
8543           /* If we got something other than a PARM_DECL it is an error.  */
8544           if (TREE_CODE (decl) != PARM_DECL)
8545             error_at (DECL_SOURCE_LOCATION (decl),
8546                       "%qD declared as a non-parameter", decl);
8547           /* If the declaration is already marked, we have a duplicate
8548              name.  Complain and ignore the duplicate.  */
8549           else if (seen_args.contains (decl))
8550             {
8551               error_at (DECL_SOURCE_LOCATION (decl),
8552                         "multiple parameters named %qD", decl);
8553               TREE_PURPOSE (parm) = 0;
8554               continue;
8555             }
8556           /* If the declaration says "void", complain and turn it into
8557              an int.  */
8558           else if (VOID_TYPE_P (TREE_TYPE (decl)))
8559             {
8560               error_at (DECL_SOURCE_LOCATION (decl),
8561                         "parameter %qD declared with void type", decl);
8562               TREE_TYPE (decl) = integer_type_node;
8563               DECL_ARG_TYPE (decl) = integer_type_node;
8564               layout_decl (decl, 0);
8565             }
8566           warn_if_shadowing (decl);
8567         }
8568       /* If no declaration found, default to int.  */
8569       else
8570         {
8571           /* FIXME diagnostics: This should be the location of the argument,
8572              not the FNDECL.  E.g., for an old-style declaration
8573
8574                int f10(v) { blah; }
8575
8576              We should use the location of the V, not the F10.
8577              Unfortunately, the V is an IDENTIFIER_NODE which has no
8578              location.  In the future we need locations for c_arg_info
8579              entries.
8580
8581              See gcc.dg/Wshadow-3.c for an example of this problem. */
8582           decl = build_decl (DECL_SOURCE_LOCATION (fndecl),
8583                              PARM_DECL, TREE_VALUE (parm), integer_type_node);
8584           DECL_ARG_TYPE (decl) = TREE_TYPE (decl);
8585           pushdecl (decl);
8586           warn_if_shadowing (decl);
8587
8588           if (flag_isoc99)
8589             pedwarn (DECL_SOURCE_LOCATION (decl),
8590                      OPT_Wimplicit_int, "type of %qD defaults to %<int%>",
8591                      decl);
8592           else
8593             warning_at (DECL_SOURCE_LOCATION (decl),
8594                         OPT_Wmissing_parameter_type,
8595                         "type of %qD defaults to %<int%>", decl);
8596         }
8597
8598       TREE_PURPOSE (parm) = decl;
8599       seen_args.add (decl);
8600     }
8601
8602   /* Now examine the parms chain for incomplete declarations
8603      and declarations with no corresponding names.  */
8604
8605   for (b = current_scope->bindings; b; b = b->prev)
8606     {
8607       parm = b->decl;
8608       if (TREE_CODE (parm) != PARM_DECL)
8609         continue;
8610
8611       if (TREE_TYPE (parm) != error_mark_node
8612           && !COMPLETE_TYPE_P (TREE_TYPE (parm)))
8613         {
8614           error_at (DECL_SOURCE_LOCATION (parm),
8615                     "parameter %qD has incomplete type", parm);
8616           TREE_TYPE (parm) = error_mark_node;
8617         }
8618
8619       if (!seen_args.contains (parm))
8620         {
8621           error_at (DECL_SOURCE_LOCATION (parm),
8622                     "declaration for parameter %qD but no such parameter",
8623                     parm);
8624
8625           /* Pretend the parameter was not missing.
8626              This gets us to a standard state and minimizes
8627              further error messages.  */
8628           parmids = chainon (parmids, tree_cons (parm, 0, 0));
8629         }
8630     }
8631
8632   /* Chain the declarations together in the order of the list of
8633      names.  Store that chain in the function decl, replacing the
8634      list of names.  Update the current scope to match.  */
8635   DECL_ARGUMENTS (fndecl) = 0;
8636
8637   for (parm = parmids; parm; parm = TREE_CHAIN (parm))
8638     if (TREE_PURPOSE (parm))
8639       break;
8640   if (parm && TREE_PURPOSE (parm))
8641     {
8642       last = TREE_PURPOSE (parm);
8643       DECL_ARGUMENTS (fndecl) = last;
8644
8645       for (parm = TREE_CHAIN (parm); parm; parm = TREE_CHAIN (parm))
8646         if (TREE_PURPOSE (parm))
8647           {
8648             DECL_CHAIN (last) = TREE_PURPOSE (parm);
8649             last = TREE_PURPOSE (parm);
8650           }
8651       DECL_CHAIN (last) = 0;
8652     }
8653
8654   /* If there was a previous prototype,
8655      set the DECL_ARG_TYPE of each argument according to
8656      the type previously specified, and report any mismatches.  */
8657
8658   if (current_function_prototype_arg_types)
8659     {
8660       tree type;
8661       for (parm = DECL_ARGUMENTS (fndecl),
8662              type = current_function_prototype_arg_types;
8663            parm || (type && TREE_VALUE (type) != error_mark_node
8664                    && (TYPE_MAIN_VARIANT (TREE_VALUE (type)) != void_type_node));
8665            parm = DECL_CHAIN (parm), type = TREE_CHAIN (type))
8666         {
8667           if (parm == 0 || type == 0
8668               || TYPE_MAIN_VARIANT (TREE_VALUE (type)) == void_type_node)
8669             {
8670               if (current_function_prototype_built_in)
8671                 warning_at (DECL_SOURCE_LOCATION (fndecl),
8672                             0, "number of arguments doesn%'t match "
8673                             "built-in prototype");
8674               else
8675                 {
8676                   /* FIXME diagnostics: This should be the location of
8677                      FNDECL, but there is bug when a prototype is
8678                      declared inside function context, but defined
8679                      outside of it (e.g., gcc.dg/pr15698-2.c).  In
8680                      which case FNDECL gets the location of the
8681                      prototype, not the definition.  */
8682                   error_at (input_location,
8683                             "number of arguments doesn%'t match prototype");
8684
8685                   error_at (current_function_prototype_locus,
8686                             "prototype declaration");
8687                 }
8688               break;
8689             }
8690           /* Type for passing arg must be consistent with that
8691              declared for the arg.  ISO C says we take the unqualified
8692              type for parameters declared with qualified type.  */
8693           if (TREE_TYPE (parm) != error_mark_node
8694               && TREE_TYPE (type) != error_mark_node
8695               && ((TYPE_ATOMIC (DECL_ARG_TYPE (parm))
8696                    != TYPE_ATOMIC (TREE_VALUE (type)))
8697                   || !comptypes (TYPE_MAIN_VARIANT (DECL_ARG_TYPE (parm)),
8698                                  TYPE_MAIN_VARIANT (TREE_VALUE (type)))))
8699             {
8700               if ((TYPE_ATOMIC (DECL_ARG_TYPE (parm))
8701                    == TYPE_ATOMIC (TREE_VALUE (type)))
8702                   && (TYPE_MAIN_VARIANT (TREE_TYPE (parm))
8703                       == TYPE_MAIN_VARIANT (TREE_VALUE (type))))
8704                 {
8705                   /* Adjust argument to match prototype.  E.g. a previous
8706                      `int foo(float);' prototype causes
8707                      `int foo(x) float x; {...}' to be treated like
8708                      `int foo(float x) {...}'.  This is particularly
8709                      useful for argument types like uid_t.  */
8710                   DECL_ARG_TYPE (parm) = TREE_TYPE (parm);
8711
8712                   if (targetm.calls.promote_prototypes (TREE_TYPE (current_function_decl))
8713                       && INTEGRAL_TYPE_P (TREE_TYPE (parm))
8714                       && TYPE_PRECISION (TREE_TYPE (parm))
8715                       < TYPE_PRECISION (integer_type_node))
8716                     DECL_ARG_TYPE (parm)
8717                       = c_type_promotes_to (TREE_TYPE (parm));
8718
8719                   /* ??? Is it possible to get here with a
8720                      built-in prototype or will it always have
8721                      been diagnosed as conflicting with an
8722                      old-style definition and discarded?  */
8723                   if (current_function_prototype_built_in)
8724                     warning_at (DECL_SOURCE_LOCATION (parm),
8725                                 OPT_Wpedantic, "promoted argument %qD "
8726                                 "doesn%'t match built-in prototype", parm);
8727                   else
8728                     {
8729                       pedwarn (DECL_SOURCE_LOCATION (parm),
8730                                OPT_Wpedantic, "promoted argument %qD "
8731                                "doesn%'t match prototype", parm);
8732                       pedwarn (current_function_prototype_locus, OPT_Wpedantic,
8733                                "prototype declaration");
8734                     }
8735                 }
8736               else
8737                 {
8738                   if (current_function_prototype_built_in)
8739                     warning_at (DECL_SOURCE_LOCATION (parm),
8740                                 0, "argument %qD doesn%'t match "
8741                                 "built-in prototype", parm);
8742                   else
8743                     {
8744                       error_at (DECL_SOURCE_LOCATION (parm),
8745                                 "argument %qD doesn%'t match prototype", parm);
8746                       error_at (current_function_prototype_locus,
8747                                 "prototype declaration");
8748                     }
8749                 }
8750             }
8751         }
8752       TYPE_ACTUAL_ARG_TYPES (TREE_TYPE (fndecl)) = 0;
8753     }
8754
8755   /* Otherwise, create a prototype that would match.  */
8756
8757   else
8758     {
8759       tree actual = 0, last = 0, type;
8760
8761       for (parm = DECL_ARGUMENTS (fndecl); parm; parm = DECL_CHAIN (parm))
8762         {
8763           type = tree_cons (NULL_TREE, DECL_ARG_TYPE (parm), NULL_TREE);
8764           if (last)
8765             TREE_CHAIN (last) = type;
8766           else
8767             actual = type;
8768           last = type;
8769         }
8770       type = tree_cons (NULL_TREE, void_type_node, NULL_TREE);
8771       if (last)
8772         TREE_CHAIN (last) = type;
8773       else
8774         actual = type;
8775
8776       /* We are going to assign a new value for the TYPE_ACTUAL_ARG_TYPES
8777          of the type of this function, but we need to avoid having this
8778          affect the types of other similarly-typed functions, so we must
8779          first force the generation of an identical (but separate) type
8780          node for the relevant function type.  The new node we create
8781          will be a variant of the main variant of the original function
8782          type.  */
8783
8784       TREE_TYPE (fndecl) = build_variant_type_copy (TREE_TYPE (fndecl));
8785
8786       TYPE_ACTUAL_ARG_TYPES (TREE_TYPE (fndecl)) = actual;
8787     }
8788 }
8789
8790 /* Store parameter declarations passed in ARG_INFO into the current
8791    function declaration.  */
8792
8793 void
8794 store_parm_decls_from (struct c_arg_info *arg_info)
8795 {
8796   current_function_arg_info = arg_info;
8797   store_parm_decls ();
8798 }
8799
8800 /* Store the parameter declarations into the current function declaration.
8801    This is called after parsing the parameter declarations, before
8802    digesting the body of the function.
8803
8804    For an old-style definition, construct a prototype out of the old-style
8805    parameter declarations and inject it into the function's type.  */
8806
8807 void
8808 store_parm_decls (void)
8809 {
8810   tree fndecl = current_function_decl;
8811   bool proto;
8812
8813   /* The argument information block for FNDECL.  */
8814   struct c_arg_info *arg_info = current_function_arg_info;
8815   current_function_arg_info = 0;
8816
8817   /* True if this definition is written with a prototype.  Note:
8818      despite C99 6.7.5.3p14, we can *not* treat an empty argument
8819      list in a function definition as equivalent to (void) -- an
8820      empty argument list specifies the function has no parameters,
8821      but only (void) sets up a prototype for future calls.  */
8822   proto = arg_info->types != 0;
8823
8824   if (proto)
8825     store_parm_decls_newstyle (fndecl, arg_info);
8826   else
8827     store_parm_decls_oldstyle (fndecl, arg_info);
8828
8829   /* The next call to push_scope will be a function body.  */
8830
8831   next_is_function_body = true;
8832
8833   /* Write a record describing this function definition to the prototypes
8834      file (if requested).  */
8835
8836   gen_aux_info_record (fndecl, 1, 0, proto);
8837
8838   /* Initialize the RTL code for the function.  */
8839   allocate_struct_function (fndecl, false);
8840
8841   if (warn_unused_local_typedefs)
8842     cfun->language = ggc_cleared_alloc<language_function> ();
8843
8844   /* Begin the statement tree for this function.  */
8845   DECL_SAVED_TREE (fndecl) = push_stmt_list ();
8846
8847   /* ??? Insert the contents of the pending sizes list into the function
8848      to be evaluated.  The only reason left to have this is
8849         void foo(int n, int array[n++])
8850      because we throw away the array type in favor of a pointer type, and
8851      thus won't naturally see the SAVE_EXPR containing the increment.  All
8852      other pending sizes would be handled by gimplify_parameters.  */
8853   if (arg_info->pending_sizes)
8854     add_stmt (arg_info->pending_sizes);
8855 }
8856
8857 /* Store PARM_DECLs in PARMS into scope temporarily.  Used for
8858    c_finish_omp_declare_simd for function prototypes.  No diagnostics
8859    should be done.  */
8860
8861 void
8862 temp_store_parm_decls (tree fndecl, tree parms)
8863 {
8864   push_scope ();
8865   for (tree p = parms; p; p = DECL_CHAIN (p))
8866     {
8867       DECL_CONTEXT (p) = fndecl;
8868       if (DECL_NAME (p))
8869         bind (DECL_NAME (p), p, current_scope,
8870               /*invisible=*/false, /*nested=*/false,
8871               UNKNOWN_LOCATION);
8872     }
8873 }
8874
8875 /* Undo what temp_store_parm_decls did.  */
8876
8877 void
8878 temp_pop_parm_decls (void)
8879 {
8880   /* Clear all bindings in this temporary scope, so that
8881      pop_scope doesn't create a BLOCK.  */
8882   struct c_binding *b = current_scope->bindings;
8883   current_scope->bindings = NULL;
8884   for (; b; b = free_binding_and_advance (b))
8885     {
8886       gcc_assert (TREE_CODE (b->decl) == PARM_DECL);
8887       gcc_assert (I_SYMBOL_BINDING (b->id) == b);
8888       I_SYMBOL_BINDING (b->id) = b->shadowed;
8889       if (b->shadowed && b->shadowed->u.type)
8890         TREE_TYPE (b->shadowed->decl) = b->shadowed->u.type;
8891     }
8892   pop_scope ();
8893 }
8894 \f
8895
8896 /* Finish up a function declaration and compile that function
8897    all the way to assembler language output.  Then free the storage
8898    for the function definition.
8899
8900    This is called after parsing the body of the function definition.  */
8901
8902 void
8903 finish_function (void)
8904 {
8905   tree fndecl = current_function_decl;
8906   
8907   if (c_dialect_objc ())
8908     objc_finish_function ();
8909
8910   if (TREE_CODE (fndecl) == FUNCTION_DECL
8911       && targetm.calls.promote_prototypes (TREE_TYPE (fndecl)))
8912     {
8913       tree args = DECL_ARGUMENTS (fndecl);
8914       for (; args; args = DECL_CHAIN (args))
8915         {
8916           tree type = TREE_TYPE (args);
8917           if (INTEGRAL_TYPE_P (type)
8918               && TYPE_PRECISION (type) < TYPE_PRECISION (integer_type_node))
8919             DECL_ARG_TYPE (args) = c_type_promotes_to (type);
8920         }
8921     }
8922
8923   if (DECL_INITIAL (fndecl) && DECL_INITIAL (fndecl) != error_mark_node)
8924     BLOCK_SUPERCONTEXT (DECL_INITIAL (fndecl)) = fndecl;
8925
8926   /* Must mark the RESULT_DECL as being in this function.  */
8927
8928   if (DECL_RESULT (fndecl) && DECL_RESULT (fndecl) != error_mark_node)
8929     DECL_CONTEXT (DECL_RESULT (fndecl)) = fndecl;
8930
8931   if (MAIN_NAME_P (DECL_NAME (fndecl)) && flag_hosted
8932       && TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (fndecl)))
8933       == integer_type_node && flag_isoc99)
8934     {
8935       /* Hack.  We don't want the middle-end to warn that this return
8936          is unreachable, so we mark its location as special.  Using
8937          UNKNOWN_LOCATION has the problem that it gets clobbered in
8938          annotate_one_with_locus.  A cleaner solution might be to
8939          ensure ! should_carry_locus_p (stmt), but that needs a flag.
8940       */
8941       c_finish_return (BUILTINS_LOCATION, integer_zero_node, NULL_TREE);
8942     }
8943
8944   /* Tie off the statement tree for this function.  */
8945   DECL_SAVED_TREE (fndecl) = pop_stmt_list (DECL_SAVED_TREE (fndecl));
8946
8947   /* If the function has _Cilk_spawn in front of a function call inside it
8948      i.e. it is a spawning function, then add the appropriate Cilk plus
8949      functions inside.  */
8950   if (fn_contains_cilk_spawn_p (cfun))
8951     cfun->cilk_frame_decl = insert_cilk_frame (fndecl);
8952
8953   finish_fname_decls ();
8954
8955   /* Complain if there's just no return statement.  */
8956   if (warn_return_type
8957       && TREE_CODE (TREE_TYPE (TREE_TYPE (fndecl))) != VOID_TYPE
8958       && !current_function_returns_value && !current_function_returns_null
8959       /* Don't complain if we are no-return.  */
8960       && !current_function_returns_abnormally
8961       /* Don't complain if we are declared noreturn.  */
8962       && !TREE_THIS_VOLATILE (fndecl)
8963       /* Don't warn for main().  */
8964       && !MAIN_NAME_P (DECL_NAME (fndecl))
8965       /* Or if they didn't actually specify a return type.  */
8966       && !C_FUNCTION_IMPLICIT_INT (fndecl)
8967       /* Normally, with -Wreturn-type, flow will complain, but we might
8968          optimize out static functions.  */
8969       && !TREE_PUBLIC (fndecl))
8970     {
8971       warning (OPT_Wreturn_type,
8972                "no return statement in function returning non-void");
8973       TREE_NO_WARNING (fndecl) = 1;
8974     }
8975
8976   /* Complain about parameters that are only set, but never otherwise used.  */
8977   if (warn_unused_but_set_parameter)
8978     {
8979       tree decl;
8980
8981       for (decl = DECL_ARGUMENTS (fndecl);
8982            decl;
8983            decl = DECL_CHAIN (decl))
8984         if (TREE_USED (decl)
8985             && TREE_CODE (decl) == PARM_DECL
8986             && !DECL_READ_P (decl)
8987             && DECL_NAME (decl)
8988             && !DECL_ARTIFICIAL (decl)
8989             && !TREE_NO_WARNING (decl))
8990           warning_at (DECL_SOURCE_LOCATION (decl),
8991                       OPT_Wunused_but_set_parameter,
8992                       "parameter %qD set but not used", decl);
8993     }
8994
8995   /* Complain about locally defined typedefs that are not used in this
8996      function.  */
8997   maybe_warn_unused_local_typedefs ();
8998
8999   /* Store the end of the function, so that we get good line number
9000      info for the epilogue.  */
9001   cfun->function_end_locus = input_location;
9002
9003   /* Finalize the ELF visibility for the function.  */
9004   c_determine_visibility (fndecl);
9005
9006   /* For GNU C extern inline functions disregard inline limits.  */
9007   if (DECL_EXTERNAL (fndecl)
9008       && DECL_DECLARED_INLINE_P (fndecl))
9009     DECL_DISREGARD_INLINE_LIMITS (fndecl) = 1;
9010
9011   /* Genericize before inlining.  Delay genericizing nested functions
9012      until their parent function is genericized.  Since finalizing
9013      requires GENERIC, delay that as well.  */
9014
9015   if (DECL_INITIAL (fndecl) && DECL_INITIAL (fndecl) != error_mark_node
9016       && !undef_nested_function)
9017     {
9018       if (!decl_function_context (fndecl))
9019         {
9020           invoke_plugin_callbacks (PLUGIN_PRE_GENERICIZE, fndecl);
9021           c_genericize (fndecl);
9022
9023           /* ??? Objc emits functions after finalizing the compilation unit.
9024              This should be cleaned up later and this conditional removed.  */
9025           if (symtab->global_info_ready)
9026             {
9027               cgraph_node::add_new_function (fndecl, false);
9028               return;
9029             }
9030           cgraph_node::finalize_function (fndecl, false);
9031         }
9032       else
9033         {
9034           /* Register this function with cgraph just far enough to get it
9035             added to our parent's nested function list.  Handy, since the
9036             C front end doesn't have such a list.  */
9037           (void) cgraph_node::get_create (fndecl);
9038         }
9039     }
9040
9041   if (!decl_function_context (fndecl))
9042     undef_nested_function = false;
9043
9044   if (cfun->language != NULL)
9045     {
9046       ggc_free (cfun->language);
9047       cfun->language = NULL;
9048     }
9049
9050   /* We're leaving the context of this function, so zap cfun.
9051      It's still in DECL_STRUCT_FUNCTION, and we'll restore it in
9052      tree_rest_of_compilation.  */
9053   set_cfun (NULL);
9054   current_function_decl = NULL;
9055 }
9056 \f
9057 /* Check the declarations given in a for-loop for satisfying the C99
9058    constraints.  If exactly one such decl is found, return it.  LOC is
9059    the location of the opening parenthesis of the for loop.  The last
9060    parameter allows you to control the "for loop initial declarations
9061    are only allowed in C99 mode".  Normally, you should pass
9062    flag_isoc99 as that parameter.  But in some cases (Objective-C
9063    foreach loop, for example) we want to run the checks in this
9064    function even if not in C99 mode, so we allow the caller to turn
9065    off the error about not being in C99 mode.
9066 */
9067
9068 tree
9069 check_for_loop_decls (location_t loc, bool turn_off_iso_c99_error)
9070 {
9071   struct c_binding *b;
9072   tree one_decl = NULL_TREE;
9073   int n_decls = 0;
9074
9075   if (!turn_off_iso_c99_error)
9076     {
9077       static bool hint = true;
9078       /* If we get here, declarations have been used in a for loop without
9079          the C99 for loop scope.  This doesn't make much sense, so don't
9080          allow it.  */
9081       error_at (loc, "%<for%> loop initial declarations "
9082                 "are only allowed in C99 or C11 mode");
9083       if (hint)
9084         {
9085           inform (loc,
9086                   "use option -std=c99, -std=gnu99, -std=c11 or -std=gnu11 "
9087                   "to compile your code");
9088           hint = false;
9089         }
9090       return NULL_TREE;
9091     }
9092   /* C99 subclause 6.8.5 paragraph 3:
9093
9094        [#3]  The  declaration  part  of  a for statement shall only
9095        declare identifiers for objects having storage class auto or
9096        register.
9097
9098      It isn't clear whether, in this sentence, "identifiers" binds to
9099      "shall only declare" or to "objects" - that is, whether all identifiers
9100      declared must be identifiers for objects, or whether the restriction
9101      only applies to those that are.  (A question on this in comp.std.c
9102      in November 2000 received no answer.)  We implement the strictest
9103      interpretation, to avoid creating an extension which later causes
9104      problems.  */
9105
9106   for (b = current_scope->bindings; b; b = b->prev)
9107     {
9108       tree id = b->id;
9109       tree decl = b->decl;
9110
9111       if (!id)
9112         continue;
9113
9114       switch (TREE_CODE (decl))
9115         {
9116         case VAR_DECL:
9117           {
9118             location_t decl_loc = DECL_SOURCE_LOCATION (decl);
9119             if (TREE_STATIC (decl))
9120               error_at (decl_loc,
9121                         "declaration of static variable %qD in %<for%> loop "
9122                         "initial declaration", decl);
9123             else if (DECL_EXTERNAL (decl))
9124               error_at (decl_loc,
9125                         "declaration of %<extern%> variable %qD in %<for%> loop "
9126                         "initial declaration", decl);
9127           }
9128           break;
9129
9130         case RECORD_TYPE:
9131           error_at (loc,
9132                     "%<struct %E%> declared in %<for%> loop initial "
9133                     "declaration", id);
9134           break;
9135         case UNION_TYPE:
9136           error_at (loc,
9137                     "%<union %E%> declared in %<for%> loop initial declaration",
9138                     id);
9139           break;
9140         case ENUMERAL_TYPE:
9141           error_at (loc, "%<enum %E%> declared in %<for%> loop "
9142                     "initial declaration", id);
9143           break;
9144         default:
9145           error_at (loc, "declaration of non-variable "
9146                     "%qD in %<for%> loop initial declaration", decl);
9147         }
9148
9149       n_decls++;
9150       one_decl = decl;
9151     }
9152
9153   return n_decls == 1 ? one_decl : NULL_TREE;
9154 }
9155 \f
9156 /* Save and reinitialize the variables
9157    used during compilation of a C function.  */
9158
9159 void
9160 c_push_function_context (void)
9161 {
9162   struct language_function *p = cfun->language;
9163   /* cfun->language might have been already allocated by the use of
9164      -Wunused-local-typedefs.  In that case, just re-use it.  */
9165   if (p == NULL)
9166     cfun->language = p = ggc_cleared_alloc<language_function> ();
9167
9168   p->base.x_stmt_tree = c_stmt_tree;
9169   c_stmt_tree.x_cur_stmt_list = vec_safe_copy (c_stmt_tree.x_cur_stmt_list);
9170   p->x_break_label = c_break_label;
9171   p->x_cont_label = c_cont_label;
9172   p->x_switch_stack = c_switch_stack;
9173   p->arg_info = current_function_arg_info;
9174   p->returns_value = current_function_returns_value;
9175   p->returns_null = current_function_returns_null;
9176   p->returns_abnormally = current_function_returns_abnormally;
9177   p->warn_about_return_type = warn_about_return_type;
9178
9179   push_function_context ();
9180 }
9181
9182 /* Restore the variables used during compilation of a C function.  */
9183
9184 void
9185 c_pop_function_context (void)
9186 {
9187   struct language_function *p;
9188
9189   pop_function_context ();
9190   p = cfun->language;
9191
9192   /* When -Wunused-local-typedefs is in effect, cfun->languages is
9193      used to store data throughout the life time of the current cfun,
9194      So don't deallocate it.  */
9195   if (!warn_unused_local_typedefs)
9196     cfun->language = NULL;
9197
9198   if (DECL_STRUCT_FUNCTION (current_function_decl) == 0
9199       && DECL_SAVED_TREE (current_function_decl) == NULL_TREE)
9200     {
9201       /* Stop pointing to the local nodes about to be freed.  */
9202       /* But DECL_INITIAL must remain nonzero so we know this
9203          was an actual function definition.  */
9204       DECL_INITIAL (current_function_decl) = error_mark_node;
9205       DECL_ARGUMENTS (current_function_decl) = 0;
9206     }
9207
9208   c_stmt_tree = p->base.x_stmt_tree;
9209   p->base.x_stmt_tree.x_cur_stmt_list = NULL;
9210   c_break_label = p->x_break_label;
9211   c_cont_label = p->x_cont_label;
9212   c_switch_stack = p->x_switch_stack;
9213   current_function_arg_info = p->arg_info;
9214   current_function_returns_value = p->returns_value;
9215   current_function_returns_null = p->returns_null;
9216   current_function_returns_abnormally = p->returns_abnormally;
9217   warn_about_return_type = p->warn_about_return_type;
9218 }
9219
9220 /* The functions below are required for functionality of doing
9221    function at once processing in the C front end. Currently these
9222    functions are not called from anywhere in the C front end, but as
9223    these changes continue, that will change.  */
9224
9225 /* Returns the stmt_tree (if any) to which statements are currently
9226    being added.  If there is no active statement-tree, NULL is
9227    returned.  */
9228
9229 stmt_tree
9230 current_stmt_tree (void)
9231 {
9232   return &c_stmt_tree;
9233 }
9234
9235 /* Return the global value of T as a symbol.  */
9236
9237 tree
9238 identifier_global_value (tree t)
9239 {
9240   struct c_binding *b;
9241
9242   for (b = I_SYMBOL_BINDING (t); b; b = b->shadowed)
9243     if (B_IN_FILE_SCOPE (b) || B_IN_EXTERNAL_SCOPE (b))
9244       return b->decl;
9245
9246   return 0;
9247 }
9248
9249 /* In C, the only C-linkage public declaration is at file scope.  */
9250
9251 tree
9252 c_linkage_bindings (tree name)
9253 {
9254   return identifier_global_value (name);
9255 }
9256
9257 /* Record a builtin type for C.  If NAME is non-NULL, it is the name used;
9258    otherwise the name is found in ridpointers from RID_INDEX.  */
9259
9260 void
9261 record_builtin_type (enum rid rid_index, const char *name, tree type)
9262 {
9263   tree id, decl;
9264   if (name == 0)
9265     id = ridpointers[(int) rid_index];
9266   else
9267     id = get_identifier (name);
9268   decl = build_decl (UNKNOWN_LOCATION, TYPE_DECL, id, type);
9269   pushdecl (decl);
9270   if (debug_hooks->type_decl)
9271     debug_hooks->type_decl (decl, false);
9272 }
9273
9274 /* Build the void_list_node (void_type_node having been created).  */
9275 tree
9276 build_void_list_node (void)
9277 {
9278   tree t = build_tree_list (NULL_TREE, void_type_node);
9279   return t;
9280 }
9281
9282 /* Return a c_parm structure with the given SPECS, ATTRS and DECLARATOR.  */
9283
9284 struct c_parm *
9285 build_c_parm (struct c_declspecs *specs, tree attrs,
9286               struct c_declarator *declarator)
9287 {
9288   struct c_parm *ret = XOBNEW (&parser_obstack, struct c_parm);
9289   ret->specs = specs;
9290   ret->attrs = attrs;
9291   ret->declarator = declarator;
9292   return ret;
9293 }
9294
9295 /* Return a declarator with nested attributes.  TARGET is the inner
9296    declarator to which these attributes apply.  ATTRS are the
9297    attributes.  */
9298
9299 struct c_declarator *
9300 build_attrs_declarator (tree attrs, struct c_declarator *target)
9301 {
9302   struct c_declarator *ret = XOBNEW (&parser_obstack, struct c_declarator);
9303   ret->kind = cdk_attrs;
9304   ret->declarator = target;
9305   ret->u.attrs = attrs;
9306   return ret;
9307 }
9308
9309 /* Return a declarator for a function with arguments specified by ARGS
9310    and return type specified by TARGET.  */
9311
9312 struct c_declarator *
9313 build_function_declarator (struct c_arg_info *args,
9314                            struct c_declarator *target)
9315 {
9316   struct c_declarator *ret = XOBNEW (&parser_obstack, struct c_declarator);
9317   ret->kind = cdk_function;
9318   ret->declarator = target;
9319   ret->u.arg_info = args;
9320   return ret;
9321 }
9322
9323 /* Return a declarator for the identifier IDENT (which may be
9324    NULL_TREE for an abstract declarator).  */
9325
9326 struct c_declarator *
9327 build_id_declarator (tree ident)
9328 {
9329   struct c_declarator *ret = XOBNEW (&parser_obstack, struct c_declarator);
9330   ret->kind = cdk_id;
9331   ret->declarator = 0;
9332   ret->u.id = ident;
9333   /* Default value - may get reset to a more precise location. */
9334   ret->id_loc = input_location;
9335   return ret;
9336 }
9337
9338 /* Return something to represent absolute declarators containing a *.
9339    TARGET is the absolute declarator that the * contains.
9340    TYPE_QUALS_ATTRS is a structure for type qualifiers and attributes
9341    to apply to the pointer type.  */
9342
9343 struct c_declarator *
9344 make_pointer_declarator (struct c_declspecs *type_quals_attrs,
9345                          struct c_declarator *target)
9346 {
9347   tree attrs;
9348   int quals = 0;
9349   struct c_declarator *itarget = target;
9350   struct c_declarator *ret = XOBNEW (&parser_obstack, struct c_declarator);
9351   if (type_quals_attrs)
9352     {
9353       attrs = type_quals_attrs->attrs;
9354       quals = quals_from_declspecs (type_quals_attrs);
9355       if (attrs != NULL_TREE)
9356         itarget = build_attrs_declarator (attrs, target);
9357     }
9358   ret->kind = cdk_pointer;
9359   ret->declarator = itarget;
9360   ret->u.pointer_quals = quals;
9361   return ret;
9362 }
9363
9364 /* Return a pointer to a structure for an empty list of declaration
9365    specifiers.  */
9366
9367 struct c_declspecs *
9368 build_null_declspecs (void)
9369 {
9370   struct c_declspecs *ret = XOBNEW (&parser_obstack, struct c_declspecs);
9371   memset (&ret->locations, 0, cdw_number_of_elements);
9372   ret->type = 0;
9373   ret->expr = 0;
9374   ret->decl_attr = 0;
9375   ret->attrs = 0;
9376   ret->align_log = -1;
9377   ret->typespec_word = cts_none;
9378   ret->storage_class = csc_none;
9379   ret->expr_const_operands = true;
9380   ret->declspecs_seen_p = false;
9381   ret->typespec_kind = ctsk_none;
9382   ret->non_sc_seen_p = false;
9383   ret->typedef_p = false;
9384   ret->explicit_signed_p = false;
9385   ret->deprecated_p = false;
9386   ret->default_int_p = false;
9387   ret->long_p = false;
9388   ret->long_long_p = false;
9389   ret->short_p = false;
9390   ret->signed_p = false;
9391   ret->unsigned_p = false;
9392   ret->complex_p = false;
9393   ret->inline_p = false;
9394   ret->noreturn_p = false;
9395   ret->thread_p = false;
9396   ret->thread_gnu_p = false;
9397   ret->const_p = false;
9398   ret->volatile_p = false;
9399   ret->atomic_p = false;
9400   ret->restrict_p = false;
9401   ret->saturating_p = false;
9402   ret->alignas_p = false;
9403   ret->address_space = ADDR_SPACE_GENERIC;
9404   return ret;
9405 }
9406
9407 /* Add the address space ADDRSPACE to the declaration specifiers
9408    SPECS, returning SPECS.  */
9409
9410 struct c_declspecs *
9411 declspecs_add_addrspace (source_location location,
9412                          struct c_declspecs *specs, addr_space_t as)
9413 {
9414   specs->non_sc_seen_p = true;
9415   specs->declspecs_seen_p = true;
9416
9417   if (!ADDR_SPACE_GENERIC_P (specs->address_space)
9418       && specs->address_space != as)
9419     error ("incompatible address space qualifiers %qs and %qs",
9420            c_addr_space_name (as),
9421            c_addr_space_name (specs->address_space));
9422   else
9423     {
9424       specs->address_space = as;
9425       specs->locations[cdw_address_space] = location;
9426     }
9427   return specs;
9428 }
9429
9430 /* Add the type qualifier QUAL to the declaration specifiers SPECS,
9431    returning SPECS.  */
9432
9433 struct c_declspecs *
9434 declspecs_add_qual (source_location loc,
9435                     struct c_declspecs *specs, tree qual)
9436 {
9437   enum rid i;
9438   bool dupe = false;
9439   specs->non_sc_seen_p = true;
9440   specs->declspecs_seen_p = true;
9441   gcc_assert (TREE_CODE (qual) == IDENTIFIER_NODE
9442               && C_IS_RESERVED_WORD (qual));
9443   i = C_RID_CODE (qual);
9444   switch (i)
9445     {
9446     case RID_CONST:
9447       dupe = specs->const_p;
9448       specs->const_p = true;
9449       specs->locations[cdw_const] = loc;
9450       break;
9451     case RID_VOLATILE:
9452       dupe = specs->volatile_p;
9453       specs->volatile_p = true;
9454       specs->locations[cdw_volatile] = loc;
9455       break;
9456     case RID_RESTRICT:
9457       dupe = specs->restrict_p;
9458       specs->restrict_p = true;
9459       specs->locations[cdw_restrict] = loc;
9460       break;
9461     case RID_ATOMIC:
9462       dupe = specs->atomic_p;
9463       specs->atomic_p = true;
9464       break;
9465     default:
9466       gcc_unreachable ();
9467     }
9468   if (dupe)
9469     pedwarn_c90 (loc, OPT_Wpedantic, "duplicate %qE", qual);
9470   return specs;
9471 }
9472
9473 /* Add the type specifier TYPE to the declaration specifiers SPECS,
9474    returning SPECS.  */
9475
9476 struct c_declspecs *
9477 declspecs_add_type (location_t loc, struct c_declspecs *specs,
9478                     struct c_typespec spec)
9479 {
9480   tree type = spec.spec;
9481   specs->non_sc_seen_p = true;
9482   specs->declspecs_seen_p = true;
9483   specs->typespec_kind = spec.kind;
9484   if (TREE_DEPRECATED (type))
9485     specs->deprecated_p = true;
9486
9487   /* Handle type specifier keywords.  */
9488   if (TREE_CODE (type) == IDENTIFIER_NODE
9489       && C_IS_RESERVED_WORD (type)
9490       && C_RID_CODE (type) != RID_CXX_COMPAT_WARN)
9491     {
9492       enum rid i = C_RID_CODE (type);
9493       if (specs->type)
9494         {
9495           error_at (loc, "two or more data types in declaration specifiers");
9496           return specs;
9497         }
9498       if ((int) i <= (int) RID_LAST_MODIFIER)
9499         {
9500           /* "long", "short", "signed", "unsigned", "_Complex" or "_Sat".  */
9501           bool dupe = false;
9502           switch (i)
9503             {
9504             case RID_LONG:
9505               if (specs->long_long_p)
9506                 {
9507                   error_at (loc, "%<long long long%> is too long for GCC");
9508                   break;
9509                 }
9510               if (specs->long_p)
9511                 {
9512                   if (specs->typespec_word == cts_double)
9513                     {
9514                       error_at (loc,
9515                                 ("both %<long long%> and %<double%> in "
9516                                  "declaration specifiers"));
9517                       break;
9518                     }
9519                   pedwarn_c90 (loc, OPT_Wlong_long,
9520                                "ISO C90 does not support %<long long%>");
9521                   specs->long_long_p = 1;
9522                   specs->locations[cdw_long_long] = loc;
9523                   break;
9524                 }
9525               if (specs->short_p)
9526                 error_at (loc,
9527                           ("both %<long%> and %<short%> in "
9528                            "declaration specifiers"));
9529               else if (specs->typespec_word == cts_auto_type)
9530                 error_at (loc,
9531                           ("both %<long%> and %<__auto_type%> in "
9532                            "declaration specifiers"));
9533               else if (specs->typespec_word == cts_void)
9534                 error_at (loc,
9535                           ("both %<long%> and %<void%> in "
9536                            "declaration specifiers"));
9537               else if (specs->typespec_word == cts_int_n)
9538                   error_at (loc,
9539                             ("both %<long%> and %<__int%d%> in "
9540                              "declaration specifiers"),
9541                             int_n_data[specs->int_n_idx].bitsize);
9542               else if (specs->typespec_word == cts_bool)
9543                 error_at (loc,
9544                           ("both %<long%> and %<_Bool%> in "
9545                            "declaration specifiers"));
9546               else if (specs->typespec_word == cts_char)
9547                 error_at (loc,
9548                           ("both %<long%> and %<char%> in "
9549                            "declaration specifiers"));
9550               else if (specs->typespec_word == cts_float)
9551                 error_at (loc,
9552                           ("both %<long%> and %<float%> in "
9553                            "declaration specifiers"));
9554               else if (specs->typespec_word == cts_dfloat32)
9555                 error_at (loc,
9556                           ("both %<long%> and %<_Decimal32%> in "
9557                            "declaration specifiers"));
9558               else if (specs->typespec_word == cts_dfloat64)
9559                 error_at (loc,
9560                           ("both %<long%> and %<_Decimal64%> in "
9561                            "declaration specifiers"));
9562               else if (specs->typespec_word == cts_dfloat128)
9563                 error_at (loc,
9564                           ("both %<long%> and %<_Decimal128%> in "
9565                            "declaration specifiers"));
9566               else
9567                 {
9568                   specs->long_p = true;
9569                   specs->locations[cdw_long] = loc;
9570                 }
9571               break;
9572             case RID_SHORT:
9573               dupe = specs->short_p;
9574               if (specs->long_p)
9575                 error_at (loc,
9576                           ("both %<long%> and %<short%> in "
9577                            "declaration specifiers"));
9578               else if (specs->typespec_word == cts_auto_type)
9579                 error_at (loc,
9580                           ("both %<short%> and %<__auto_type%> in "
9581                            "declaration specifiers"));
9582               else if (specs->typespec_word == cts_void)
9583                 error_at (loc,
9584                           ("both %<short%> and %<void%> in "
9585                            "declaration specifiers"));
9586               else if (specs->typespec_word == cts_int_n)
9587                 error_at (loc,
9588                           ("both %<short%> and %<__int%d%> in "
9589                            "declaration specifiers"),
9590                           int_n_data[specs->int_n_idx].bitsize);
9591               else if (specs->typespec_word == cts_bool)
9592                 error_at (loc,
9593                           ("both %<short%> and %<_Bool%> in "
9594                            "declaration specifiers"));
9595               else if (specs->typespec_word == cts_char)
9596                 error_at (loc,
9597                           ("both %<short%> and %<char%> in "
9598                            "declaration specifiers"));
9599               else if (specs->typespec_word == cts_float)
9600                 error_at (loc,
9601                           ("both %<short%> and %<float%> in "
9602                            "declaration specifiers"));
9603               else if (specs->typespec_word == cts_double)
9604                 error_at (loc,
9605                           ("both %<short%> and %<double%> in "
9606                            "declaration specifiers"));
9607               else if (specs->typespec_word == cts_dfloat32)
9608                 error_at (loc,
9609                           ("both %<short%> and %<_Decimal32%> in "
9610                            "declaration specifiers"));
9611               else if (specs->typespec_word == cts_dfloat64)
9612                 error_at (loc,
9613                           ("both %<short%> and %<_Decimal64%> in "
9614                            "declaration specifiers"));
9615               else if (specs->typespec_word == cts_dfloat128)
9616                 error_at (loc,
9617                           ("both %<short%> and %<_Decimal128%> in "
9618                            "declaration specifiers"));
9619               else
9620                 {
9621                   specs->short_p = true;
9622                   specs->locations[cdw_short] = loc;
9623                 }
9624               break;
9625             case RID_SIGNED:
9626               dupe = specs->signed_p;
9627               if (specs->unsigned_p)
9628                 error_at (loc,
9629                           ("both %<signed%> and %<unsigned%> in "
9630                            "declaration specifiers"));
9631               else if (specs->typespec_word == cts_auto_type)
9632                 error_at (loc,
9633                           ("both %<signed%> and %<__auto_type%> in "
9634                            "declaration specifiers"));
9635               else if (specs->typespec_word == cts_void)
9636                 error_at (loc,
9637                           ("both %<signed%> and %<void%> in "
9638                            "declaration specifiers"));
9639               else if (specs->typespec_word == cts_bool)
9640                 error_at (loc,
9641                           ("both %<signed%> and %<_Bool%> in "
9642                            "declaration specifiers"));
9643               else if (specs->typespec_word == cts_float)
9644                 error_at (loc,
9645                           ("both %<signed%> and %<float%> in "
9646                            "declaration specifiers"));
9647               else if (specs->typespec_word == cts_double)
9648                 error_at (loc,
9649                           ("both %<signed%> and %<double%> in "
9650                            "declaration specifiers"));
9651               else if (specs->typespec_word == cts_dfloat32)
9652                 error_at (loc,
9653                           ("both %<signed%> and %<_Decimal32%> in "
9654                            "declaration specifiers"));
9655               else if (specs->typespec_word == cts_dfloat64)
9656                 error_at (loc,
9657                           ("both %<signed%> and %<_Decimal64%> in "
9658                            "declaration specifiers"));
9659               else if (specs->typespec_word == cts_dfloat128)
9660                 error_at (loc,
9661                           ("both %<signed%> and %<_Decimal128%> in "
9662                            "declaration specifiers"));
9663               else
9664                 {
9665                   specs->signed_p = true;
9666                   specs->locations[cdw_signed] = loc;
9667                 }
9668               break;
9669             case RID_UNSIGNED:
9670               dupe = specs->unsigned_p;
9671               if (specs->signed_p)
9672                 error_at (loc,
9673                           ("both %<signed%> and %<unsigned%> in "
9674                            "declaration specifiers"));
9675               else if (specs->typespec_word == cts_auto_type)
9676                 error_at (loc,
9677                           ("both %<unsigned%> and %<__auto_type%> in "
9678                            "declaration specifiers"));
9679               else if (specs->typespec_word == cts_void)
9680                 error_at (loc,
9681                           ("both %<unsigned%> and %<void%> in "
9682                            "declaration specifiers"));
9683               else if (specs->typespec_word == cts_bool)
9684                 error_at (loc,
9685                           ("both %<unsigned%> and %<_Bool%> in "
9686                            "declaration specifiers"));
9687               else if (specs->typespec_word == cts_float)
9688                 error_at (loc,
9689                           ("both %<unsigned%> and %<float%> in "
9690                            "declaration specifiers"));
9691               else if (specs->typespec_word == cts_double)
9692                 error_at (loc,
9693                           ("both %<unsigned%> and %<double%> in "
9694                            "declaration specifiers"));
9695               else if (specs->typespec_word == cts_dfloat32)
9696                 error_at (loc,
9697                           ("both %<unsigned%> and %<_Decimal32%> in "
9698                            "declaration specifiers"));
9699               else if (specs->typespec_word == cts_dfloat64)
9700                 error_at (loc,
9701                           ("both %<unsigned%> and %<_Decimal64%> in "
9702                            "declaration specifiers"));
9703               else if (specs->typespec_word == cts_dfloat128)
9704                 error_at (loc,
9705                           ("both %<unsigned%> and %<_Decimal128%> in "
9706                            "declaration specifiers"));
9707               else
9708                 {
9709                   specs->unsigned_p = true;
9710                   specs->locations[cdw_unsigned] = loc;
9711                 }
9712               break;
9713             case RID_COMPLEX:
9714               dupe = specs->complex_p;
9715               if (!in_system_header_at (loc))
9716                 pedwarn_c90 (loc, OPT_Wpedantic,
9717                              "ISO C90 does not support complex types");
9718               if (specs->typespec_word == cts_auto_type)
9719                 error_at (loc,
9720                           ("both %<complex%> and %<__auto_type%> in "
9721                            "declaration specifiers"));
9722               else if (specs->typespec_word == cts_void)
9723                 error_at (loc,
9724                           ("both %<complex%> and %<void%> in "
9725                            "declaration specifiers"));
9726               else if (specs->typespec_word == cts_bool)
9727                 error_at (loc,
9728                           ("both %<complex%> and %<_Bool%> in "
9729                            "declaration specifiers"));
9730               else if (specs->typespec_word == cts_dfloat32)
9731                 error_at (loc,
9732                           ("both %<complex%> and %<_Decimal32%> in "
9733                            "declaration specifiers"));
9734               else if (specs->typespec_word == cts_dfloat64)
9735                 error_at (loc,
9736                           ("both %<complex%> and %<_Decimal64%> in "
9737                            "declaration specifiers"));
9738               else if (specs->typespec_word == cts_dfloat128)
9739                 error_at (loc,
9740                           ("both %<complex%> and %<_Decimal128%> in "
9741                            "declaration specifiers"));
9742               else if (specs->typespec_word == cts_fract)
9743                 error_at (loc,
9744                           ("both %<complex%> and %<_Fract%> in "
9745                            "declaration specifiers"));
9746               else if (specs->typespec_word == cts_accum)
9747                 error_at (loc,
9748                           ("both %<complex%> and %<_Accum%> in "
9749                            "declaration specifiers"));
9750               else if (specs->saturating_p)
9751                 error_at (loc,
9752                           ("both %<complex%> and %<_Sat%> in "
9753                            "declaration specifiers"));
9754               else
9755                 {
9756                   specs->complex_p = true;
9757                   specs->locations[cdw_complex] = loc;
9758                 }
9759               break;
9760             case RID_SAT:
9761               dupe = specs->saturating_p;
9762               pedwarn (loc, OPT_Wpedantic,
9763                        "ISO C does not support saturating types");
9764               if (specs->typespec_word == cts_int_n)
9765                 {
9766                   error_at (loc,
9767                             ("both %<_Sat%> and %<__int%d%> in "
9768                              "declaration specifiers"),
9769                             int_n_data[specs->int_n_idx].bitsize);
9770                 }
9771               else if (specs->typespec_word == cts_auto_type)
9772                 error_at (loc,
9773                           ("both %<_Sat%> and %<__auto_type%> in "
9774                            "declaration specifiers"));
9775               else if (specs->typespec_word == cts_void)
9776                 error_at (loc,
9777                           ("both %<_Sat%> and %<void%> in "
9778                            "declaration specifiers"));
9779               else if (specs->typespec_word == cts_bool)
9780                 error_at (loc,
9781                           ("both %<_Sat%> and %<_Bool%> in "
9782                            "declaration specifiers"));
9783               else if (specs->typespec_word == cts_char)
9784                 error_at (loc,
9785                           ("both %<_Sat%> and %<char%> in "
9786                            "declaration specifiers"));
9787               else if (specs->typespec_word == cts_int)
9788                 error_at (loc,
9789                           ("both %<_Sat%> and %<int%> in "
9790                            "declaration specifiers"));
9791               else if (specs->typespec_word == cts_float)
9792                 error_at (loc,
9793                           ("both %<_Sat%> and %<float%> in "
9794                            "declaration specifiers"));
9795               else if (specs->typespec_word == cts_double)
9796                 error_at (loc,
9797                           ("both %<_Sat%> and %<double%> in "
9798                            "declaration specifiers"));
9799               else if (specs->typespec_word == cts_dfloat32)
9800                 error_at (loc,
9801                           ("both %<_Sat%> and %<_Decimal32%> in "
9802                            "declaration specifiers"));
9803               else if (specs->typespec_word == cts_dfloat64)
9804                 error_at (loc,
9805                           ("both %<_Sat%> and %<_Decimal64%> in "
9806                            "declaration specifiers"));
9807               else if (specs->typespec_word == cts_dfloat128)
9808                 error_at (loc,
9809                           ("both %<_Sat%> and %<_Decimal128%> in "
9810                            "declaration specifiers"));
9811               else if (specs->complex_p)
9812                 error_at (loc,
9813                           ("both %<_Sat%> and %<complex%> in "
9814                            "declaration specifiers"));
9815               else
9816                 {
9817                   specs->saturating_p = true;
9818                   specs->locations[cdw_saturating] = loc;
9819                 }
9820               break;
9821             default:
9822               gcc_unreachable ();
9823             }
9824
9825           if (dupe)
9826             error_at (loc, "duplicate %qE", type);
9827
9828           return specs;
9829         }
9830       else
9831         {
9832           /* "void", "_Bool", "char", "int", "float", "double", "_Decimal32",
9833              "__intN", "_Decimal64", "_Decimal128", "_Fract", "_Accum" or
9834              "__auto_type".  */
9835           if (specs->typespec_word != cts_none)
9836             {
9837               error_at (loc,
9838                         "two or more data types in declaration specifiers");
9839               return specs;
9840             }
9841           switch (i)
9842             {
9843             case RID_AUTO_TYPE:
9844               if (specs->long_p)
9845                 error_at (loc,
9846                           ("both %<long%> and %<__auto_type%> in "
9847                            "declaration specifiers"));
9848               else if (specs->short_p)
9849                 error_at (loc,
9850                           ("both %<short%> and %<__auto_type%> in "
9851                            "declaration specifiers"));
9852               else if (specs->signed_p)
9853                 error_at (loc,
9854                           ("both %<signed%> and %<__auto_type%> in "
9855                            "declaration specifiers"));
9856               else if (specs->unsigned_p)
9857                 error_at (loc,
9858                           ("both %<unsigned%> and %<__auto_type%> in "
9859                            "declaration specifiers"));
9860               else if (specs->complex_p)
9861                 error_at (loc,
9862                           ("both %<complex%> and %<__auto_type%> in "
9863                            "declaration specifiers"));
9864               else if (specs->saturating_p)
9865                 error_at (loc,
9866                           ("both %<_Sat%> and %<__auto_type%> in "
9867                            "declaration specifiers"));
9868               else
9869                 {
9870                   specs->typespec_word = cts_auto_type;
9871                   specs->locations[cdw_typespec] = loc;
9872                 }
9873               return specs;
9874             case RID_INT_N_0:
9875             case RID_INT_N_1:
9876             case RID_INT_N_2:
9877             case RID_INT_N_3:
9878               specs->int_n_idx = i - RID_INT_N_0;
9879               if (!in_system_header_at (input_location))
9880                 pedwarn (loc, OPT_Wpedantic,
9881                          "ISO C does not support %<__int%d%> types",
9882                          int_n_data[specs->int_n_idx].bitsize);
9883
9884               if (specs->long_p)
9885                 error_at (loc,
9886                           ("both %<__int%d%> and %<long%> in "
9887                            "declaration specifiers"),
9888                           int_n_data[specs->int_n_idx].bitsize);
9889               else if (specs->saturating_p)
9890                 error_at (loc,
9891                           ("both %<_Sat%> and %<__int%d%> in "
9892                            "declaration specifiers"),
9893                           int_n_data[specs->int_n_idx].bitsize);
9894               else if (specs->short_p)
9895                 error_at (loc,
9896                           ("both %<__int%d%> and %<short%> in "
9897                            "declaration specifiers"),
9898                           int_n_data[specs->int_n_idx].bitsize);
9899               else if (! int_n_enabled_p [specs->int_n_idx])
9900                 error_at (loc,
9901                           "%<__int%d%> is not supported on this target",
9902                           int_n_data[specs->int_n_idx].bitsize);
9903               else
9904                 {
9905                   specs->typespec_word = cts_int_n;
9906                   specs->locations[cdw_typespec] = loc;
9907                 }
9908               return specs;
9909             case RID_VOID:
9910               if (specs->long_p)
9911                 error_at (loc,
9912                           ("both %<long%> and %<void%> in "
9913                            "declaration specifiers"));
9914               else if (specs->short_p)
9915                 error_at (loc,
9916                           ("both %<short%> and %<void%> in "
9917                            "declaration specifiers"));
9918               else if (specs->signed_p)
9919                 error_at (loc,
9920                           ("both %<signed%> and %<void%> in "
9921                            "declaration specifiers"));
9922               else if (specs->unsigned_p)
9923                 error_at (loc,
9924                           ("both %<unsigned%> and %<void%> in "
9925                            "declaration specifiers"));
9926               else if (specs->complex_p)
9927                 error_at (loc,
9928                           ("both %<complex%> and %<void%> in "
9929                            "declaration specifiers"));
9930               else if (specs->saturating_p)
9931                 error_at (loc,
9932                           ("both %<_Sat%> and %<void%> in "
9933                            "declaration specifiers"));
9934               else
9935                 {
9936                   specs->typespec_word = cts_void;
9937                   specs->locations[cdw_typespec] = loc;
9938                 }
9939               return specs;
9940             case RID_BOOL:
9941               if (!in_system_header_at (loc))
9942                 pedwarn_c90 (loc, OPT_Wpedantic,
9943                              "ISO C90 does not support boolean types");
9944               if (specs->long_p)
9945                 error_at (loc,
9946                           ("both %<long%> and %<_Bool%> in "
9947                            "declaration specifiers"));
9948               else if (specs->short_p)
9949                 error_at (loc,
9950                           ("both %<short%> and %<_Bool%> in "
9951                            "declaration specifiers"));
9952               else if (specs->signed_p)
9953                 error_at (loc,
9954                           ("both %<signed%> and %<_Bool%> in "
9955                            "declaration specifiers"));
9956               else if (specs->unsigned_p)
9957                 error_at (loc,
9958                           ("both %<unsigned%> and %<_Bool%> in "
9959                            "declaration specifiers"));
9960               else if (specs->complex_p)
9961                 error_at (loc,
9962                           ("both %<complex%> and %<_Bool%> in "
9963                            "declaration specifiers"));
9964               else if (specs->saturating_p)
9965                 error_at (loc,
9966                           ("both %<_Sat%> and %<_Bool%> in "
9967                            "declaration specifiers"));
9968               else
9969                 {
9970                   specs->typespec_word = cts_bool;
9971                   specs->locations[cdw_typespec] = loc;
9972                 }
9973               return specs;
9974             case RID_CHAR:
9975               if (specs->long_p)
9976                 error_at (loc,
9977                           ("both %<long%> and %<char%> in "
9978                            "declaration specifiers"));
9979               else if (specs->short_p)
9980                 error_at (loc,
9981                           ("both %<short%> and %<char%> in "
9982                            "declaration specifiers"));
9983               else if (specs->saturating_p)
9984                 error_at (loc,
9985                           ("both %<_Sat%> and %<char%> in "
9986                            "declaration specifiers"));
9987               else
9988                 {
9989                   specs->typespec_word = cts_char;
9990                   specs->locations[cdw_typespec] = loc;
9991                 }
9992               return specs;
9993             case RID_INT:
9994               if (specs->saturating_p)
9995                 error_at (loc,
9996                           ("both %<_Sat%> and %<int%> in "
9997                            "declaration specifiers"));
9998               else
9999                 {
10000                   specs->typespec_word = cts_int;
10001                   specs->locations[cdw_typespec] = loc;
10002                 }
10003               return specs;
10004             case RID_FLOAT:
10005               if (specs->long_p)
10006                 error_at (loc,
10007                           ("both %<long%> and %<float%> in "
10008                            "declaration specifiers"));
10009               else if (specs->short_p)
10010                 error_at (loc,
10011                           ("both %<short%> and %<float%> in "
10012                            "declaration specifiers"));
10013               else if (specs->signed_p)
10014                 error_at (loc,
10015                           ("both %<signed%> and %<float%> in "
10016                            "declaration specifiers"));
10017               else if (specs->unsigned_p)
10018                 error_at (loc,
10019                           ("both %<unsigned%> and %<float%> in "
10020                            "declaration specifiers"));
10021               else if (specs->saturating_p)
10022                 error_at (loc,
10023                           ("both %<_Sat%> and %<float%> in "
10024                            "declaration specifiers"));
10025               else
10026                 {
10027                   specs->typespec_word = cts_float;
10028                   specs->locations[cdw_typespec] = loc;
10029                 }
10030               return specs;
10031             case RID_DOUBLE:
10032               if (specs->long_long_p)
10033                 error_at (loc,
10034                           ("both %<long long%> and %<double%> in "
10035                            "declaration specifiers"));
10036               else if (specs->short_p)
10037                 error_at (loc,
10038                           ("both %<short%> and %<double%> in "
10039                            "declaration specifiers"));
10040               else if (specs->signed_p)
10041                 error_at (loc,
10042                           ("both %<signed%> and %<double%> in "
10043                            "declaration specifiers"));
10044               else if (specs->unsigned_p)
10045                 error_at (loc,
10046                           ("both %<unsigned%> and %<double%> in "
10047                            "declaration specifiers"));
10048               else if (specs->saturating_p)
10049                 error_at (loc,
10050                           ("both %<_Sat%> and %<double%> in "
10051                            "declaration specifiers"));
10052               else
10053                 {
10054                   specs->typespec_word = cts_double;
10055                   specs->locations[cdw_typespec] = loc;
10056                 }
10057               return specs;
10058             case RID_DFLOAT32:
10059             case RID_DFLOAT64:
10060             case RID_DFLOAT128:
10061               {
10062                 const char *str;
10063                 if (i == RID_DFLOAT32)
10064                   str = "_Decimal32";
10065                 else if (i == RID_DFLOAT64)
10066                   str = "_Decimal64";
10067                 else
10068                   str = "_Decimal128";
10069                 if (specs->long_long_p)
10070                   error_at (loc,
10071                             ("both %<long long%> and %<%s%> in "
10072                              "declaration specifiers"),
10073                             str);
10074                 if (specs->long_p)
10075                   error_at (loc,
10076                             ("both %<long%> and %<%s%> in "
10077                              "declaration specifiers"),
10078                             str);
10079                 else if (specs->short_p)
10080                   error_at (loc,
10081                             ("both %<short%> and %<%s%> in "
10082                              "declaration specifiers"),
10083                             str);
10084                 else if (specs->signed_p)
10085                   error_at (loc,
10086                             ("both %<signed%> and %<%s%> in "
10087                              "declaration specifiers"),
10088                             str);
10089                 else if (specs->unsigned_p)
10090                   error_at (loc,
10091                             ("both %<unsigned%> and %<%s%> in "
10092                              "declaration specifiers"),
10093                             str);
10094                 else if (specs->complex_p)
10095                   error_at (loc,
10096                             ("both %<complex%> and %<%s%> in "
10097                              "declaration specifiers"),
10098                             str);
10099                 else if (specs->saturating_p)
10100                   error_at (loc,
10101                             ("both %<_Sat%> and %<%s%> in "
10102                              "declaration specifiers"),
10103                             str);
10104                 else if (i == RID_DFLOAT32)
10105                   specs->typespec_word = cts_dfloat32;
10106                 else if (i == RID_DFLOAT64)
10107                   specs->typespec_word = cts_dfloat64;
10108                 else
10109                   specs->typespec_word = cts_dfloat128;
10110                 specs->locations[cdw_typespec] = loc;
10111               }
10112               if (!targetm.decimal_float_supported_p ())
10113                 error_at (loc,
10114                           ("decimal floating point not supported "
10115                            "for this target"));
10116               pedwarn (loc, OPT_Wpedantic,
10117                        "ISO C does not support decimal floating point");
10118               return specs;
10119             case RID_FRACT:
10120             case RID_ACCUM:
10121               {
10122                 const char *str;
10123                 if (i == RID_FRACT)
10124                   str = "_Fract";
10125                 else
10126                   str = "_Accum";
10127                 if (specs->complex_p)
10128                   error_at (loc,
10129                             ("both %<complex%> and %<%s%> in "
10130                              "declaration specifiers"),
10131                             str);
10132                 else if (i == RID_FRACT)
10133                     specs->typespec_word = cts_fract;
10134                 else
10135                     specs->typespec_word = cts_accum;
10136                 specs->locations[cdw_typespec] = loc;
10137               }
10138               if (!targetm.fixed_point_supported_p ())
10139                 error_at (loc,
10140                           "fixed-point types not supported for this target");
10141               pedwarn (loc, OPT_Wpedantic,
10142                        "ISO C does not support fixed-point types");
10143               return specs;
10144             default:
10145               /* ObjC reserved word "id", handled below.  */
10146               break;
10147             }
10148         }
10149     }
10150
10151   /* Now we have a typedef (a TYPE_DECL node), an identifier (some
10152      form of ObjC type, cases such as "int" and "long" being handled
10153      above), a TYPE (struct, union, enum and typeof specifiers) or an
10154      ERROR_MARK.  In none of these cases may there have previously
10155      been any type specifiers.  */
10156   if (specs->type || specs->typespec_word != cts_none
10157       || specs->long_p || specs->short_p || specs->signed_p
10158       || specs->unsigned_p || specs->complex_p)
10159     error_at (loc, "two or more data types in declaration specifiers");
10160   else if (TREE_CODE (type) == TYPE_DECL)
10161     {
10162       if (TREE_TYPE (type) == error_mark_node)
10163         ; /* Allow the type to default to int to avoid cascading errors.  */
10164       else
10165         {
10166           specs->type = TREE_TYPE (type);
10167           specs->decl_attr = DECL_ATTRIBUTES (type);
10168           specs->typedef_p = true;
10169           specs->explicit_signed_p = C_TYPEDEF_EXPLICITLY_SIGNED (type);
10170           specs->locations[cdw_typedef] = loc;
10171
10172           /* If this typedef name is defined in a struct, then a C++
10173              lookup would return a different value.  */
10174           if (warn_cxx_compat
10175               && I_SYMBOL_BINDING (DECL_NAME (type))->in_struct)
10176             warning_at (loc, OPT_Wc___compat,
10177                         "C++ lookup of %qD would return a field, not a type",
10178                         type);
10179
10180           /* If we are parsing a struct, record that a struct field
10181              used a typedef.  */
10182           if (warn_cxx_compat && struct_parse_info != NULL)
10183             struct_parse_info->typedefs_seen.safe_push (type);
10184         }
10185     }
10186   else if (TREE_CODE (type) == IDENTIFIER_NODE)
10187     {
10188       tree t = lookup_name (type);
10189       if (!t || TREE_CODE (t) != TYPE_DECL)
10190         error_at (loc, "%qE fails to be a typedef or built in type", type);
10191       else if (TREE_TYPE (t) == error_mark_node)
10192         ;
10193       else
10194         {
10195           specs->type = TREE_TYPE (t);
10196           specs->locations[cdw_typespec] = loc;
10197         }
10198     }
10199   else
10200     {
10201       if (TREE_CODE (type) != ERROR_MARK && spec.kind == ctsk_typeof)
10202         {
10203           specs->typedef_p = true;
10204           specs->locations[cdw_typedef] = loc;
10205           if (spec.expr)
10206             {
10207               if (specs->expr)
10208                 specs->expr = build2 (COMPOUND_EXPR, TREE_TYPE (spec.expr),
10209                                       specs->expr, spec.expr);
10210               else
10211                 specs->expr = spec.expr;
10212               specs->expr_const_operands &= spec.expr_const_operands;
10213             }
10214         }
10215       specs->type = type;
10216     }
10217
10218   return specs;
10219 }
10220
10221 /* Add the storage class specifier or function specifier SCSPEC to the
10222    declaration specifiers SPECS, returning SPECS.  */
10223
10224 struct c_declspecs *
10225 declspecs_add_scspec (source_location loc,
10226                       struct c_declspecs *specs,
10227                       tree scspec)
10228 {
10229   enum rid i;
10230   enum c_storage_class n = csc_none;
10231   bool dupe = false;
10232   specs->declspecs_seen_p = true;
10233   gcc_assert (TREE_CODE (scspec) == IDENTIFIER_NODE
10234               && C_IS_RESERVED_WORD (scspec));
10235   i = C_RID_CODE (scspec);
10236   if (specs->non_sc_seen_p)
10237     warning (OPT_Wold_style_declaration,
10238              "%qE is not at beginning of declaration", scspec);
10239   switch (i)
10240     {
10241     case RID_INLINE:
10242       /* C99 permits duplicate inline.  Although of doubtful utility,
10243          it seems simplest to permit it in gnu89 mode as well, as
10244          there is also little utility in maintaining this as a
10245          difference between gnu89 and C99 inline.  */
10246       dupe = false;
10247       specs->inline_p = true;
10248       specs->locations[cdw_inline] = loc;
10249       break;
10250     case RID_NORETURN:
10251       /* Duplicate _Noreturn is permitted.  */
10252       dupe = false;
10253       specs->noreturn_p = true;
10254       specs->locations[cdw_noreturn] = loc;
10255       break;
10256     case RID_THREAD:
10257       dupe = specs->thread_p;
10258       if (specs->storage_class == csc_auto)
10259         error ("%qE used with %<auto%>", scspec);
10260       else if (specs->storage_class == csc_register)
10261         error ("%qE used with %<register%>", scspec);
10262       else if (specs->storage_class == csc_typedef)
10263         error ("%qE used with %<typedef%>", scspec);
10264       else
10265         {
10266           specs->thread_p = true;
10267           specs->thread_gnu_p = (strcmp (IDENTIFIER_POINTER (scspec),
10268                                          "__thread") == 0);
10269           /* A diagnostic is not required for the use of this
10270              identifier in the implementation namespace; only diagnose
10271              it for the C11 spelling because of existing code using
10272              the other spelling.  */
10273           if (!specs->thread_gnu_p)
10274             {
10275               if (flag_isoc99)
10276                 pedwarn_c99 (loc, OPT_Wpedantic,
10277                              "ISO C99 does not support %qE", scspec);
10278               else
10279                 pedwarn_c99 (loc, OPT_Wpedantic,
10280                              "ISO C90 does not support %qE", scspec);
10281             }
10282           specs->locations[cdw_thread] = loc;
10283         }
10284       break;
10285     case RID_AUTO:
10286       n = csc_auto;
10287       break;
10288     case RID_EXTERN:
10289       n = csc_extern;
10290       /* Diagnose "__thread extern".  */
10291       if (specs->thread_p && specs->thread_gnu_p)
10292         error ("%<__thread%> before %<extern%>");
10293       break;
10294     case RID_REGISTER:
10295       n = csc_register;
10296       break;
10297     case RID_STATIC:
10298       n = csc_static;
10299       /* Diagnose "__thread static".  */
10300       if (specs->thread_p && specs->thread_gnu_p)
10301         error ("%<__thread%> before %<static%>");
10302       break;
10303     case RID_TYPEDEF:
10304       n = csc_typedef;
10305       break;
10306     default:
10307       gcc_unreachable ();
10308     }
10309   if (n != csc_none && n == specs->storage_class)
10310     dupe = true;
10311   if (dupe)
10312     {
10313       if (i == RID_THREAD)
10314         error ("duplicate %<_Thread_local%> or %<__thread%>");
10315       else
10316         error ("duplicate %qE", scspec);
10317     }
10318   if (n != csc_none)
10319     {
10320       if (specs->storage_class != csc_none && n != specs->storage_class)
10321         {
10322           error ("multiple storage classes in declaration specifiers");
10323         }
10324       else
10325         {
10326           specs->storage_class = n;
10327           specs->locations[cdw_storage_class] = loc;
10328           if (n != csc_extern && n != csc_static && specs->thread_p)
10329             {
10330               error ("%qs used with %qE",
10331                      specs->thread_gnu_p ? "__thread" : "_Thread_local",
10332                      scspec);
10333               specs->thread_p = false;
10334             }
10335         }
10336     }
10337   return specs;
10338 }
10339
10340 /* Add the attributes ATTRS to the declaration specifiers SPECS,
10341    returning SPECS.  */
10342
10343 struct c_declspecs *
10344 declspecs_add_attrs (source_location loc, struct c_declspecs *specs, tree attrs)
10345 {
10346   specs->attrs = chainon (attrs, specs->attrs);
10347   specs->locations[cdw_attributes] = loc;
10348   specs->declspecs_seen_p = true;
10349   return specs;
10350 }
10351
10352 /* Add an _Alignas specifier (expression ALIGN, or type whose
10353    alignment is ALIGN) to the declaration specifiers SPECS, returning
10354    SPECS.  */
10355 struct c_declspecs *
10356 declspecs_add_alignas (source_location loc,
10357                        struct c_declspecs *specs, tree align)
10358 {
10359   int align_log;
10360   specs->alignas_p = true;
10361   specs->locations[cdw_alignas] = loc;
10362   if (align == error_mark_node)
10363     return specs;
10364   align_log = check_user_alignment (align, true);
10365   if (align_log > specs->align_log)
10366     specs->align_log = align_log;
10367   return specs;
10368 }
10369
10370 /* Combine "long", "short", "signed", "unsigned" and "_Complex" type
10371    specifiers with any other type specifier to determine the resulting
10372    type.  This is where ISO C checks on complex types are made, since
10373    "_Complex long" is a prefix of the valid ISO C type "_Complex long
10374    double".  */
10375
10376 struct c_declspecs *
10377 finish_declspecs (struct c_declspecs *specs)
10378 {
10379   /* If a type was specified as a whole, we have no modifiers and are
10380      done.  */
10381   if (specs->type != NULL_TREE)
10382     {
10383       gcc_assert (!specs->long_p && !specs->long_long_p && !specs->short_p
10384                   && !specs->signed_p && !specs->unsigned_p
10385                   && !specs->complex_p);
10386
10387       /* Set a dummy type.  */
10388       if (TREE_CODE (specs->type) == ERROR_MARK)
10389         specs->type = integer_type_node;
10390       return specs;
10391     }
10392
10393   /* If none of "void", "_Bool", "char", "int", "float" or "double"
10394      has been specified, treat it as "int" unless "_Complex" is
10395      present and there are no other specifiers.  If we just have
10396      "_Complex", it is equivalent to "_Complex double", but e.g.
10397      "_Complex short" is equivalent to "_Complex short int".  */
10398   if (specs->typespec_word == cts_none)
10399     {
10400       if (specs->saturating_p)
10401         {
10402           error_at (specs->locations[cdw_saturating],
10403                     "%<_Sat%> is used without %<_Fract%> or %<_Accum%>");
10404           if (!targetm.fixed_point_supported_p ())
10405             error_at (specs->locations[cdw_saturating],
10406                       "fixed-point types not supported for this target");
10407           specs->typespec_word = cts_fract;
10408         }
10409       else if (specs->long_p || specs->short_p
10410                || specs->signed_p || specs->unsigned_p)
10411         {
10412           specs->typespec_word = cts_int;
10413         }
10414       else if (specs->complex_p)
10415         {
10416           specs->typespec_word = cts_double;
10417           pedwarn (specs->locations[cdw_complex], OPT_Wpedantic,
10418                    "ISO C does not support plain %<complex%> meaning "
10419                    "%<double complex%>");
10420         }
10421       else
10422         {
10423           specs->typespec_word = cts_int;
10424           specs->default_int_p = true;
10425           /* We don't diagnose this here because grokdeclarator will
10426              give more specific diagnostics according to whether it is
10427              a function definition.  */
10428         }
10429     }
10430
10431   /* If "signed" was specified, record this to distinguish "int" and
10432      "signed int" in the case of a bit-field with
10433      -funsigned-bitfields.  */
10434   specs->explicit_signed_p = specs->signed_p;
10435
10436   /* Now compute the actual type.  */
10437   switch (specs->typespec_word)
10438     {
10439     case cts_auto_type:
10440       gcc_assert (!specs->long_p && !specs->short_p
10441                   && !specs->signed_p && !specs->unsigned_p
10442                   && !specs->complex_p);
10443       /* Type to be filled in later.  */
10444       break;
10445     case cts_void:
10446       gcc_assert (!specs->long_p && !specs->short_p
10447                   && !specs->signed_p && !specs->unsigned_p
10448                   && !specs->complex_p);
10449       specs->type = void_type_node;
10450       break;
10451     case cts_bool:
10452       gcc_assert (!specs->long_p && !specs->short_p
10453                   && !specs->signed_p && !specs->unsigned_p
10454                   && !specs->complex_p);
10455       specs->type = boolean_type_node;
10456       break;
10457     case cts_char:
10458       gcc_assert (!specs->long_p && !specs->short_p);
10459       gcc_assert (!(specs->signed_p && specs->unsigned_p));
10460       if (specs->signed_p)
10461         specs->type = signed_char_type_node;
10462       else if (specs->unsigned_p)
10463         specs->type = unsigned_char_type_node;
10464       else
10465         specs->type = char_type_node;
10466       if (specs->complex_p)
10467         {
10468           pedwarn (specs->locations[cdw_complex], OPT_Wpedantic,
10469                    "ISO C does not support complex integer types");
10470           specs->type = build_complex_type (specs->type);
10471         }
10472       break;
10473     case cts_int_n:
10474       gcc_assert (!specs->long_p && !specs->short_p && !specs->long_long_p);
10475       gcc_assert (!(specs->signed_p && specs->unsigned_p));
10476       specs->type = (specs->unsigned_p
10477                      ? int_n_trees[specs->int_n_idx].unsigned_type
10478                      : int_n_trees[specs->int_n_idx].signed_type);
10479       if (specs->complex_p)
10480         {
10481           pedwarn (specs->locations[cdw_complex], OPT_Wpedantic,
10482                    "ISO C does not support complex integer types");
10483           specs->type = build_complex_type (specs->type);
10484         }
10485       break;
10486     case cts_int:
10487       gcc_assert (!(specs->long_p && specs->short_p));
10488       gcc_assert (!(specs->signed_p && specs->unsigned_p));
10489       if (specs->long_long_p)
10490         specs->type = (specs->unsigned_p
10491                        ? long_long_unsigned_type_node
10492                        : long_long_integer_type_node);
10493       else if (specs->long_p)
10494         specs->type = (specs->unsigned_p
10495                        ? long_unsigned_type_node
10496                        : long_integer_type_node);
10497       else if (specs->short_p)
10498         specs->type = (specs->unsigned_p
10499                        ? short_unsigned_type_node
10500                        : short_integer_type_node);
10501       else
10502         specs->type = (specs->unsigned_p
10503                        ? unsigned_type_node
10504                        : integer_type_node);
10505       if (specs->complex_p)
10506         {
10507           pedwarn (specs->locations[cdw_complex], OPT_Wpedantic,
10508                    "ISO C does not support complex integer types");
10509           specs->type = build_complex_type (specs->type);
10510         }
10511       break;
10512     case cts_float:
10513       gcc_assert (!specs->long_p && !specs->short_p
10514                   && !specs->signed_p && !specs->unsigned_p);
10515       specs->type = (specs->complex_p
10516                      ? complex_float_type_node
10517                      : float_type_node);
10518       break;
10519     case cts_double:
10520       gcc_assert (!specs->long_long_p && !specs->short_p
10521                   && !specs->signed_p && !specs->unsigned_p);
10522       if (specs->long_p)
10523         {
10524           specs->type = (specs->complex_p
10525                          ? complex_long_double_type_node
10526                          : long_double_type_node);
10527         }
10528       else
10529         {
10530           specs->type = (specs->complex_p
10531                          ? complex_double_type_node
10532                          : double_type_node);
10533         }
10534       break;
10535     case cts_dfloat32:
10536     case cts_dfloat64:
10537     case cts_dfloat128:
10538       gcc_assert (!specs->long_p && !specs->long_long_p && !specs->short_p
10539                   && !specs->signed_p && !specs->unsigned_p && !specs->complex_p);
10540       if (specs->typespec_word == cts_dfloat32)
10541         specs->type = dfloat32_type_node;
10542       else if (specs->typespec_word == cts_dfloat64)
10543         specs->type = dfloat64_type_node;
10544       else
10545         specs->type = dfloat128_type_node;
10546       break;
10547     case cts_fract:
10548       gcc_assert (!specs->complex_p);
10549       if (!targetm.fixed_point_supported_p ())
10550         specs->type = integer_type_node;
10551       else if (specs->saturating_p)
10552         {
10553           if (specs->long_long_p)
10554             specs->type = specs->unsigned_p
10555                           ? sat_unsigned_long_long_fract_type_node
10556                           : sat_long_long_fract_type_node;
10557           else if (specs->long_p)
10558             specs->type = specs->unsigned_p
10559                           ? sat_unsigned_long_fract_type_node
10560                           : sat_long_fract_type_node;
10561           else if (specs->short_p)
10562             specs->type = specs->unsigned_p
10563                           ? sat_unsigned_short_fract_type_node
10564                           : sat_short_fract_type_node;
10565           else
10566             specs->type = specs->unsigned_p
10567                           ? sat_unsigned_fract_type_node
10568                           : sat_fract_type_node;
10569         }
10570       else
10571         {
10572           if (specs->long_long_p)
10573             specs->type = specs->unsigned_p
10574                           ? unsigned_long_long_fract_type_node
10575                           : long_long_fract_type_node;
10576           else if (specs->long_p)
10577             specs->type = specs->unsigned_p
10578                           ? unsigned_long_fract_type_node
10579                           : long_fract_type_node;
10580           else if (specs->short_p)
10581             specs->type = specs->unsigned_p
10582                           ? unsigned_short_fract_type_node
10583                           : short_fract_type_node;
10584           else
10585             specs->type = specs->unsigned_p
10586                           ? unsigned_fract_type_node
10587                           : fract_type_node;
10588         }
10589       break;
10590     case cts_accum:
10591       gcc_assert (!specs->complex_p);
10592       if (!targetm.fixed_point_supported_p ())
10593         specs->type = integer_type_node;
10594       else if (specs->saturating_p)
10595         {
10596           if (specs->long_long_p)
10597             specs->type = specs->unsigned_p
10598                           ? sat_unsigned_long_long_accum_type_node
10599                           : sat_long_long_accum_type_node;
10600           else if (specs->long_p)
10601             specs->type = specs->unsigned_p
10602                           ? sat_unsigned_long_accum_type_node
10603                           : sat_long_accum_type_node;
10604           else if (specs->short_p)
10605             specs->type = specs->unsigned_p
10606                           ? sat_unsigned_short_accum_type_node
10607                           : sat_short_accum_type_node;
10608           else
10609             specs->type = specs->unsigned_p
10610                           ? sat_unsigned_accum_type_node
10611                           : sat_accum_type_node;
10612         }
10613       else
10614         {
10615           if (specs->long_long_p)
10616             specs->type = specs->unsigned_p
10617                           ? unsigned_long_long_accum_type_node
10618                           : long_long_accum_type_node;
10619           else if (specs->long_p)
10620             specs->type = specs->unsigned_p
10621                           ? unsigned_long_accum_type_node
10622                           : long_accum_type_node;
10623           else if (specs->short_p)
10624             specs->type = specs->unsigned_p
10625                           ? unsigned_short_accum_type_node
10626                           : short_accum_type_node;
10627           else
10628             specs->type = specs->unsigned_p
10629                           ? unsigned_accum_type_node
10630                           : accum_type_node;
10631         }
10632       break;
10633     default:
10634       gcc_unreachable ();
10635     }
10636
10637   return specs;
10638 }
10639
10640 /* A subroutine of c_write_global_declarations.  Perform final processing
10641    on one file scope's declarations (or the external scope's declarations),
10642    GLOBALS.  */
10643
10644 static void
10645 c_write_global_declarations_1 (tree globals)
10646 {
10647   tree decl;
10648   bool reconsider;
10649
10650   /* Process the decls in the order they were written.  */
10651   for (decl = globals; decl; decl = DECL_CHAIN (decl))
10652     {
10653       /* Check for used but undefined static functions using the C
10654          standard's definition of "used", and set TREE_NO_WARNING so
10655          that check_global_declarations doesn't repeat the check.  */
10656       if (TREE_CODE (decl) == FUNCTION_DECL
10657           && DECL_INITIAL (decl) == 0
10658           && DECL_EXTERNAL (decl)
10659           && !TREE_PUBLIC (decl)
10660           && C_DECL_USED (decl))
10661         {
10662           pedwarn (input_location, 0, "%q+F used but never defined", decl);
10663           TREE_NO_WARNING (decl) = 1;
10664         }
10665
10666       wrapup_global_declaration_1 (decl);
10667     }
10668
10669   do
10670     {
10671       reconsider = false;
10672       for (decl = globals; decl; decl = DECL_CHAIN (decl))
10673         reconsider |= wrapup_global_declaration_2 (decl);
10674     }
10675   while (reconsider);
10676
10677   for (decl = globals; decl; decl = DECL_CHAIN (decl))
10678     check_global_declaration_1 (decl);
10679 }
10680
10681 /* A subroutine of c_write_global_declarations Emit debug information for each
10682    of the declarations in GLOBALS.  */
10683
10684 static void
10685 c_write_global_declarations_2 (tree globals)
10686 {
10687   tree decl;
10688
10689   for (decl = globals; decl ; decl = DECL_CHAIN (decl))
10690     debug_hooks->global_decl (decl);
10691 }
10692
10693 /* Callback to collect a source_ref from a DECL.  */
10694
10695 static void
10696 collect_source_ref_cb (tree decl)
10697 {
10698   if (!DECL_IS_BUILTIN (decl))
10699     collect_source_ref (LOCATION_FILE (decl_sloc (decl, false)));
10700 }
10701
10702 /* Preserve the external declarations scope across a garbage collect.  */
10703 static GTY(()) tree ext_block;
10704
10705 /* Collect all references relevant to SOURCE_FILE.  */
10706
10707 static void
10708 collect_all_refs (const char *source_file)
10709 {
10710   tree t;
10711   unsigned i;
10712
10713   FOR_EACH_VEC_ELT (*all_translation_units, i, t)
10714     collect_ada_nodes (BLOCK_VARS (DECL_INITIAL (t)), source_file);
10715
10716   collect_ada_nodes (BLOCK_VARS (ext_block), source_file);
10717 }
10718
10719 /* Iterate over all global declarations and call CALLBACK.  */
10720
10721 static void
10722 for_each_global_decl (void (*callback) (tree decl))
10723 {
10724   tree t;
10725   tree decls;
10726   tree decl;
10727   unsigned i;
10728
10729   FOR_EACH_VEC_ELT (*all_translation_units, i, t)
10730     { 
10731       decls = DECL_INITIAL (t);
10732       for (decl = BLOCK_VARS (decls); decl; decl = TREE_CHAIN (decl))
10733         callback (decl);
10734     }
10735
10736   for (decl = BLOCK_VARS (ext_block); decl; decl = TREE_CHAIN (decl))
10737     callback (decl);
10738 }
10739
10740 void
10741 c_write_global_declarations (void)
10742 {
10743   tree t;
10744   unsigned i;
10745
10746   /* We don't want to do this if generating a PCH.  */
10747   if (pch_file)
10748     return;
10749
10750   timevar_start (TV_PHASE_DEFERRED);
10751
10752   /* Do the Objective-C stuff.  This is where all the Objective-C
10753      module stuff gets generated (symtab, class/protocol/selector
10754      lists etc).  */
10755   if (c_dialect_objc ())
10756     objc_write_global_declarations ();
10757
10758   /* Close the external scope.  */
10759   ext_block = pop_scope ();
10760   external_scope = 0;
10761   gcc_assert (!current_scope);
10762
10763   /* Handle -fdump-ada-spec[-slim]. */
10764   if (flag_dump_ada_spec || flag_dump_ada_spec_slim)
10765     {
10766       /* Build a table of files to generate specs for */
10767       if (flag_dump_ada_spec_slim)
10768         collect_source_ref (main_input_filename);
10769       else
10770         for_each_global_decl (collect_source_ref_cb);
10771
10772       dump_ada_specs (collect_all_refs, NULL);
10773     }
10774
10775   if (ext_block)
10776     {
10777       tree tmp = BLOCK_VARS (ext_block);
10778       int flags;
10779       FILE * stream = dump_begin (TDI_tu, &flags);
10780       if (stream && tmp)
10781         {
10782           dump_node (tmp, flags & ~TDF_SLIM, stream);
10783           dump_end (TDI_tu, stream);
10784         }
10785     }
10786
10787   /* Process all file scopes in this compilation, and the external_scope,
10788      through wrapup_global_declarations and check_global_declarations.  */
10789   FOR_EACH_VEC_ELT (*all_translation_units, i, t)
10790     c_write_global_declarations_1 (BLOCK_VARS (DECL_INITIAL (t)));
10791   c_write_global_declarations_1 (BLOCK_VARS (ext_block));
10792
10793   timevar_stop (TV_PHASE_DEFERRED);
10794   timevar_start (TV_PHASE_OPT_GEN);
10795
10796   /* We're done parsing; proceed to optimize and emit assembly.
10797      FIXME: shouldn't be the front end's responsibility to call this.  */
10798   symtab->finalize_compilation_unit ();
10799
10800   timevar_stop (TV_PHASE_OPT_GEN);
10801   timevar_start (TV_PHASE_DBGINFO);
10802
10803   /* After cgraph has had a chance to emit everything that's going to
10804      be emitted, output debug information for globals.  */
10805   if (!seen_error ())
10806     {
10807       timevar_push (TV_SYMOUT);
10808       FOR_EACH_VEC_ELT (*all_translation_units, i, t)
10809         c_write_global_declarations_2 (BLOCK_VARS (DECL_INITIAL (t)));
10810       c_write_global_declarations_2 (BLOCK_VARS (ext_block));
10811       timevar_pop (TV_SYMOUT);
10812     }
10813
10814   ext_block = NULL;
10815   timevar_stop (TV_PHASE_DBGINFO);
10816 }
10817
10818 /* Register reserved keyword WORD as qualifier for address space AS.  */
10819
10820 void
10821 c_register_addr_space (const char *word, addr_space_t as)
10822 {
10823   int rid = RID_FIRST_ADDR_SPACE + as;
10824   tree id;
10825
10826   /* Address space qualifiers are only supported
10827      in C with GNU extensions enabled.  */
10828   if (c_dialect_objc () || flag_no_asm)
10829     return;
10830
10831   id = get_identifier (word);
10832   C_SET_RID_CODE (id, rid);
10833   C_IS_RESERVED_WORD (id) = 1;
10834   ridpointers [rid] = id;
10835 }
10836
10837 /* Return identifier to look up for omp declare reduction.  */
10838
10839 tree
10840 c_omp_reduction_id (enum tree_code reduction_code, tree reduction_id)
10841 {
10842   const char *p = NULL;
10843   switch (reduction_code)
10844     {
10845     case PLUS_EXPR: p = "+"; break;
10846     case MULT_EXPR: p = "*"; break;
10847     case MINUS_EXPR: p = "-"; break;
10848     case BIT_AND_EXPR: p = "&"; break;
10849     case BIT_XOR_EXPR: p = "^"; break;
10850     case BIT_IOR_EXPR: p = "|"; break;
10851     case TRUTH_ANDIF_EXPR: p = "&&"; break;
10852     case TRUTH_ORIF_EXPR: p = "||"; break;
10853     case MIN_EXPR: p = "min"; break;
10854     case MAX_EXPR: p = "max"; break;
10855     default:
10856       break;
10857     }
10858
10859   if (p == NULL)
10860     {
10861       if (TREE_CODE (reduction_id) != IDENTIFIER_NODE)
10862         return error_mark_node;
10863       p = IDENTIFIER_POINTER (reduction_id);
10864     }
10865
10866   const char prefix[] = "omp declare reduction ";
10867   size_t lenp = sizeof (prefix);
10868   size_t len = strlen (p);
10869   char *name = XALLOCAVEC (char, lenp + len);
10870   memcpy (name, prefix, lenp - 1);
10871   memcpy (name + lenp - 1, p, len + 1);
10872   return get_identifier (name);
10873 }
10874
10875 /* Lookup REDUCTION_ID in the current scope, or create an artificial
10876    VAR_DECL, bind it into the current scope and return it.  */
10877
10878 tree
10879 c_omp_reduction_decl (tree reduction_id)
10880 {
10881   struct c_binding *b = I_SYMBOL_BINDING (reduction_id);
10882   if (b != NULL && B_IN_CURRENT_SCOPE (b))
10883     return b->decl;
10884
10885   tree decl = build_decl (BUILTINS_LOCATION, VAR_DECL,
10886                           reduction_id, integer_type_node);
10887   DECL_ARTIFICIAL (decl) = 1;
10888   DECL_EXTERNAL (decl) = 1;
10889   TREE_STATIC (decl) = 1;
10890   TREE_PUBLIC (decl) = 0;
10891   bind (reduction_id, decl, current_scope, true, false, BUILTINS_LOCATION);
10892   return decl;
10893 }
10894
10895 /* Lookup REDUCTION_ID in the first scope where it has entry for TYPE.  */
10896
10897 tree
10898 c_omp_reduction_lookup (tree reduction_id, tree type)
10899 {
10900   struct c_binding *b = I_SYMBOL_BINDING (reduction_id);
10901   while (b)
10902     {
10903       tree t;
10904       for (t = DECL_INITIAL (b->decl); t; t = TREE_CHAIN (t))
10905         if (comptypes (TREE_PURPOSE (t), type))
10906           return TREE_VALUE (t);
10907       b = b->shadowed;
10908     }
10909   return error_mark_node;
10910 }
10911
10912 /* Helper function called via walk_tree, to diagnose invalid
10913    #pragma omp declare reduction combiners or initializers.  */
10914
10915 tree
10916 c_check_omp_declare_reduction_r (tree *tp, int *, void *data)
10917 {
10918   tree *vars = (tree *) data;
10919   if (SSA_VAR_P (*tp)
10920       && !DECL_ARTIFICIAL (*tp)
10921       && *tp != vars[0]
10922       && *tp != vars[1])
10923     {
10924       location_t loc = DECL_SOURCE_LOCATION (vars[0]);
10925       if (strcmp (IDENTIFIER_POINTER (DECL_NAME (vars[0])), "omp_out") == 0)
10926         error_at (loc, "%<#pragma omp declare reduction%> combiner refers to "
10927                        "variable %qD which is not %<omp_out%> nor %<omp_in%>",
10928                   *tp);
10929       else
10930         error_at (loc, "%<#pragma omp declare reduction%> initializer refers "
10931                        "to variable %qD which is not %<omp_priv%> nor "
10932                        "%<omp_orig%>",
10933                   *tp);
10934       return *tp;
10935     }
10936   return NULL_TREE;
10937 }
10938
10939 #include "gt-c-c-decl.h"