* i386.md (subsi_3_zext): Fix output template.
[official-gcc.git] / gcc / c-decl.c
blob6ad6a695d08964e071d5c3d35a26061dc235b6da
1 /* Process declarations and variables for C compiler.
2 Copyright (C) 1988, 1992, 1993, 1994, 1995, 1996, 1997, 1998, 1999, 2000,
3 2001, 2002, 2003, 2004, 2005 Free Software Foundation, Inc.
5 This file is part of GCC.
7 GCC is free software; you can redistribute it and/or modify it under
8 the terms of the GNU General Public License as published by the Free
9 Software Foundation; either version 2, or (at your option) any later
10 version.
12 GCC is distributed in the hope that it will be useful, but WITHOUT ANY
13 WARRANTY; without even the implied warranty of MERCHANTABILITY or
14 FITNESS FOR A PARTICULAR PURPOSE. See the GNU General Public License
15 for more details.
17 You should have received a copy of the GNU General Public License
18 along with GCC; see the file COPYING. If not, write to the Free
19 Software Foundation, 51 Franklin Street, Fifth Floor, Boston, MA
20 02110-1301, USA. */
22 /* Process declarations and symbol lookup for C front end.
23 Also constructs types; the standard scalar types at initialization,
24 and structure, union, array and enum types when they are declared. */
26 /* ??? not all decl nodes are given the most useful possible
27 line numbers. For example, the CONST_DECLs for enum values. */
29 #include "config.h"
30 #include "system.h"
31 #include "coretypes.h"
32 #include "input.h"
33 #include "tm.h"
34 #include "intl.h"
35 #include "tree.h"
36 #include "tree-inline.h"
37 #include "rtl.h"
38 #include "flags.h"
39 #include "function.h"
40 #include "output.h"
41 #include "expr.h"
42 #include "c-tree.h"
43 #include "toplev.h"
44 #include "ggc.h"
45 #include "tm_p.h"
46 #include "cpplib.h"
47 #include "target.h"
48 #include "debug.h"
49 #include "opts.h"
50 #include "timevar.h"
51 #include "c-common.h"
52 #include "c-pragma.h"
53 #include "langhooks.h"
54 #include "tree-mudflap.h"
55 #include "tree-gimple.h"
56 #include "diagnostic.h"
57 #include "tree-dump.h"
58 #include "cgraph.h"
59 #include "hashtab.h"
60 #include "libfuncs.h"
61 #include "except.h"
62 #include "langhooks-def.h"
63 #include "pointer-set.h"
65 /* In grokdeclarator, distinguish syntactic contexts of declarators. */
66 enum decl_context
67 { NORMAL, /* Ordinary declaration */
68 FUNCDEF, /* Function definition */
69 PARM, /* Declaration of parm before function body */
70 FIELD, /* Declaration inside struct or union */
71 TYPENAME}; /* Typename (inside cast or sizeof) */
74 /* Nonzero if we have seen an invalid cross reference
75 to a struct, union, or enum, but not yet printed the message. */
76 tree pending_invalid_xref;
78 /* File and line to appear in the eventual error message. */
79 location_t pending_invalid_xref_location;
81 /* True means we've initialized exception handling. */
82 bool c_eh_initialized_p;
84 /* While defining an enum type, this is 1 plus the last enumerator
85 constant value. Note that will do not have to save this or `enum_overflow'
86 around nested function definition since such a definition could only
87 occur in an enum value expression and we don't use these variables in
88 that case. */
90 static tree enum_next_value;
92 /* Nonzero means that there was overflow computing enum_next_value. */
94 static int enum_overflow;
96 /* The file and line that the prototype came from if this is an
97 old-style definition; used for diagnostics in
98 store_parm_decls_oldstyle. */
100 static location_t current_function_prototype_locus;
102 /* Whether this prototype was built-in. */
104 static bool current_function_prototype_built_in;
106 /* The argument type information of this prototype. */
108 static tree current_function_prototype_arg_types;
110 /* The argument information structure for the function currently being
111 defined. */
113 static struct c_arg_info *current_function_arg_info;
115 /* The obstack on which parser and related data structures, which are
116 not live beyond their top-level declaration or definition, are
117 allocated. */
118 struct obstack parser_obstack;
120 /* The current statement tree. */
122 static GTY(()) struct stmt_tree_s c_stmt_tree;
124 /* State saving variables. */
125 tree c_break_label;
126 tree c_cont_label;
128 /* Linked list of TRANSLATION_UNIT_DECLS for the translation units
129 included in this invocation. Note that the current translation
130 unit is not included in this list. */
132 static GTY(()) tree all_translation_units;
134 /* A list of decls to be made automatically visible in each file scope. */
135 static GTY(()) tree visible_builtins;
137 /* Set to 0 at beginning of a function definition, set to 1 if
138 a return statement that specifies a return value is seen. */
140 int current_function_returns_value;
142 /* Set to 0 at beginning of a function definition, set to 1 if
143 a return statement with no argument is seen. */
145 int current_function_returns_null;
147 /* Set to 0 at beginning of a function definition, set to 1 if
148 a call to a noreturn function is seen. */
150 int current_function_returns_abnormally;
152 /* Set to nonzero by `grokdeclarator' for a function
153 whose return type is defaulted, if warnings for this are desired. */
155 static int warn_about_return_type;
157 /* Nonzero when starting a function declared `extern inline'. */
159 static int current_extern_inline;
161 /* Nonzero when the current toplevel function contains a declaration
162 of a nested function which is never defined. */
164 static bool undef_nested_function;
166 /* True means global_bindings_p should return false even if the scope stack
167 says we are in file scope. */
168 bool c_override_global_bindings_to_false;
171 /* Each c_binding structure describes one binding of an identifier to
172 a decl. All the decls in a scope - irrespective of namespace - are
173 chained together by the ->prev field, which (as the name implies)
174 runs in reverse order. All the decls in a given namespace bound to
175 a given identifier are chained by the ->shadowed field, which runs
176 from inner to outer scopes.
178 The ->decl field usually points to a DECL node, but there are two
179 exceptions. In the namespace of type tags, the bound entity is a
180 RECORD_TYPE, UNION_TYPE, or ENUMERAL_TYPE node. If an undeclared
181 identifier is encountered, it is bound to error_mark_node to
182 suppress further errors about that identifier in the current
183 function.
185 The ->type field stores the type of the declaration in this scope;
186 if NULL, the type is the type of the ->decl field. This is only of
187 relevance for objects with external or internal linkage which may
188 be redeclared in inner scopes, forming composite types that only
189 persist for the duration of those scopes. In the external scope,
190 this stores the composite of all the types declared for this
191 object, visible or not. The ->inner_comp field (used only at file
192 scope) stores whether an incomplete array type at file scope was
193 completed at an inner scope to an array size other than 1.
195 The depth field is copied from the scope structure that holds this
196 decl. It is used to preserve the proper ordering of the ->shadowed
197 field (see bind()) and also for a handful of special-case checks.
198 Finally, the invisible bit is true for a decl which should be
199 ignored for purposes of normal name lookup, and the nested bit is
200 true for a decl that's been bound a second time in an inner scope;
201 in all such cases, the binding in the outer scope will have its
202 invisible bit true. */
204 struct c_binding GTY((chain_next ("%h.prev")))
206 tree decl; /* the decl bound */
207 tree type; /* the type in this scope */
208 tree id; /* the identifier it's bound to */
209 struct c_binding *prev; /* the previous decl in this scope */
210 struct c_binding *shadowed; /* the innermost decl shadowed by this one */
211 unsigned int depth : 28; /* depth of this scope */
212 BOOL_BITFIELD invisible : 1; /* normal lookup should ignore this binding */
213 BOOL_BITFIELD nested : 1; /* do not set DECL_CONTEXT when popping */
214 BOOL_BITFIELD inner_comp : 1; /* incomplete array completed in inner scope */
215 /* one free bit */
217 #define B_IN_SCOPE(b1, b2) ((b1)->depth == (b2)->depth)
218 #define B_IN_CURRENT_SCOPE(b) ((b)->depth == current_scope->depth)
219 #define B_IN_FILE_SCOPE(b) ((b)->depth == 1 /*file_scope->depth*/)
220 #define B_IN_EXTERNAL_SCOPE(b) ((b)->depth == 0 /*external_scope->depth*/)
222 #define I_SYMBOL_BINDING(node) \
223 (((struct lang_identifier *) IDENTIFIER_NODE_CHECK(node))->symbol_binding)
224 #define I_SYMBOL_DECL(node) \
225 (I_SYMBOL_BINDING(node) ? I_SYMBOL_BINDING(node)->decl : 0)
227 #define I_TAG_BINDING(node) \
228 (((struct lang_identifier *) IDENTIFIER_NODE_CHECK(node))->tag_binding)
229 #define I_TAG_DECL(node) \
230 (I_TAG_BINDING(node) ? I_TAG_BINDING(node)->decl : 0)
232 #define I_LABEL_BINDING(node) \
233 (((struct lang_identifier *) IDENTIFIER_NODE_CHECK(node))->label_binding)
234 #define I_LABEL_DECL(node) \
235 (I_LABEL_BINDING(node) ? I_LABEL_BINDING(node)->decl : 0)
237 /* Each C symbol points to three linked lists of c_binding structures.
238 These describe the values of the identifier in the three different
239 namespaces defined by the language. */
241 struct lang_identifier GTY(())
243 struct c_common_identifier common_id;
244 struct c_binding *symbol_binding; /* vars, funcs, constants, typedefs */
245 struct c_binding *tag_binding; /* struct/union/enum tags */
246 struct c_binding *label_binding; /* labels */
249 /* Validate c-lang.c's assumptions. */
250 extern char C_SIZEOF_STRUCT_LANG_IDENTIFIER_isnt_accurate
251 [(sizeof(struct lang_identifier) == C_SIZEOF_STRUCT_LANG_IDENTIFIER) ? 1 : -1];
253 /* The resulting tree type. */
255 union lang_tree_node
256 GTY((desc ("TREE_CODE (&%h.generic) == IDENTIFIER_NODE"),
257 chain_next ("TREE_CODE (&%h.generic) == INTEGER_TYPE ? (union lang_tree_node *) TYPE_NEXT_VARIANT (&%h.generic) : (union lang_tree_node *) TREE_CHAIN (&%h.generic)")))
259 union tree_node GTY ((tag ("0"),
260 desc ("tree_node_structure (&%h)")))
261 generic;
262 struct lang_identifier GTY ((tag ("1"))) identifier;
265 /* Each c_scope structure describes the complete contents of one
266 scope. Four scopes are distinguished specially: the innermost or
267 current scope, the innermost function scope, the file scope (always
268 the second to outermost) and the outermost or external scope.
270 Most declarations are recorded in the current scope.
272 All normal label declarations are recorded in the innermost
273 function scope, as are bindings of undeclared identifiers to
274 error_mark_node. (GCC permits nested functions as an extension,
275 hence the 'innermost' qualifier.) Explicitly declared labels
276 (using the __label__ extension) appear in the current scope.
278 Being in the file scope (current_scope == file_scope) causes
279 special behavior in several places below. Also, under some
280 conditions the Objective-C front end records declarations in the
281 file scope even though that isn't the current scope.
283 All declarations with external linkage are recorded in the external
284 scope, even if they aren't visible there; this models the fact that
285 such declarations are visible to the entire program, and (with a
286 bit of cleverness, see pushdecl) allows diagnosis of some violations
287 of C99 6.2.2p7 and 6.2.7p2:
289 If, within the same translation unit, the same identifier appears
290 with both internal and external linkage, the behavior is
291 undefined.
293 All declarations that refer to the same object or function shall
294 have compatible type; otherwise, the behavior is undefined.
296 Initially only the built-in declarations, which describe compiler
297 intrinsic functions plus a subset of the standard library, are in
298 this scope.
300 The order of the blocks list matters, and it is frequently appended
301 to. To avoid having to walk all the way to the end of the list on
302 each insertion, or reverse the list later, we maintain a pointer to
303 the last list entry. (FIXME: It should be feasible to use a reversed
304 list here.)
306 The bindings list is strictly in reverse order of declarations;
307 pop_scope relies on this. */
310 struct c_scope GTY((chain_next ("%h.outer")))
312 /* The scope containing this one. */
313 struct c_scope *outer;
315 /* The next outermost function scope. */
316 struct c_scope *outer_function;
318 /* All bindings in this scope. */
319 struct c_binding *bindings;
321 /* For each scope (except the global one), a chain of BLOCK nodes
322 for all the scopes that were entered and exited one level down. */
323 tree blocks;
324 tree blocks_last;
326 /* The depth of this scope. Used to keep the ->shadowed chain of
327 bindings sorted innermost to outermost. */
328 unsigned int depth : 28;
330 /* True if we are currently filling this scope with parameter
331 declarations. */
332 BOOL_BITFIELD parm_flag : 1;
334 /* True if we saw [*] in this scope. Used to give an error messages
335 if these appears in a function definition. */
336 BOOL_BITFIELD had_vla_unspec : 1;
338 /* True if we already complained about forward parameter decls
339 in this scope. This prevents double warnings on
340 foo (int a; int b; ...) */
341 BOOL_BITFIELD warned_forward_parm_decls : 1;
343 /* True if this is the outermost block scope of a function body.
344 This scope contains the parameters, the local variables declared
345 in the outermost block, and all the labels (except those in
346 nested functions, or declared at block scope with __label__). */
347 BOOL_BITFIELD function_body : 1;
349 /* True means make a BLOCK for this scope no matter what. */
350 BOOL_BITFIELD keep : 1;
353 /* The scope currently in effect. */
355 static GTY(()) struct c_scope *current_scope;
357 /* The innermost function scope. Ordinary (not explicitly declared)
358 labels, bindings to error_mark_node, and the lazily-created
359 bindings of __func__ and its friends get this scope. */
361 static GTY(()) struct c_scope *current_function_scope;
363 /* The C file scope. This is reset for each input translation unit. */
365 static GTY(()) struct c_scope *file_scope;
367 /* The outermost scope. This is used for all declarations with
368 external linkage, and only these, hence the name. */
370 static GTY(()) struct c_scope *external_scope;
372 /* A chain of c_scope structures awaiting reuse. */
374 static GTY((deletable)) struct c_scope *scope_freelist;
376 /* A chain of c_binding structures awaiting reuse. */
378 static GTY((deletable)) struct c_binding *binding_freelist;
380 /* Append VAR to LIST in scope SCOPE. */
381 #define SCOPE_LIST_APPEND(scope, list, decl) do { \
382 struct c_scope *s_ = (scope); \
383 tree d_ = (decl); \
384 if (s_->list##_last) \
385 TREE_CHAIN (s_->list##_last) = d_; \
386 else \
387 s_->list = d_; \
388 s_->list##_last = d_; \
389 } while (0)
391 /* Concatenate FROM in scope FSCOPE onto TO in scope TSCOPE. */
392 #define SCOPE_LIST_CONCAT(tscope, to, fscope, from) do { \
393 struct c_scope *t_ = (tscope); \
394 struct c_scope *f_ = (fscope); \
395 if (t_->to##_last) \
396 TREE_CHAIN (t_->to##_last) = f_->from; \
397 else \
398 t_->to = f_->from; \
399 t_->to##_last = f_->from##_last; \
400 } while (0)
402 /* True means unconditionally make a BLOCK for the next scope pushed. */
404 static bool keep_next_level_flag;
406 /* True means the next call to push_scope will be the outermost scope
407 of a function body, so do not push a new scope, merely cease
408 expecting parameter decls. */
410 static bool next_is_function_body;
412 /* Functions called automatically at the beginning and end of execution. */
414 static GTY(()) tree static_ctors;
415 static GTY(()) tree static_dtors;
417 /* Forward declarations. */
418 static tree lookup_name_in_scope (tree, struct c_scope *);
419 static tree c_make_fname_decl (tree, int);
420 static tree grokdeclarator (const struct c_declarator *,
421 struct c_declspecs *,
422 enum decl_context, bool, tree *);
423 static tree grokparms (struct c_arg_info *, bool);
424 static void layout_array_type (tree);
426 /* T is a statement. Add it to the statement-tree. This is the
427 C/ObjC version--C++ has a slightly different version of this
428 function. */
430 tree
431 add_stmt (tree t)
433 enum tree_code code = TREE_CODE (t);
435 if (EXPR_P (t) && code != LABEL_EXPR)
437 if (!EXPR_HAS_LOCATION (t))
438 SET_EXPR_LOCATION (t, input_location);
441 if (code == LABEL_EXPR || code == CASE_LABEL_EXPR)
442 STATEMENT_LIST_HAS_LABEL (cur_stmt_list) = 1;
444 /* Add T to the statement-tree. Non-side-effect statements need to be
445 recorded during statement expressions. */
446 append_to_statement_list_force (t, &cur_stmt_list);
448 return t;
451 /* States indicating how grokdeclarator() should handle declspecs marked
452 with __attribute__((deprecated)). An object declared as
453 __attribute__((deprecated)) suppresses warnings of uses of other
454 deprecated items. */
456 enum deprecated_states {
457 DEPRECATED_NORMAL,
458 DEPRECATED_SUPPRESS
461 static enum deprecated_states deprecated_state = DEPRECATED_NORMAL;
463 void
464 c_print_identifier (FILE *file, tree node, int indent)
466 print_node (file, "symbol", I_SYMBOL_DECL (node), indent + 4);
467 print_node (file, "tag", I_TAG_DECL (node), indent + 4);
468 print_node (file, "label", I_LABEL_DECL (node), indent + 4);
469 if (C_IS_RESERVED_WORD (node))
471 tree rid = ridpointers[C_RID_CODE (node)];
472 indent_to (file, indent + 4);
473 fprintf (file, "rid %p \"%s\"",
474 (void *) rid, IDENTIFIER_POINTER (rid));
478 /* Establish a binding between NAME, an IDENTIFIER_NODE, and DECL,
479 which may be any of several kinds of DECL or TYPE or error_mark_node,
480 in the scope SCOPE. */
481 static void
482 bind (tree name, tree decl, struct c_scope *scope, bool invisible, bool nested)
484 struct c_binding *b, **here;
486 if (binding_freelist)
488 b = binding_freelist;
489 binding_freelist = b->prev;
491 else
492 b = GGC_NEW (struct c_binding);
494 b->shadowed = 0;
495 b->decl = decl;
496 b->id = name;
497 b->depth = scope->depth;
498 b->invisible = invisible;
499 b->nested = nested;
500 b->inner_comp = 0;
502 b->type = 0;
504 b->prev = scope->bindings;
505 scope->bindings = b;
507 if (!name)
508 return;
510 switch (TREE_CODE (decl))
512 case LABEL_DECL: here = &I_LABEL_BINDING (name); break;
513 case ENUMERAL_TYPE:
514 case UNION_TYPE:
515 case RECORD_TYPE: here = &I_TAG_BINDING (name); break;
516 case VAR_DECL:
517 case FUNCTION_DECL:
518 case TYPE_DECL:
519 case CONST_DECL:
520 case PARM_DECL:
521 case ERROR_MARK: here = &I_SYMBOL_BINDING (name); break;
523 default:
524 gcc_unreachable ();
527 /* Locate the appropriate place in the chain of shadowed decls
528 to insert this binding. Normally, scope == current_scope and
529 this does nothing. */
530 while (*here && (*here)->depth > scope->depth)
531 here = &(*here)->shadowed;
533 b->shadowed = *here;
534 *here = b;
537 /* Clear the binding structure B, stick it on the binding_freelist,
538 and return the former value of b->prev. This is used by pop_scope
539 and get_parm_info to iterate destructively over all the bindings
540 from a given scope. */
541 static struct c_binding *
542 free_binding_and_advance (struct c_binding *b)
544 struct c_binding *prev = b->prev;
546 memset (b, 0, sizeof (struct c_binding));
547 b->prev = binding_freelist;
548 binding_freelist = b;
550 return prev;
554 /* Hook called at end of compilation to assume 1 elt
555 for a file-scope tentative array defn that wasn't complete before. */
557 void
558 c_finish_incomplete_decl (tree decl)
560 if (TREE_CODE (decl) == VAR_DECL)
562 tree type = TREE_TYPE (decl);
563 if (type != error_mark_node
564 && TREE_CODE (type) == ARRAY_TYPE
565 && !DECL_EXTERNAL (decl)
566 && TYPE_DOMAIN (type) == 0)
568 warning (0, "array %q+D assumed to have one element", decl);
570 complete_array_type (&TREE_TYPE (decl), NULL_TREE, true);
572 layout_decl (decl, 0);
577 /* The Objective-C front-end often needs to determine the current scope. */
579 void *
580 objc_get_current_scope (void)
582 return current_scope;
585 /* The following function is used only by Objective-C. It needs to live here
586 because it accesses the innards of c_scope. */
588 void
589 objc_mark_locals_volatile (void *enclosing_blk)
591 struct c_scope *scope;
592 struct c_binding *b;
594 for (scope = current_scope;
595 scope && scope != enclosing_blk;
596 scope = scope->outer)
598 for (b = scope->bindings; b; b = b->prev)
599 objc_volatilize_decl (b->decl);
601 /* Do not climb up past the current function. */
602 if (scope->function_body)
603 break;
607 /* Nonzero if we are currently in file scope. */
610 global_bindings_p (void)
612 return current_scope == file_scope && !c_override_global_bindings_to_false;
615 void
616 keep_next_level (void)
618 keep_next_level_flag = true;
621 /* Identify this scope as currently being filled with parameters. */
623 void
624 declare_parm_level (void)
626 current_scope->parm_flag = true;
629 void
630 push_scope (void)
632 if (next_is_function_body)
634 /* This is the transition from the parameters to the top level
635 of the function body. These are the same scope
636 (C99 6.2.1p4,6) so we do not push another scope structure.
637 next_is_function_body is set only by store_parm_decls, which
638 in turn is called when and only when we are about to
639 encounter the opening curly brace for the function body.
641 The outermost block of a function always gets a BLOCK node,
642 because the debugging output routines expect that each
643 function has at least one BLOCK. */
644 current_scope->parm_flag = false;
645 current_scope->function_body = true;
646 current_scope->keep = true;
647 current_scope->outer_function = current_function_scope;
648 current_function_scope = current_scope;
650 keep_next_level_flag = false;
651 next_is_function_body = false;
653 else
655 struct c_scope *scope;
656 if (scope_freelist)
658 scope = scope_freelist;
659 scope_freelist = scope->outer;
661 else
662 scope = GGC_CNEW (struct c_scope);
664 scope->keep = keep_next_level_flag;
665 scope->outer = current_scope;
666 scope->depth = current_scope ? (current_scope->depth + 1) : 0;
668 /* Check for scope depth overflow. Unlikely (2^28 == 268,435,456) but
669 possible. */
670 if (current_scope && scope->depth == 0)
672 scope->depth--;
673 sorry ("GCC supports only %u nested scopes", scope->depth);
676 current_scope = scope;
677 keep_next_level_flag = false;
681 /* Set the TYPE_CONTEXT of all of TYPE's variants to CONTEXT. */
683 static void
684 set_type_context (tree type, tree context)
686 for (type = TYPE_MAIN_VARIANT (type); type;
687 type = TYPE_NEXT_VARIANT (type))
688 TYPE_CONTEXT (type) = context;
691 /* Exit a scope. Restore the state of the identifier-decl mappings
692 that were in effect when this scope was entered. Return a BLOCK
693 node containing all the DECLs in this scope that are of interest
694 to debug info generation. */
696 tree
697 pop_scope (void)
699 struct c_scope *scope = current_scope;
700 tree block, context, p;
701 struct c_binding *b;
703 bool functionbody = scope->function_body;
704 bool keep = functionbody || scope->keep || scope->bindings;
706 c_end_vm_scope (scope->depth);
708 /* If appropriate, create a BLOCK to record the decls for the life
709 of this function. */
710 block = 0;
711 if (keep)
713 block = make_node (BLOCK);
714 BLOCK_SUBBLOCKS (block) = scope->blocks;
715 TREE_USED (block) = 1;
717 /* In each subblock, record that this is its superior. */
718 for (p = scope->blocks; p; p = TREE_CHAIN (p))
719 BLOCK_SUPERCONTEXT (p) = block;
721 BLOCK_VARS (block) = 0;
724 /* The TYPE_CONTEXTs for all of the tagged types belonging to this
725 scope must be set so that they point to the appropriate
726 construct, i.e. either to the current FUNCTION_DECL node, or
727 else to the BLOCK node we just constructed.
729 Note that for tagged types whose scope is just the formal
730 parameter list for some function type specification, we can't
731 properly set their TYPE_CONTEXTs here, because we don't have a
732 pointer to the appropriate FUNCTION_TYPE node readily available
733 to us. For those cases, the TYPE_CONTEXTs of the relevant tagged
734 type nodes get set in `grokdeclarator' as soon as we have created
735 the FUNCTION_TYPE node which will represent the "scope" for these
736 "parameter list local" tagged types. */
737 if (scope->function_body)
738 context = current_function_decl;
739 else if (scope == file_scope)
741 tree file_decl = build_decl (TRANSLATION_UNIT_DECL, 0, 0);
742 TREE_CHAIN (file_decl) = all_translation_units;
743 all_translation_units = file_decl;
744 context = file_decl;
746 else
747 context = block;
749 /* Clear all bindings in this scope. */
750 for (b = scope->bindings; b; b = free_binding_and_advance (b))
752 p = b->decl;
753 switch (TREE_CODE (p))
755 case LABEL_DECL:
756 /* Warnings for unused labels, errors for undefined labels. */
757 if (TREE_USED (p) && !DECL_INITIAL (p))
759 error ("label %q+D used but not defined", p);
760 DECL_INITIAL (p) = error_mark_node;
762 else if (!TREE_USED (p) && warn_unused_label)
764 if (DECL_INITIAL (p))
765 warning (0, "label %q+D defined but not used", p);
766 else
767 warning (0, "label %q+D declared but not defined", p);
769 /* Labels go in BLOCK_VARS. */
770 TREE_CHAIN (p) = BLOCK_VARS (block);
771 BLOCK_VARS (block) = p;
772 gcc_assert (I_LABEL_BINDING (b->id) == b);
773 I_LABEL_BINDING (b->id) = b->shadowed;
774 break;
776 case ENUMERAL_TYPE:
777 case UNION_TYPE:
778 case RECORD_TYPE:
779 set_type_context (p, context);
781 /* Types may not have tag-names, in which case the type
782 appears in the bindings list with b->id NULL. */
783 if (b->id)
785 gcc_assert (I_TAG_BINDING (b->id) == b);
786 I_TAG_BINDING (b->id) = b->shadowed;
788 break;
790 case FUNCTION_DECL:
791 /* Propagate TREE_ADDRESSABLE from nested functions to their
792 containing functions. */
793 if (!TREE_ASM_WRITTEN (p)
794 && DECL_INITIAL (p) != 0
795 && TREE_ADDRESSABLE (p)
796 && DECL_ABSTRACT_ORIGIN (p) != 0
797 && DECL_ABSTRACT_ORIGIN (p) != p)
798 TREE_ADDRESSABLE (DECL_ABSTRACT_ORIGIN (p)) = 1;
799 if (!DECL_EXTERNAL (p)
800 && DECL_INITIAL (p) == 0)
802 error ("nested function %q+D declared but never defined", p);
803 undef_nested_function = true;
805 goto common_symbol;
807 case VAR_DECL:
808 /* Warnings for unused variables. */
809 if (!TREE_USED (p)
810 && !TREE_NO_WARNING (p)
811 && !DECL_IN_SYSTEM_HEADER (p)
812 && DECL_NAME (p)
813 && !DECL_ARTIFICIAL (p)
814 && scope != file_scope
815 && scope != external_scope)
816 warning (OPT_Wunused_variable, "unused variable %q+D", p);
818 if (b->inner_comp)
820 error ("type of array %q+D completed incompatibly with"
821 " implicit initialization", p);
824 /* Fall through. */
825 case TYPE_DECL:
826 case CONST_DECL:
827 common_symbol:
828 /* All of these go in BLOCK_VARS, but only if this is the
829 binding in the home scope. */
830 if (!b->nested)
832 TREE_CHAIN (p) = BLOCK_VARS (block);
833 BLOCK_VARS (block) = p;
835 /* If this is the file scope, and we are processing more
836 than one translation unit in this compilation, set
837 DECL_CONTEXT of each decl to the TRANSLATION_UNIT_DECL.
838 This makes same_translation_unit_p work, and causes
839 static declarations to be given disambiguating suffixes. */
840 if (scope == file_scope && num_in_fnames > 1)
842 DECL_CONTEXT (p) = context;
843 if (TREE_CODE (p) == TYPE_DECL)
844 set_type_context (TREE_TYPE (p), context);
847 /* Fall through. */
848 /* Parameters go in DECL_ARGUMENTS, not BLOCK_VARS, and have
849 already been put there by store_parm_decls. Unused-
850 parameter warnings are handled by function.c.
851 error_mark_node obviously does not go in BLOCK_VARS and
852 does not get unused-variable warnings. */
853 case PARM_DECL:
854 case ERROR_MARK:
855 /* It is possible for a decl not to have a name. We get
856 here with b->id NULL in this case. */
857 if (b->id)
859 gcc_assert (I_SYMBOL_BINDING (b->id) == b);
860 I_SYMBOL_BINDING (b->id) = b->shadowed;
861 if (b->shadowed && b->shadowed->type)
862 TREE_TYPE (b->shadowed->decl) = b->shadowed->type;
864 break;
866 default:
867 gcc_unreachable ();
872 /* Dispose of the block that we just made inside some higher level. */
873 if ((scope->function_body || scope == file_scope) && context)
875 DECL_INITIAL (context) = block;
876 BLOCK_SUPERCONTEXT (block) = context;
878 else if (scope->outer)
880 if (block)
881 SCOPE_LIST_APPEND (scope->outer, blocks, block);
882 /* If we did not make a block for the scope just exited, any
883 blocks made for inner scopes must be carried forward so they
884 will later become subblocks of something else. */
885 else if (scope->blocks)
886 SCOPE_LIST_CONCAT (scope->outer, blocks, scope, blocks);
889 /* Pop the current scope, and free the structure for reuse. */
890 current_scope = scope->outer;
891 if (scope->function_body)
892 current_function_scope = scope->outer_function;
894 memset (scope, 0, sizeof (struct c_scope));
895 scope->outer = scope_freelist;
896 scope_freelist = scope;
898 return block;
901 void
902 push_file_scope (void)
904 tree decl;
906 if (file_scope)
907 return;
909 push_scope ();
910 file_scope = current_scope;
912 start_fname_decls ();
914 for (decl = visible_builtins; decl; decl = TREE_CHAIN (decl))
915 bind (DECL_NAME (decl), decl, file_scope,
916 /*invisible=*/false, /*nested=*/true);
919 void
920 pop_file_scope (void)
922 /* In case there were missing closebraces, get us back to the global
923 binding level. */
924 while (current_scope != file_scope)
925 pop_scope ();
927 /* __FUNCTION__ is defined at file scope (""). This
928 call may not be necessary as my tests indicate it
929 still works without it. */
930 finish_fname_decls ();
932 /* This is the point to write out a PCH if we're doing that.
933 In that case we do not want to do anything else. */
934 if (pch_file)
936 c_common_write_pch ();
937 return;
940 /* Pop off the file scope and close this translation unit. */
941 pop_scope ();
942 file_scope = 0;
944 maybe_apply_pending_pragma_weaks ();
945 cgraph_finalize_compilation_unit ();
948 /* Insert BLOCK at the end of the list of subblocks of the current
949 scope. This is used when a BIND_EXPR is expanded, to handle the
950 BLOCK node inside the BIND_EXPR. */
952 void
953 insert_block (tree block)
955 TREE_USED (block) = 1;
956 SCOPE_LIST_APPEND (current_scope, blocks, block);
959 /* Push a definition or a declaration of struct, union or enum tag "name".
960 "type" should be the type node.
961 We assume that the tag "name" is not already defined.
963 Note that the definition may really be just a forward reference.
964 In that case, the TYPE_SIZE will be zero. */
966 static void
967 pushtag (tree name, tree type)
969 /* Record the identifier as the type's name if it has none. */
970 if (name && !TYPE_NAME (type))
971 TYPE_NAME (type) = name;
972 bind (name, type, current_scope, /*invisible=*/false, /*nested=*/false);
974 /* Create a fake NULL-named TYPE_DECL node whose TREE_TYPE will be the
975 tagged type we just added to the current scope. This fake
976 NULL-named TYPE_DECL node helps dwarfout.c to know when it needs
977 to output a representation of a tagged type, and it also gives
978 us a convenient place to record the "scope start" address for the
979 tagged type. */
981 TYPE_STUB_DECL (type) = pushdecl (build_decl (TYPE_DECL, NULL_TREE, type));
983 /* An approximation for now, so we can tell this is a function-scope tag.
984 This will be updated in pop_scope. */
985 TYPE_CONTEXT (type) = DECL_CONTEXT (TYPE_STUB_DECL (type));
988 /* Subroutine of compare_decls. Allow harmless mismatches in return
989 and argument types provided that the type modes match. This function
990 return a unified type given a suitable match, and 0 otherwise. */
992 static tree
993 match_builtin_function_types (tree newtype, tree oldtype)
995 tree newrettype, oldrettype;
996 tree newargs, oldargs;
997 tree trytype, tryargs;
999 /* Accept the return type of the new declaration if same modes. */
1000 oldrettype = TREE_TYPE (oldtype);
1001 newrettype = TREE_TYPE (newtype);
1003 if (TYPE_MODE (oldrettype) != TYPE_MODE (newrettype))
1004 return 0;
1006 oldargs = TYPE_ARG_TYPES (oldtype);
1007 newargs = TYPE_ARG_TYPES (newtype);
1008 tryargs = newargs;
1010 while (oldargs || newargs)
1012 if (!oldargs
1013 || !newargs
1014 || !TREE_VALUE (oldargs)
1015 || !TREE_VALUE (newargs)
1016 || TYPE_MODE (TREE_VALUE (oldargs))
1017 != TYPE_MODE (TREE_VALUE (newargs)))
1018 return 0;
1020 oldargs = TREE_CHAIN (oldargs);
1021 newargs = TREE_CHAIN (newargs);
1024 trytype = build_function_type (newrettype, tryargs);
1025 return build_type_attribute_variant (trytype, TYPE_ATTRIBUTES (oldtype));
1028 /* Subroutine of diagnose_mismatched_decls. Check for function type
1029 mismatch involving an empty arglist vs a nonempty one and give clearer
1030 diagnostics. */
1031 static void
1032 diagnose_arglist_conflict (tree newdecl, tree olddecl,
1033 tree newtype, tree oldtype)
1035 tree t;
1037 if (TREE_CODE (olddecl) != FUNCTION_DECL
1038 || !comptypes (TREE_TYPE (oldtype), TREE_TYPE (newtype))
1039 || !((TYPE_ARG_TYPES (oldtype) == 0 && DECL_INITIAL (olddecl) == 0)
1041 (TYPE_ARG_TYPES (newtype) == 0 && DECL_INITIAL (newdecl) == 0)))
1042 return;
1044 t = TYPE_ARG_TYPES (oldtype);
1045 if (t == 0)
1046 t = TYPE_ARG_TYPES (newtype);
1047 for (; t; t = TREE_CHAIN (t))
1049 tree type = TREE_VALUE (t);
1051 if (TREE_CHAIN (t) == 0
1052 && TYPE_MAIN_VARIANT (type) != void_type_node)
1054 inform ("a parameter list with an ellipsis can%'t match "
1055 "an empty parameter name list declaration");
1056 break;
1059 if (c_type_promotes_to (type) != type)
1061 inform ("an argument type that has a default promotion can%'t match "
1062 "an empty parameter name list declaration");
1063 break;
1068 /* Another subroutine of diagnose_mismatched_decls. OLDDECL is an
1069 old-style function definition, NEWDECL is a prototype declaration.
1070 Diagnose inconsistencies in the argument list. Returns TRUE if
1071 the prototype is compatible, FALSE if not. */
1072 static bool
1073 validate_proto_after_old_defn (tree newdecl, tree newtype, tree oldtype)
1075 tree newargs, oldargs;
1076 int i;
1078 #define END_OF_ARGLIST(t) ((t) == void_type_node)
1080 oldargs = TYPE_ACTUAL_ARG_TYPES (oldtype);
1081 newargs = TYPE_ARG_TYPES (newtype);
1082 i = 1;
1084 for (;;)
1086 tree oldargtype = TYPE_MAIN_VARIANT (TREE_VALUE (oldargs));
1087 tree newargtype = TYPE_MAIN_VARIANT (TREE_VALUE (newargs));
1089 if (END_OF_ARGLIST (oldargtype) && END_OF_ARGLIST (newargtype))
1090 break;
1092 /* Reaching the end of just one list means the two decls don't
1093 agree on the number of arguments. */
1094 if (END_OF_ARGLIST (oldargtype))
1096 error ("prototype for %q+D declares more arguments "
1097 "than previous old-style definition", newdecl);
1098 return false;
1100 else if (END_OF_ARGLIST (newargtype))
1102 error ("prototype for %q+D declares fewer arguments "
1103 "than previous old-style definition", newdecl);
1104 return false;
1107 /* Type for passing arg must be consistent with that declared
1108 for the arg. */
1109 else if (!comptypes (oldargtype, newargtype))
1111 error ("prototype for %q+D declares argument %d"
1112 " with incompatible type",
1113 newdecl, i);
1114 return false;
1117 oldargs = TREE_CHAIN (oldargs);
1118 newargs = TREE_CHAIN (newargs);
1119 i++;
1122 /* If we get here, no errors were found, but do issue a warning
1123 for this poor-style construct. */
1124 warning (0, "prototype for %q+D follows non-prototype definition",
1125 newdecl);
1126 return true;
1127 #undef END_OF_ARGLIST
1130 /* Subroutine of diagnose_mismatched_decls. Report the location of DECL,
1131 first in a pair of mismatched declarations, using the diagnostic
1132 function DIAG. */
1133 static void
1134 locate_old_decl (tree decl, void (*diag)(const char *, ...) ATTRIBUTE_GCC_CDIAG(1,2))
1136 if (TREE_CODE (decl) == FUNCTION_DECL && DECL_BUILT_IN (decl))
1138 else if (DECL_INITIAL (decl))
1139 diag (G_("previous definition of %q+D was here"), decl);
1140 else if (C_DECL_IMPLICIT (decl))
1141 diag (G_("previous implicit declaration of %q+D was here"), decl);
1142 else
1143 diag (G_("previous declaration of %q+D was here"), decl);
1146 /* Subroutine of duplicate_decls. Compare NEWDECL to OLDDECL.
1147 Returns true if the caller should proceed to merge the two, false
1148 if OLDDECL should simply be discarded. As a side effect, issues
1149 all necessary diagnostics for invalid or poor-style combinations.
1150 If it returns true, writes the types of NEWDECL and OLDDECL to
1151 *NEWTYPEP and *OLDTYPEP - these may have been adjusted from
1152 TREE_TYPE (NEWDECL, OLDDECL) respectively. */
1154 static bool
1155 diagnose_mismatched_decls (tree newdecl, tree olddecl,
1156 tree *newtypep, tree *oldtypep)
1158 tree newtype, oldtype;
1159 bool pedwarned = false;
1160 bool warned = false;
1161 bool retval = true;
1163 #define DECL_EXTERN_INLINE(DECL) (DECL_DECLARED_INLINE_P (DECL) \
1164 && DECL_EXTERNAL (DECL))
1166 /* If we have error_mark_node for either decl or type, just discard
1167 the previous decl - we're in an error cascade already. */
1168 if (olddecl == error_mark_node || newdecl == error_mark_node)
1169 return false;
1170 *oldtypep = oldtype = TREE_TYPE (olddecl);
1171 *newtypep = newtype = TREE_TYPE (newdecl);
1172 if (oldtype == error_mark_node || newtype == error_mark_node)
1173 return false;
1175 /* Two different categories of symbol altogether. This is an error
1176 unless OLDDECL is a builtin. OLDDECL will be discarded in any case. */
1177 if (TREE_CODE (olddecl) != TREE_CODE (newdecl))
1179 if (!(TREE_CODE (olddecl) == FUNCTION_DECL
1180 && DECL_BUILT_IN (olddecl)
1181 && !C_DECL_DECLARED_BUILTIN (olddecl)))
1183 error ("%q+D redeclared as different kind of symbol", newdecl);
1184 locate_old_decl (olddecl, error);
1186 else if (TREE_PUBLIC (newdecl))
1187 warning (0, "built-in function %q+D declared as non-function",
1188 newdecl);
1189 else
1190 warning (OPT_Wshadow, "declaration of %q+D shadows "
1191 "a built-in function", newdecl);
1192 return false;
1195 /* Enumerators have no linkage, so may only be declared once in a
1196 given scope. */
1197 if (TREE_CODE (olddecl) == CONST_DECL)
1199 error ("redeclaration of enumerator %q+D", newdecl);
1200 locate_old_decl (olddecl, error);
1201 return false;
1204 if (!comptypes (oldtype, newtype))
1206 if (TREE_CODE (olddecl) == FUNCTION_DECL
1207 && DECL_BUILT_IN (olddecl) && !C_DECL_DECLARED_BUILTIN (olddecl))
1209 /* Accept harmless mismatch in function types.
1210 This is for the ffs and fprintf builtins. */
1211 tree trytype = match_builtin_function_types (newtype, oldtype);
1213 if (trytype && comptypes (newtype, trytype))
1214 *oldtypep = oldtype = trytype;
1215 else
1217 /* If types don't match for a built-in, throw away the
1218 built-in. No point in calling locate_old_decl here, it
1219 won't print anything. */
1220 warning (0, "conflicting types for built-in function %q+D",
1221 newdecl);
1222 return false;
1225 else if (TREE_CODE (olddecl) == FUNCTION_DECL
1226 && DECL_IS_BUILTIN (olddecl))
1228 /* A conflicting function declaration for a predeclared
1229 function that isn't actually built in. Objective C uses
1230 these. The new declaration silently overrides everything
1231 but the volatility (i.e. noreturn) indication. See also
1232 below. FIXME: Make Objective C use normal builtins. */
1233 TREE_THIS_VOLATILE (newdecl) |= TREE_THIS_VOLATILE (olddecl);
1234 return false;
1236 /* Permit void foo (...) to match int foo (...) if the latter is
1237 the definition and implicit int was used. See
1238 c-torture/compile/920625-2.c. */
1239 else if (TREE_CODE (newdecl) == FUNCTION_DECL && DECL_INITIAL (newdecl)
1240 && TYPE_MAIN_VARIANT (TREE_TYPE (oldtype)) == void_type_node
1241 && TYPE_MAIN_VARIANT (TREE_TYPE (newtype)) == integer_type_node
1242 && C_FUNCTION_IMPLICIT_INT (newdecl) && !DECL_INITIAL (olddecl))
1244 pedwarn ("conflicting types for %q+D", newdecl);
1245 /* Make sure we keep void as the return type. */
1246 TREE_TYPE (newdecl) = *newtypep = newtype = oldtype;
1247 C_FUNCTION_IMPLICIT_INT (newdecl) = 0;
1248 pedwarned = true;
1250 /* Permit void foo (...) to match an earlier call to foo (...) with
1251 no declared type (thus, implicitly int). */
1252 else if (TREE_CODE (newdecl) == FUNCTION_DECL
1253 && TYPE_MAIN_VARIANT (TREE_TYPE (newtype)) == void_type_node
1254 && TYPE_MAIN_VARIANT (TREE_TYPE (oldtype)) == integer_type_node
1255 && C_DECL_IMPLICIT (olddecl) && !DECL_INITIAL (olddecl))
1257 pedwarn ("conflicting types for %q+D", newdecl);
1258 /* Make sure we keep void as the return type. */
1259 TREE_TYPE (olddecl) = *oldtypep = oldtype = newtype;
1260 pedwarned = true;
1262 else
1264 if (TYPE_QUALS (newtype) != TYPE_QUALS (oldtype))
1265 error ("conflicting type qualifiers for %q+D", newdecl);
1266 else
1267 error ("conflicting types for %q+D", newdecl);
1268 diagnose_arglist_conflict (newdecl, olddecl, newtype, oldtype);
1269 locate_old_decl (olddecl, error);
1270 return false;
1274 /* Redeclaration of a type is a constraint violation (6.7.2.3p1),
1275 but silently ignore the redeclaration if either is in a system
1276 header. (Conflicting redeclarations were handled above.) */
1277 if (TREE_CODE (newdecl) == TYPE_DECL)
1279 if (DECL_IN_SYSTEM_HEADER (newdecl) || DECL_IN_SYSTEM_HEADER (olddecl))
1280 return true; /* Allow OLDDECL to continue in use. */
1282 error ("redefinition of typedef %q+D", newdecl);
1283 locate_old_decl (olddecl, error);
1284 return false;
1287 /* Function declarations can either be 'static' or 'extern' (no
1288 qualifier is equivalent to 'extern' - C99 6.2.2p5) and therefore
1289 can never conflict with each other on account of linkage (6.2.2p4).
1290 Multiple definitions are not allowed (6.9p3,5) but GCC permits
1291 two definitions if one is 'extern inline' and one is not. The non-
1292 extern-inline definition supersedes the extern-inline definition. */
1294 else if (TREE_CODE (newdecl) == FUNCTION_DECL)
1296 /* If you declare a built-in function name as static, or
1297 define the built-in with an old-style definition (so we
1298 can't validate the argument list) the built-in definition is
1299 overridden, but optionally warn this was a bad choice of name. */
1300 if (DECL_BUILT_IN (olddecl)
1301 && !C_DECL_DECLARED_BUILTIN (olddecl)
1302 && (!TREE_PUBLIC (newdecl)
1303 || (DECL_INITIAL (newdecl)
1304 && !TYPE_ARG_TYPES (TREE_TYPE (newdecl)))))
1306 warning (OPT_Wshadow, "declaration of %q+D shadows "
1307 "a built-in function", newdecl);
1308 /* Discard the old built-in function. */
1309 return false;
1312 if (DECL_INITIAL (newdecl))
1314 if (DECL_INITIAL (olddecl))
1316 /* If both decls are in the same TU and the new declaration
1317 isn't overriding an extern inline reject the new decl.
1318 When we handle c99 style inline rules we'll want to reject
1319 the following:
1321 DECL_EXTERN_INLINE (olddecl)
1322 && !DECL_EXTERN_INLINE (newdecl)
1324 if they're in the same translation unit. Until we implement
1325 the full semantics we accept the construct. */
1326 if (!(DECL_EXTERN_INLINE (olddecl)
1327 && !DECL_EXTERN_INLINE (newdecl))
1328 && same_translation_unit_p (newdecl, olddecl))
1330 error ("redefinition of %q+D", newdecl);
1331 locate_old_decl (olddecl, error);
1332 return false;
1336 /* If we have a prototype after an old-style function definition,
1337 the argument types must be checked specially. */
1338 else if (DECL_INITIAL (olddecl)
1339 && !TYPE_ARG_TYPES (oldtype) && TYPE_ARG_TYPES (newtype)
1340 && TYPE_ACTUAL_ARG_TYPES (oldtype)
1341 && !validate_proto_after_old_defn (newdecl, newtype, oldtype))
1343 locate_old_decl (olddecl, error);
1344 return false;
1346 /* A non-static declaration (even an "extern") followed by a
1347 static declaration is undefined behavior per C99 6.2.2p3-5,7.
1348 The same is true for a static forward declaration at block
1349 scope followed by a non-static declaration/definition at file
1350 scope. Static followed by non-static at the same scope is
1351 not undefined behavior, and is the most convenient way to get
1352 some effects (see e.g. what unwind-dw2-fde-glibc.c does to
1353 the definition of _Unwind_Find_FDE in unwind-dw2-fde.c), but
1354 we do diagnose it if -Wtraditional. */
1355 if (TREE_PUBLIC (olddecl) && !TREE_PUBLIC (newdecl))
1357 /* Two exceptions to the rule. If olddecl is an extern
1358 inline, or a predeclared function that isn't actually
1359 built in, newdecl silently overrides olddecl. The latter
1360 occur only in Objective C; see also above. (FIXME: Make
1361 Objective C use normal builtins.) */
1362 if (!DECL_IS_BUILTIN (olddecl)
1363 && !DECL_EXTERN_INLINE (olddecl))
1365 error ("static declaration of %q+D follows "
1366 "non-static declaration", newdecl);
1367 locate_old_decl (olddecl, error);
1369 return false;
1371 else if (TREE_PUBLIC (newdecl) && !TREE_PUBLIC (olddecl))
1373 if (DECL_CONTEXT (olddecl))
1375 error ("non-static declaration of %q+D follows "
1376 "static declaration", newdecl);
1377 locate_old_decl (olddecl, error);
1378 return false;
1380 else if (warn_traditional)
1382 warning (OPT_Wtraditional, "non-static declaration of %q+D "
1383 "follows static declaration", newdecl);
1384 warned = true;
1388 else if (TREE_CODE (newdecl) == VAR_DECL)
1390 /* Only variables can be thread-local, and all declarations must
1391 agree on this property. */
1392 if (C_DECL_THREADPRIVATE_P (olddecl) && !DECL_THREAD_LOCAL_P (newdecl))
1394 /* Nothing to check. Since OLDDECL is marked threadprivate
1395 and NEWDECL does not have a thread-local attribute, we
1396 will merge the threadprivate attribute into NEWDECL. */
1399 else if (DECL_THREAD_LOCAL_P (newdecl) != DECL_THREAD_LOCAL_P (olddecl))
1401 if (DECL_THREAD_LOCAL_P (newdecl))
1402 error ("thread-local declaration of %q+D follows "
1403 "non-thread-local declaration", newdecl);
1404 else
1405 error ("non-thread-local declaration of %q+D follows "
1406 "thread-local declaration", newdecl);
1408 locate_old_decl (olddecl, error);
1409 return false;
1412 /* Multiple initialized definitions are not allowed (6.9p3,5). */
1413 if (DECL_INITIAL (newdecl) && DECL_INITIAL (olddecl))
1415 error ("redefinition of %q+D", newdecl);
1416 locate_old_decl (olddecl, error);
1417 return false;
1420 /* Objects declared at file scope: if the first declaration had
1421 external linkage (even if it was an external reference) the
1422 second must have external linkage as well, or the behavior is
1423 undefined. If the first declaration had internal linkage, then
1424 the second must too, or else be an external reference (in which
1425 case the composite declaration still has internal linkage).
1426 As for function declarations, we warn about the static-then-
1427 extern case only for -Wtraditional. See generally 6.2.2p3-5,7. */
1428 if (DECL_FILE_SCOPE_P (newdecl)
1429 && TREE_PUBLIC (newdecl) != TREE_PUBLIC (olddecl))
1431 if (DECL_EXTERNAL (newdecl))
1433 if (!DECL_FILE_SCOPE_P (olddecl))
1435 error ("extern declaration of %q+D follows "
1436 "declaration with no linkage", newdecl);
1437 locate_old_decl (olddecl, error);
1438 return false;
1440 else if (warn_traditional)
1442 warning (OPT_Wtraditional, "non-static declaration of %q+D "
1443 "follows static declaration", newdecl);
1444 warned = true;
1447 else
1449 if (TREE_PUBLIC (newdecl))
1450 error ("non-static declaration of %q+D follows "
1451 "static declaration", newdecl);
1452 else
1453 error ("static declaration of %q+D follows "
1454 "non-static declaration", newdecl);
1456 locate_old_decl (olddecl, error);
1457 return false;
1460 /* Two objects with the same name declared at the same block
1461 scope must both be external references (6.7p3). */
1462 else if (!DECL_FILE_SCOPE_P (newdecl))
1464 if (DECL_EXTERNAL (newdecl))
1466 /* Extern with initializer at block scope, which will
1467 already have received an error. */
1469 else if (DECL_EXTERNAL (olddecl))
1471 error ("declaration of %q+D with no linkage follows "
1472 "extern declaration", newdecl);
1473 locate_old_decl (olddecl, error);
1475 else
1477 error ("redeclaration of %q+D with no linkage", newdecl);
1478 locate_old_decl (olddecl, error);
1481 return false;
1485 /* warnings */
1486 /* All decls must agree on a visibility. */
1487 if (CODE_CONTAINS_STRUCT (TREE_CODE (newdecl), TS_DECL_WITH_VIS)
1488 && DECL_VISIBILITY_SPECIFIED (newdecl) && DECL_VISIBILITY_SPECIFIED (olddecl)
1489 && DECL_VISIBILITY (newdecl) != DECL_VISIBILITY (olddecl))
1491 warning (0, "redeclaration of %q+D with different visibility "
1492 "(old visibility preserved)", newdecl);
1493 warned = true;
1496 if (TREE_CODE (newdecl) == FUNCTION_DECL)
1498 /* Diagnose inline __attribute__ ((noinline)) which is silly. */
1499 if (DECL_DECLARED_INLINE_P (newdecl)
1500 && lookup_attribute ("noinline", DECL_ATTRIBUTES (olddecl)))
1502 warning (OPT_Wattributes, "inline declaration of %qD follows "
1503 "declaration with attribute noinline", newdecl);
1504 warned = true;
1506 else if (DECL_DECLARED_INLINE_P (olddecl)
1507 && lookup_attribute ("noinline", DECL_ATTRIBUTES (newdecl)))
1509 warning (OPT_Wattributes, "declaration of %q+D with attribute "
1510 "noinline follows inline declaration ", newdecl);
1511 warned = true;
1514 /* Inline declaration after use or definition.
1515 ??? Should we still warn about this now we have unit-at-a-time
1516 mode and can get it right?
1517 Definitely don't complain if the decls are in different translation
1518 units. */
1519 if (DECL_DECLARED_INLINE_P (newdecl) && !DECL_DECLARED_INLINE_P (olddecl)
1520 && same_translation_unit_p (olddecl, newdecl))
1522 if (TREE_USED (olddecl))
1524 warning (0, "%q+D declared inline after being called", olddecl);
1525 warned = true;
1527 else if (DECL_INITIAL (olddecl))
1529 warning (0, "%q+D declared inline after its definition", olddecl);
1530 warned = true;
1534 else /* PARM_DECL, VAR_DECL */
1536 /* Redeclaration of a parameter is a constraint violation (this is
1537 not explicitly stated, but follows from C99 6.7p3 [no more than
1538 one declaration of the same identifier with no linkage in the
1539 same scope, except type tags] and 6.2.2p6 [parameters have no
1540 linkage]). We must check for a forward parameter declaration,
1541 indicated by TREE_ASM_WRITTEN on the old declaration - this is
1542 an extension, the mandatory diagnostic for which is handled by
1543 mark_forward_parm_decls. */
1545 if (TREE_CODE (newdecl) == PARM_DECL
1546 && (!TREE_ASM_WRITTEN (olddecl) || TREE_ASM_WRITTEN (newdecl)))
1548 error ("redefinition of parameter %q+D", newdecl);
1549 locate_old_decl (olddecl, error);
1550 return false;
1554 /* Optional warning for completely redundant decls. */
1555 if (!warned && !pedwarned
1556 && warn_redundant_decls
1557 /* Don't warn about a function declaration followed by a
1558 definition. */
1559 && !(TREE_CODE (newdecl) == FUNCTION_DECL
1560 && DECL_INITIAL (newdecl) && !DECL_INITIAL (olddecl))
1561 /* Don't warn about redundant redeclarations of builtins. */
1562 && !(TREE_CODE (newdecl) == FUNCTION_DECL
1563 && !DECL_BUILT_IN (newdecl)
1564 && DECL_BUILT_IN (olddecl)
1565 && !C_DECL_DECLARED_BUILTIN (olddecl))
1566 /* Don't warn about an extern followed by a definition. */
1567 && !(DECL_EXTERNAL (olddecl) && !DECL_EXTERNAL (newdecl))
1568 /* Don't warn about forward parameter decls. */
1569 && !(TREE_CODE (newdecl) == PARM_DECL
1570 && TREE_ASM_WRITTEN (olddecl) && !TREE_ASM_WRITTEN (newdecl))
1571 /* Don't warn about a variable definition following a declaration. */
1572 && !(TREE_CODE (newdecl) == VAR_DECL
1573 && DECL_INITIAL (newdecl) && !DECL_INITIAL (olddecl)))
1575 warning (OPT_Wredundant_decls, "redundant redeclaration of %q+D",
1576 newdecl);
1577 warned = true;
1580 /* Report location of previous decl/defn in a consistent manner. */
1581 if (warned || pedwarned)
1582 locate_old_decl (olddecl, pedwarned ? pedwarn : warning0);
1584 #undef DECL_EXTERN_INLINE
1586 return retval;
1589 /* Subroutine of duplicate_decls. NEWDECL has been found to be
1590 consistent with OLDDECL, but carries new information. Merge the
1591 new information into OLDDECL. This function issues no
1592 diagnostics. */
1594 static void
1595 merge_decls (tree newdecl, tree olddecl, tree newtype, tree oldtype)
1597 int new_is_definition = (TREE_CODE (newdecl) == FUNCTION_DECL
1598 && DECL_INITIAL (newdecl) != 0);
1599 int new_is_prototype = (TREE_CODE (newdecl) == FUNCTION_DECL
1600 && TYPE_ARG_TYPES (TREE_TYPE (newdecl)) != 0);
1601 int old_is_prototype = (TREE_CODE (olddecl) == FUNCTION_DECL
1602 && TYPE_ARG_TYPES (TREE_TYPE (olddecl)) != 0);
1604 /* For real parm decl following a forward decl, rechain the old decl
1605 in its new location and clear TREE_ASM_WRITTEN (it's not a
1606 forward decl anymore). */
1607 if (TREE_CODE (newdecl) == PARM_DECL
1608 && TREE_ASM_WRITTEN (olddecl) && !TREE_ASM_WRITTEN (newdecl))
1610 struct c_binding *b, **here;
1612 for (here = &current_scope->bindings; *here; here = &(*here)->prev)
1613 if ((*here)->decl == olddecl)
1614 goto found;
1615 gcc_unreachable ();
1617 found:
1618 b = *here;
1619 *here = b->prev;
1620 b->prev = current_scope->bindings;
1621 current_scope->bindings = b;
1623 TREE_ASM_WRITTEN (olddecl) = 0;
1626 DECL_ATTRIBUTES (newdecl)
1627 = targetm.merge_decl_attributes (olddecl, newdecl);
1629 /* Merge the data types specified in the two decls. */
1630 TREE_TYPE (newdecl)
1631 = TREE_TYPE (olddecl)
1632 = composite_type (newtype, oldtype);
1634 /* Lay the type out, unless already done. */
1635 if (!comptypes (oldtype, TREE_TYPE (newdecl)))
1637 if (TREE_TYPE (newdecl) != error_mark_node)
1638 layout_type (TREE_TYPE (newdecl));
1639 if (TREE_CODE (newdecl) != FUNCTION_DECL
1640 && TREE_CODE (newdecl) != TYPE_DECL
1641 && TREE_CODE (newdecl) != CONST_DECL)
1642 layout_decl (newdecl, 0);
1644 else
1646 /* Since the type is OLDDECL's, make OLDDECL's size go with. */
1647 DECL_SIZE (newdecl) = DECL_SIZE (olddecl);
1648 DECL_SIZE_UNIT (newdecl) = DECL_SIZE_UNIT (olddecl);
1649 DECL_MODE (newdecl) = DECL_MODE (olddecl);
1650 if (TREE_CODE (olddecl) != FUNCTION_DECL)
1651 if (DECL_ALIGN (olddecl) > DECL_ALIGN (newdecl))
1653 DECL_ALIGN (newdecl) = DECL_ALIGN (olddecl);
1654 DECL_USER_ALIGN (newdecl) |= DECL_ALIGN (olddecl);
1659 /* Merge the type qualifiers. */
1660 if (TREE_READONLY (newdecl))
1661 TREE_READONLY (olddecl) = 1;
1663 if (TREE_THIS_VOLATILE (newdecl))
1665 TREE_THIS_VOLATILE (olddecl) = 1;
1666 if (TREE_CODE (newdecl) == VAR_DECL)
1667 make_var_volatile (newdecl);
1670 /* Merge deprecatedness. */
1671 if (TREE_DEPRECATED (newdecl))
1672 TREE_DEPRECATED (olddecl) = 1;
1674 /* Keep source location of definition rather than declaration and of
1675 prototype rather than non-prototype unless that prototype is
1676 built-in. */
1677 if ((DECL_INITIAL (newdecl) == 0 && DECL_INITIAL (olddecl) != 0)
1678 || (old_is_prototype && !new_is_prototype
1679 && !C_DECL_BUILTIN_PROTOTYPE (olddecl)))
1680 DECL_SOURCE_LOCATION (newdecl) = DECL_SOURCE_LOCATION (olddecl);
1682 /* Merge the initialization information. */
1683 if (DECL_INITIAL (newdecl) == 0)
1684 DECL_INITIAL (newdecl) = DECL_INITIAL (olddecl);
1686 /* Merge the threadprivate attribute. */
1687 if (TREE_CODE (olddecl) == VAR_DECL && C_DECL_THREADPRIVATE_P (olddecl))
1689 DECL_TLS_MODEL (newdecl) = DECL_TLS_MODEL (olddecl);
1690 C_DECL_THREADPRIVATE_P (newdecl) = 1;
1693 if (CODE_CONTAINS_STRUCT (TREE_CODE (olddecl), TS_DECL_WITH_VIS))
1695 /* Merge the unused-warning information. */
1696 if (DECL_IN_SYSTEM_HEADER (olddecl))
1697 DECL_IN_SYSTEM_HEADER (newdecl) = 1;
1698 else if (DECL_IN_SYSTEM_HEADER (newdecl))
1699 DECL_IN_SYSTEM_HEADER (olddecl) = 1;
1701 /* Merge the section attribute.
1702 We want to issue an error if the sections conflict but that
1703 must be done later in decl_attributes since we are called
1704 before attributes are assigned. */
1705 if (DECL_SECTION_NAME (newdecl) == NULL_TREE)
1706 DECL_SECTION_NAME (newdecl) = DECL_SECTION_NAME (olddecl);
1708 /* Copy the assembler name.
1709 Currently, it can only be defined in the prototype. */
1710 COPY_DECL_ASSEMBLER_NAME (olddecl, newdecl);
1712 /* Use visibility of whichever declaration had it specified */
1713 if (DECL_VISIBILITY_SPECIFIED (olddecl))
1715 DECL_VISIBILITY (newdecl) = DECL_VISIBILITY (olddecl);
1716 DECL_VISIBILITY_SPECIFIED (newdecl) = 1;
1719 if (TREE_CODE (newdecl) == FUNCTION_DECL)
1721 DECL_STATIC_CONSTRUCTOR(newdecl) |= DECL_STATIC_CONSTRUCTOR(olddecl);
1722 DECL_STATIC_DESTRUCTOR (newdecl) |= DECL_STATIC_DESTRUCTOR (olddecl);
1723 DECL_NO_LIMIT_STACK (newdecl) |= DECL_NO_LIMIT_STACK (olddecl);
1724 DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (newdecl)
1725 |= DECL_NO_INSTRUMENT_FUNCTION_ENTRY_EXIT (olddecl);
1726 TREE_THIS_VOLATILE (newdecl) |= TREE_THIS_VOLATILE (olddecl);
1727 TREE_READONLY (newdecl) |= TREE_READONLY (olddecl);
1728 DECL_IS_MALLOC (newdecl) |= DECL_IS_MALLOC (olddecl);
1729 DECL_IS_PURE (newdecl) |= DECL_IS_PURE (olddecl);
1730 DECL_IS_NOVOPS (newdecl) |= DECL_IS_NOVOPS (olddecl);
1733 /* Merge the storage class information. */
1734 merge_weak (newdecl, olddecl);
1736 /* For functions, static overrides non-static. */
1737 if (TREE_CODE (newdecl) == FUNCTION_DECL)
1739 TREE_PUBLIC (newdecl) &= TREE_PUBLIC (olddecl);
1740 /* This is since we don't automatically
1741 copy the attributes of NEWDECL into OLDDECL. */
1742 TREE_PUBLIC (olddecl) = TREE_PUBLIC (newdecl);
1743 /* If this clears `static', clear it in the identifier too. */
1744 if (!TREE_PUBLIC (olddecl))
1745 TREE_PUBLIC (DECL_NAME (olddecl)) = 0;
1749 if (DECL_EXTERNAL (newdecl))
1751 TREE_STATIC (newdecl) = TREE_STATIC (olddecl);
1752 DECL_EXTERNAL (newdecl) = DECL_EXTERNAL (olddecl);
1754 /* An extern decl does not override previous storage class. */
1755 TREE_PUBLIC (newdecl) = TREE_PUBLIC (olddecl);
1756 if (!DECL_EXTERNAL (newdecl))
1758 DECL_CONTEXT (newdecl) = DECL_CONTEXT (olddecl);
1759 DECL_COMMON (newdecl) = DECL_COMMON (olddecl);
1762 else
1764 TREE_STATIC (olddecl) = TREE_STATIC (newdecl);
1765 TREE_PUBLIC (olddecl) = TREE_PUBLIC (newdecl);
1768 if (TREE_CODE (newdecl) == FUNCTION_DECL)
1770 /* If we're redefining a function previously defined as extern
1771 inline, make sure we emit debug info for the inline before we
1772 throw it away, in case it was inlined into a function that
1773 hasn't been written out yet. */
1774 if (new_is_definition && DECL_INITIAL (olddecl))
1776 if (TREE_USED (olddecl)
1777 /* In unit-at-a-time mode we never inline re-defined extern
1778 inline functions. */
1779 && !flag_unit_at_a_time
1780 && cgraph_function_possibly_inlined_p (olddecl))
1781 (*debug_hooks->outlining_inline_function) (olddecl);
1783 /* The new defn must not be inline. */
1784 DECL_INLINE (newdecl) = 0;
1785 DECL_UNINLINABLE (newdecl) = 1;
1787 else
1789 /* If either decl says `inline', this fn is inline, unless
1790 its definition was passed already. */
1791 if (DECL_DECLARED_INLINE_P (newdecl)
1792 || DECL_DECLARED_INLINE_P (olddecl))
1793 DECL_DECLARED_INLINE_P (newdecl) = 1;
1795 DECL_UNINLINABLE (newdecl) = DECL_UNINLINABLE (olddecl)
1796 = (DECL_UNINLINABLE (newdecl) || DECL_UNINLINABLE (olddecl));
1799 if (DECL_BUILT_IN (olddecl))
1801 /* If redeclaring a builtin function, it stays built in.
1802 But it gets tagged as having been declared. */
1803 DECL_BUILT_IN_CLASS (newdecl) = DECL_BUILT_IN_CLASS (olddecl);
1804 DECL_FUNCTION_CODE (newdecl) = DECL_FUNCTION_CODE (olddecl);
1805 C_DECL_DECLARED_BUILTIN (newdecl) = 1;
1806 if (new_is_prototype)
1807 C_DECL_BUILTIN_PROTOTYPE (newdecl) = 0;
1808 else
1809 C_DECL_BUILTIN_PROTOTYPE (newdecl)
1810 = C_DECL_BUILTIN_PROTOTYPE (olddecl);
1813 /* Also preserve various other info from the definition. */
1814 if (!new_is_definition)
1816 DECL_RESULT (newdecl) = DECL_RESULT (olddecl);
1817 DECL_INITIAL (newdecl) = DECL_INITIAL (olddecl);
1818 DECL_STRUCT_FUNCTION (newdecl) = DECL_STRUCT_FUNCTION (olddecl);
1819 DECL_SAVED_TREE (newdecl) = DECL_SAVED_TREE (olddecl);
1820 DECL_ARGUMENTS (newdecl) = DECL_ARGUMENTS (olddecl);
1822 /* Set DECL_INLINE on the declaration if we've got a body
1823 from which to instantiate. */
1824 if (DECL_INLINE (olddecl) && !DECL_UNINLINABLE (newdecl))
1826 DECL_INLINE (newdecl) = 1;
1827 DECL_ABSTRACT_ORIGIN (newdecl)
1828 = DECL_ABSTRACT_ORIGIN (olddecl);
1831 else
1833 /* If a previous declaration said inline, mark the
1834 definition as inlinable. */
1835 if (DECL_DECLARED_INLINE_P (newdecl)
1836 && !DECL_UNINLINABLE (newdecl))
1837 DECL_INLINE (newdecl) = 1;
1841 /* Copy most of the decl-specific fields of NEWDECL into OLDDECL.
1842 But preserve OLDDECL's DECL_UID and DECL_CONTEXT. */
1844 unsigned olddecl_uid = DECL_UID (olddecl);
1845 tree olddecl_context = DECL_CONTEXT (olddecl);
1847 memcpy ((char *) olddecl + sizeof (struct tree_common),
1848 (char *) newdecl + sizeof (struct tree_common),
1849 sizeof (struct tree_decl_common) - sizeof (struct tree_common));
1850 switch (TREE_CODE (olddecl))
1852 case FIELD_DECL:
1853 case VAR_DECL:
1854 case PARM_DECL:
1855 case LABEL_DECL:
1856 case RESULT_DECL:
1857 case CONST_DECL:
1858 case TYPE_DECL:
1859 case FUNCTION_DECL:
1860 memcpy ((char *) olddecl + sizeof (struct tree_decl_common),
1861 (char *) newdecl + sizeof (struct tree_decl_common),
1862 tree_code_size (TREE_CODE (olddecl)) - sizeof (struct tree_decl_common));
1863 break;
1865 default:
1867 memcpy ((char *) olddecl + sizeof (struct tree_decl_common),
1868 (char *) newdecl + sizeof (struct tree_decl_common),
1869 sizeof (struct tree_decl_non_common) - sizeof (struct tree_decl_common));
1871 DECL_UID (olddecl) = olddecl_uid;
1872 DECL_CONTEXT (olddecl) = olddecl_context;
1875 /* If OLDDECL had its DECL_RTL instantiated, re-invoke make_decl_rtl
1876 so that encode_section_info has a chance to look at the new decl
1877 flags and attributes. */
1878 if (DECL_RTL_SET_P (olddecl)
1879 && (TREE_CODE (olddecl) == FUNCTION_DECL
1880 || (TREE_CODE (olddecl) == VAR_DECL
1881 && TREE_STATIC (olddecl))))
1882 make_decl_rtl (olddecl);
1885 /* Handle when a new declaration NEWDECL has the same name as an old
1886 one OLDDECL in the same binding contour. Prints an error message
1887 if appropriate.
1889 If safely possible, alter OLDDECL to look like NEWDECL, and return
1890 true. Otherwise, return false. */
1892 static bool
1893 duplicate_decls (tree newdecl, tree olddecl)
1895 tree newtype = NULL, oldtype = NULL;
1897 if (!diagnose_mismatched_decls (newdecl, olddecl, &newtype, &oldtype))
1899 /* Avoid `unused variable' and other warnings warnings for OLDDECL. */
1900 TREE_NO_WARNING (olddecl) = 1;
1901 return false;
1904 merge_decls (newdecl, olddecl, newtype, oldtype);
1905 return true;
1909 /* Check whether decl-node NEW_DECL shadows an existing declaration. */
1910 static void
1911 warn_if_shadowing (tree new_decl)
1913 struct c_binding *b;
1915 /* Shadow warnings wanted? */
1916 if (!warn_shadow
1917 /* No shadow warnings for internally generated vars. */
1918 || DECL_IS_BUILTIN (new_decl)
1919 /* No shadow warnings for vars made for inlining. */
1920 || DECL_FROM_INLINE (new_decl))
1921 return;
1923 /* Is anything being shadowed? Invisible decls do not count. */
1924 for (b = I_SYMBOL_BINDING (DECL_NAME (new_decl)); b; b = b->shadowed)
1925 if (b->decl && b->decl != new_decl && !b->invisible)
1927 tree old_decl = b->decl;
1929 if (old_decl == error_mark_node)
1931 warning (OPT_Wshadow, "declaration of %q+D shadows previous "
1932 "non-variable", new_decl);
1933 break;
1935 else if (TREE_CODE (old_decl) == PARM_DECL)
1936 warning (OPT_Wshadow, "declaration of %q+D shadows a parameter",
1937 new_decl);
1938 else if (DECL_FILE_SCOPE_P (old_decl))
1939 warning (OPT_Wshadow, "declaration of %q+D shadows a global "
1940 "declaration", new_decl);
1941 else if (TREE_CODE (old_decl) == FUNCTION_DECL
1942 && DECL_BUILT_IN (old_decl))
1944 warning (OPT_Wshadow, "declaration of %q+D shadows "
1945 "a built-in function", new_decl);
1946 break;
1948 else
1949 warning (OPT_Wshadow, "declaration of %q+D shadows a previous local",
1950 new_decl);
1952 warning (OPT_Wshadow, "%Jshadowed declaration is here", old_decl);
1954 break;
1959 /* Subroutine of pushdecl.
1961 X is a TYPE_DECL for a typedef statement. Create a brand new
1962 ..._TYPE node (which will be just a variant of the existing
1963 ..._TYPE node with identical properties) and then install X
1964 as the TYPE_NAME of this brand new (duplicate) ..._TYPE node.
1966 The whole point here is to end up with a situation where each
1967 and every ..._TYPE node the compiler creates will be uniquely
1968 associated with AT MOST one node representing a typedef name.
1969 This way, even though the compiler substitutes corresponding
1970 ..._TYPE nodes for TYPE_DECL (i.e. "typedef name") nodes very
1971 early on, later parts of the compiler can always do the reverse
1972 translation and get back the corresponding typedef name. For
1973 example, given:
1975 typedef struct S MY_TYPE;
1976 MY_TYPE object;
1978 Later parts of the compiler might only know that `object' was of
1979 type `struct S' if it were not for code just below. With this
1980 code however, later parts of the compiler see something like:
1982 struct S' == struct S
1983 typedef struct S' MY_TYPE;
1984 struct S' object;
1986 And they can then deduce (from the node for type struct S') that
1987 the original object declaration was:
1989 MY_TYPE object;
1991 Being able to do this is important for proper support of protoize,
1992 and also for generating precise symbolic debugging information
1993 which takes full account of the programmer's (typedef) vocabulary.
1995 Obviously, we don't want to generate a duplicate ..._TYPE node if
1996 the TYPE_DECL node that we are now processing really represents a
1997 standard built-in type.
1999 Since all standard types are effectively declared at line zero
2000 in the source file, we can easily check to see if we are working
2001 on a standard type by checking the current value of lineno. */
2003 static void
2004 clone_underlying_type (tree x)
2006 if (DECL_IS_BUILTIN (x))
2008 if (TYPE_NAME (TREE_TYPE (x)) == 0)
2009 TYPE_NAME (TREE_TYPE (x)) = x;
2011 else if (TREE_TYPE (x) != error_mark_node
2012 && DECL_ORIGINAL_TYPE (x) == NULL_TREE)
2014 tree tt = TREE_TYPE (x);
2015 DECL_ORIGINAL_TYPE (x) = tt;
2016 tt = build_variant_type_copy (tt);
2017 TYPE_NAME (tt) = x;
2018 TREE_USED (tt) = TREE_USED (x);
2019 TREE_TYPE (x) = tt;
2023 /* Record a decl-node X as belonging to the current lexical scope.
2024 Check for errors (such as an incompatible declaration for the same
2025 name already seen in the same scope).
2027 Returns either X or an old decl for the same name.
2028 If an old decl is returned, it may have been smashed
2029 to agree with what X says. */
2031 tree
2032 pushdecl (tree x)
2034 tree name = DECL_NAME (x);
2035 struct c_scope *scope = current_scope;
2036 struct c_binding *b;
2037 bool nested = false;
2039 /* Functions need the lang_decl data. */
2040 if (TREE_CODE (x) == FUNCTION_DECL && !DECL_LANG_SPECIFIC (x))
2041 DECL_LANG_SPECIFIC (x) = GGC_CNEW (struct lang_decl);
2043 /* Must set DECL_CONTEXT for everything not at file scope or
2044 DECL_FILE_SCOPE_P won't work. Local externs don't count
2045 unless they have initializers (which generate code). */
2046 if (current_function_decl
2047 && ((TREE_CODE (x) != FUNCTION_DECL && TREE_CODE (x) != VAR_DECL)
2048 || DECL_INITIAL (x) || !DECL_EXTERNAL (x)))
2049 DECL_CONTEXT (x) = current_function_decl;
2051 /* If this is of variably modified type, prevent jumping into its
2052 scope. */
2053 if ((TREE_CODE (x) == VAR_DECL || TREE_CODE (x) == TYPE_DECL)
2054 && variably_modified_type_p (TREE_TYPE (x), NULL_TREE))
2055 c_begin_vm_scope (scope->depth);
2057 /* Anonymous decls are just inserted in the scope. */
2058 if (!name)
2060 bind (name, x, scope, /*invisible=*/false, /*nested=*/false);
2061 return x;
2064 /* First, see if there is another declaration with the same name in
2065 the current scope. If there is, duplicate_decls may do all the
2066 work for us. If duplicate_decls returns false, that indicates
2067 two incompatible decls in the same scope; we are to silently
2068 replace the old one (duplicate_decls has issued all appropriate
2069 diagnostics). In particular, we should not consider possible
2070 duplicates in the external scope, or shadowing. */
2071 b = I_SYMBOL_BINDING (name);
2072 if (b && B_IN_SCOPE (b, scope))
2074 struct c_binding *b_ext, *b_use;
2075 tree type = TREE_TYPE (x);
2076 tree visdecl = b->decl;
2077 tree vistype = TREE_TYPE (visdecl);
2078 if (TREE_CODE (TREE_TYPE (x)) == ARRAY_TYPE
2079 && COMPLETE_TYPE_P (TREE_TYPE (x)))
2080 b->inner_comp = false;
2081 b_use = b;
2082 b_ext = b;
2083 /* If this is an external linkage declaration, we should check
2084 for compatibility with the type in the external scope before
2085 setting the type at this scope based on the visible
2086 information only. */
2087 if (TREE_PUBLIC (x) && TREE_PUBLIC (visdecl))
2089 while (b_ext && !B_IN_EXTERNAL_SCOPE (b_ext))
2090 b_ext = b_ext->shadowed;
2091 if (b_ext)
2093 b_use = b_ext;
2094 if (b_use->type)
2095 TREE_TYPE (b_use->decl) = b_use->type;
2098 if (duplicate_decls (x, b_use->decl))
2100 if (b_use != b)
2102 /* Save the updated type in the external scope and
2103 restore the proper type for this scope. */
2104 tree thistype;
2105 if (comptypes (vistype, type))
2106 thistype = composite_type (vistype, type);
2107 else
2108 thistype = TREE_TYPE (b_use->decl);
2109 b_use->type = TREE_TYPE (b_use->decl);
2110 if (TREE_CODE (b_use->decl) == FUNCTION_DECL
2111 && DECL_BUILT_IN (b_use->decl))
2112 thistype
2113 = build_type_attribute_variant (thistype,
2114 TYPE_ATTRIBUTES
2115 (b_use->type));
2116 TREE_TYPE (b_use->decl) = thistype;
2118 return b_use->decl;
2120 else
2121 goto skip_external_and_shadow_checks;
2124 /* All declarations with external linkage, and all external
2125 references, go in the external scope, no matter what scope is
2126 current. However, the binding in that scope is ignored for
2127 purposes of normal name lookup. A separate binding structure is
2128 created in the requested scope; this governs the normal
2129 visibility of the symbol.
2131 The binding in the externals scope is used exclusively for
2132 detecting duplicate declarations of the same object, no matter
2133 what scope they are in; this is what we do here. (C99 6.2.7p2:
2134 All declarations that refer to the same object or function shall
2135 have compatible type; otherwise, the behavior is undefined.) */
2136 if (DECL_EXTERNAL (x) || scope == file_scope)
2138 tree type = TREE_TYPE (x);
2139 tree vistype = 0;
2140 tree visdecl = 0;
2141 bool type_saved = false;
2142 if (b && !B_IN_EXTERNAL_SCOPE (b)
2143 && (TREE_CODE (b->decl) == FUNCTION_DECL
2144 || TREE_CODE (b->decl) == VAR_DECL)
2145 && DECL_FILE_SCOPE_P (b->decl))
2147 visdecl = b->decl;
2148 vistype = TREE_TYPE (visdecl);
2150 if (scope != file_scope
2151 && !DECL_IN_SYSTEM_HEADER (x))
2152 warning (OPT_Wnested_externs, "nested extern declaration of %qD", x);
2154 while (b && !B_IN_EXTERNAL_SCOPE (b))
2156 /* If this decl might be modified, save its type. This is
2157 done here rather than when the decl is first bound
2158 because the type may change after first binding, through
2159 being completed or through attributes being added. If we
2160 encounter multiple such decls, only the first should have
2161 its type saved; the others will already have had their
2162 proper types saved and the types will not have changed as
2163 their scopes will not have been re-entered. */
2164 if (DECL_P (b->decl) && DECL_FILE_SCOPE_P (b->decl) && !type_saved)
2166 b->type = TREE_TYPE (b->decl);
2167 type_saved = true;
2169 if (B_IN_FILE_SCOPE (b)
2170 && TREE_CODE (b->decl) == VAR_DECL
2171 && TREE_STATIC (b->decl)
2172 && TREE_CODE (TREE_TYPE (b->decl)) == ARRAY_TYPE
2173 && !TYPE_DOMAIN (TREE_TYPE (b->decl))
2174 && TREE_CODE (type) == ARRAY_TYPE
2175 && TYPE_DOMAIN (type)
2176 && TYPE_MAX_VALUE (TYPE_DOMAIN (type))
2177 && !integer_zerop (TYPE_MAX_VALUE (TYPE_DOMAIN (type))))
2179 /* Array type completed in inner scope, which should be
2180 diagnosed if the completion does not have size 1 and
2181 it does not get completed in the file scope. */
2182 b->inner_comp = true;
2184 b = b->shadowed;
2187 /* If a matching external declaration has been found, set its
2188 type to the composite of all the types of that declaration.
2189 After the consistency checks, it will be reset to the
2190 composite of the visible types only. */
2191 if (b && (TREE_PUBLIC (x) || same_translation_unit_p (x, b->decl))
2192 && b->type)
2193 TREE_TYPE (b->decl) = b->type;
2195 /* The point of the same_translation_unit_p check here is,
2196 we want to detect a duplicate decl for a construct like
2197 foo() { extern bar(); } ... static bar(); but not if
2198 they are in different translation units. In any case,
2199 the static does not go in the externals scope. */
2200 if (b
2201 && (TREE_PUBLIC (x) || same_translation_unit_p (x, b->decl))
2202 && duplicate_decls (x, b->decl))
2204 tree thistype;
2205 if (vistype)
2207 if (comptypes (vistype, type))
2208 thistype = composite_type (vistype, type);
2209 else
2210 thistype = TREE_TYPE (b->decl);
2212 else
2213 thistype = type;
2214 b->type = TREE_TYPE (b->decl);
2215 if (TREE_CODE (b->decl) == FUNCTION_DECL && DECL_BUILT_IN (b->decl))
2216 thistype
2217 = build_type_attribute_variant (thistype,
2218 TYPE_ATTRIBUTES (b->type));
2219 TREE_TYPE (b->decl) = thistype;
2220 bind (name, b->decl, scope, /*invisible=*/false, /*nested=*/true);
2221 return b->decl;
2223 else if (TREE_PUBLIC (x))
2225 if (visdecl && !b && duplicate_decls (x, visdecl))
2227 /* An external declaration at block scope referring to a
2228 visible entity with internal linkage. The composite
2229 type will already be correct for this scope, so we
2230 just need to fall through to make the declaration in
2231 this scope. */
2232 nested = true;
2233 x = visdecl;
2235 else
2237 bind (name, x, external_scope, /*invisible=*/true,
2238 /*nested=*/false);
2239 nested = true;
2244 if (TREE_CODE (x) != PARM_DECL)
2245 warn_if_shadowing (x);
2247 skip_external_and_shadow_checks:
2248 if (TREE_CODE (x) == TYPE_DECL)
2249 clone_underlying_type (x);
2251 bind (name, x, scope, /*invisible=*/false, nested);
2253 /* If x's type is incomplete because it's based on a
2254 structure or union which has not yet been fully declared,
2255 attach it to that structure or union type, so we can go
2256 back and complete the variable declaration later, if the
2257 structure or union gets fully declared.
2259 If the input is erroneous, we can have error_mark in the type
2260 slot (e.g. "f(void a, ...)") - that doesn't count as an
2261 incomplete type. */
2262 if (TREE_TYPE (x) != error_mark_node
2263 && !COMPLETE_TYPE_P (TREE_TYPE (x)))
2265 tree element = TREE_TYPE (x);
2267 while (TREE_CODE (element) == ARRAY_TYPE)
2268 element = TREE_TYPE (element);
2269 element = TYPE_MAIN_VARIANT (element);
2271 if ((TREE_CODE (element) == RECORD_TYPE
2272 || TREE_CODE (element) == UNION_TYPE)
2273 && (TREE_CODE (x) != TYPE_DECL
2274 || TREE_CODE (TREE_TYPE (x)) == ARRAY_TYPE)
2275 && !COMPLETE_TYPE_P (element))
2276 C_TYPE_INCOMPLETE_VARS (element)
2277 = tree_cons (NULL_TREE, x, C_TYPE_INCOMPLETE_VARS (element));
2279 return x;
2282 /* Record X as belonging to file scope.
2283 This is used only internally by the Objective-C front end,
2284 and is limited to its needs. duplicate_decls is not called;
2285 if there is any preexisting decl for this identifier, it is an ICE. */
2287 tree
2288 pushdecl_top_level (tree x)
2290 tree name;
2291 bool nested = false;
2292 gcc_assert (TREE_CODE (x) == VAR_DECL || TREE_CODE (x) == CONST_DECL);
2294 name = DECL_NAME (x);
2296 gcc_assert (TREE_CODE (x) == CONST_DECL || !I_SYMBOL_BINDING (name));
2298 if (TREE_PUBLIC (x))
2300 bind (name, x, external_scope, /*invisible=*/true, /*nested=*/false);
2301 nested = true;
2303 if (file_scope)
2304 bind (name, x, file_scope, /*invisible=*/false, nested);
2306 return x;
2309 static void
2310 implicit_decl_warning (tree id, tree olddecl)
2312 void (*diag) (const char *, ...) ATTRIBUTE_GCC_CDIAG(1,2);
2313 switch (mesg_implicit_function_declaration)
2315 case 0: return;
2316 case 1: diag = warning0; break;
2317 case 2: diag = error; break;
2318 default: gcc_unreachable ();
2321 diag (G_("implicit declaration of function %qE"), id);
2322 if (olddecl)
2323 locate_old_decl (olddecl, diag);
2326 /* Generate an implicit declaration for identifier FUNCTIONID as a
2327 function of type int (). */
2329 tree
2330 implicitly_declare (tree functionid)
2332 struct c_binding *b;
2333 tree decl = 0;
2334 tree asmspec_tree;
2336 for (b = I_SYMBOL_BINDING (functionid); b; b = b->shadowed)
2338 if (B_IN_SCOPE (b, external_scope))
2340 decl = b->decl;
2341 break;
2345 if (decl)
2347 if (decl == error_mark_node)
2348 return decl;
2350 /* FIXME: Objective-C has weird not-really-builtin functions
2351 which are supposed to be visible automatically. They wind up
2352 in the external scope because they're pushed before the file
2353 scope gets created. Catch this here and rebind them into the
2354 file scope. */
2355 if (!DECL_BUILT_IN (decl) && DECL_IS_BUILTIN (decl))
2357 bind (functionid, decl, file_scope,
2358 /*invisible=*/false, /*nested=*/true);
2359 return decl;
2361 else
2363 tree newtype = default_function_type;
2364 if (b->type)
2365 TREE_TYPE (decl) = b->type;
2366 /* Implicit declaration of a function already declared
2367 (somehow) in a different scope, or as a built-in.
2368 If this is the first time this has happened, warn;
2369 then recycle the old declaration but with the new type. */
2370 if (!C_DECL_IMPLICIT (decl))
2372 implicit_decl_warning (functionid, decl);
2373 C_DECL_IMPLICIT (decl) = 1;
2375 if (DECL_BUILT_IN (decl))
2377 newtype = build_type_attribute_variant (newtype,
2378 TYPE_ATTRIBUTES
2379 (TREE_TYPE (decl)));
2380 if (!comptypes (newtype, TREE_TYPE (decl)))
2382 warning (0, "incompatible implicit declaration of built-in"
2383 " function %qD", decl);
2384 newtype = TREE_TYPE (decl);
2387 else
2389 if (!comptypes (newtype, TREE_TYPE (decl)))
2391 error ("incompatible implicit declaration of function %qD",
2392 decl);
2393 locate_old_decl (decl, error);
2396 b->type = TREE_TYPE (decl);
2397 TREE_TYPE (decl) = newtype;
2398 bind (functionid, decl, current_scope,
2399 /*invisible=*/false, /*nested=*/true);
2400 return decl;
2404 /* Not seen before. */
2405 decl = build_decl (FUNCTION_DECL, functionid, default_function_type);
2406 DECL_EXTERNAL (decl) = 1;
2407 TREE_PUBLIC (decl) = 1;
2408 C_DECL_IMPLICIT (decl) = 1;
2409 implicit_decl_warning (functionid, 0);
2410 asmspec_tree = maybe_apply_renaming_pragma (decl, /*asmname=*/NULL);
2411 if (asmspec_tree)
2412 set_user_assembler_name (decl, TREE_STRING_POINTER (asmspec_tree));
2414 /* C89 says implicit declarations are in the innermost block.
2415 So we record the decl in the standard fashion. */
2416 decl = pushdecl (decl);
2418 /* No need to call objc_check_decl here - it's a function type. */
2419 rest_of_decl_compilation (decl, 0, 0);
2421 /* Write a record describing this implicit function declaration
2422 to the prototypes file (if requested). */
2423 gen_aux_info_record (decl, 0, 1, 0);
2425 /* Possibly apply some default attributes to this implicit declaration. */
2426 decl_attributes (&decl, NULL_TREE, 0);
2428 return decl;
2431 /* Issue an error message for a reference to an undeclared variable
2432 ID, including a reference to a builtin outside of function-call
2433 context. Establish a binding of the identifier to error_mark_node
2434 in an appropriate scope, which will suppress further errors for the
2435 same identifier. The error message should be given location LOC. */
2436 void
2437 undeclared_variable (tree id, location_t loc)
2439 static bool already = false;
2440 struct c_scope *scope;
2442 if (current_function_decl == 0)
2444 error ("%H%qE undeclared here (not in a function)", &loc, id);
2445 scope = current_scope;
2447 else
2449 error ("%H%qE undeclared (first use in this function)", &loc, id);
2451 if (!already)
2453 error ("%H(Each undeclared identifier is reported only once", &loc);
2454 error ("%Hfor each function it appears in.)", &loc);
2455 already = true;
2458 /* If we are parsing old-style parameter decls, current_function_decl
2459 will be nonnull but current_function_scope will be null. */
2460 scope = current_function_scope ? current_function_scope : current_scope;
2462 bind (id, error_mark_node, scope, /*invisible=*/false, /*nested=*/false);
2465 /* Subroutine of lookup_label, declare_label, define_label: construct a
2466 LABEL_DECL with all the proper frills. */
2468 static tree
2469 make_label (tree name, location_t location)
2471 tree label = build_decl (LABEL_DECL, name, void_type_node);
2473 DECL_CONTEXT (label) = current_function_decl;
2474 DECL_MODE (label) = VOIDmode;
2475 DECL_SOURCE_LOCATION (label) = location;
2477 return label;
2480 /* Get the LABEL_DECL corresponding to identifier NAME as a label.
2481 Create one if none exists so far for the current function.
2482 This is called when a label is used in a goto expression or
2483 has its address taken. */
2485 tree
2486 lookup_label (tree name)
2488 tree label;
2490 if (current_function_decl == 0)
2492 error ("label %qE referenced outside of any function", name);
2493 return 0;
2496 /* Use a label already defined or ref'd with this name, but not if
2497 it is inherited from a containing function and wasn't declared
2498 using __label__. */
2499 label = I_LABEL_DECL (name);
2500 if (label && (DECL_CONTEXT (label) == current_function_decl
2501 || C_DECLARED_LABEL_FLAG (label)))
2503 /* If the label has only been declared, update its apparent
2504 location to point here, for better diagnostics if it
2505 turns out not to have been defined. */
2506 if (!TREE_USED (label))
2507 DECL_SOURCE_LOCATION (label) = input_location;
2508 return label;
2511 /* No label binding for that identifier; make one. */
2512 label = make_label (name, input_location);
2514 /* Ordinary labels go in the current function scope. */
2515 bind (name, label, current_function_scope,
2516 /*invisible=*/false, /*nested=*/false);
2517 return label;
2520 /* Make a label named NAME in the current function, shadowing silently
2521 any that may be inherited from containing functions or containing
2522 scopes. This is called for __label__ declarations. */
2524 tree
2525 declare_label (tree name)
2527 struct c_binding *b = I_LABEL_BINDING (name);
2528 tree label;
2530 /* Check to make sure that the label hasn't already been declared
2531 at this scope */
2532 if (b && B_IN_CURRENT_SCOPE (b))
2534 error ("duplicate label declaration %qE", name);
2535 locate_old_decl (b->decl, error);
2537 /* Just use the previous declaration. */
2538 return b->decl;
2541 label = make_label (name, input_location);
2542 C_DECLARED_LABEL_FLAG (label) = 1;
2544 /* Declared labels go in the current scope. */
2545 bind (name, label, current_scope,
2546 /*invisible=*/false, /*nested=*/false);
2547 return label;
2550 /* Define a label, specifying the location in the source file.
2551 Return the LABEL_DECL node for the label, if the definition is valid.
2552 Otherwise return 0. */
2554 tree
2555 define_label (location_t location, tree name)
2557 /* Find any preexisting label with this name. It is an error
2558 if that label has already been defined in this function, or
2559 if there is a containing function with a declared label with
2560 the same name. */
2561 tree label = I_LABEL_DECL (name);
2562 struct c_label_list *nlist_se, *nlist_vm;
2564 if (label
2565 && ((DECL_CONTEXT (label) == current_function_decl
2566 && DECL_INITIAL (label) != 0)
2567 || (DECL_CONTEXT (label) != current_function_decl
2568 && C_DECLARED_LABEL_FLAG (label))))
2570 error ("%Hduplicate label %qD", &location, label);
2571 locate_old_decl (label, error);
2572 return 0;
2574 else if (label && DECL_CONTEXT (label) == current_function_decl)
2576 /* The label has been used or declared already in this function,
2577 but not defined. Update its location to point to this
2578 definition. */
2579 if (C_DECL_UNDEFINABLE_STMT_EXPR (label))
2580 error ("%Jjump into statement expression", label);
2581 if (C_DECL_UNDEFINABLE_VM (label))
2582 error ("%Jjump into scope of identifier with variably modified type",
2583 label);
2584 DECL_SOURCE_LOCATION (label) = location;
2586 else
2588 /* No label binding for that identifier; make one. */
2589 label = make_label (name, location);
2591 /* Ordinary labels go in the current function scope. */
2592 bind (name, label, current_function_scope,
2593 /*invisible=*/false, /*nested=*/false);
2596 if (!in_system_header && lookup_name (name))
2597 warning (OPT_Wtraditional, "%Htraditional C lacks a separate namespace "
2598 "for labels, identifier %qE conflicts", &location, name);
2600 nlist_se = XOBNEW (&parser_obstack, struct c_label_list);
2601 nlist_se->next = label_context_stack_se->labels_def;
2602 nlist_se->label = label;
2603 label_context_stack_se->labels_def = nlist_se;
2605 nlist_vm = XOBNEW (&parser_obstack, struct c_label_list);
2606 nlist_vm->next = label_context_stack_vm->labels_def;
2607 nlist_vm->label = label;
2608 label_context_stack_vm->labels_def = nlist_vm;
2610 /* Mark label as having been defined. */
2611 DECL_INITIAL (label) = error_mark_node;
2612 return label;
2615 /* Given NAME, an IDENTIFIER_NODE,
2616 return the structure (or union or enum) definition for that name.
2617 If THISLEVEL_ONLY is nonzero, searches only the current_scope.
2618 CODE says which kind of type the caller wants;
2619 it is RECORD_TYPE or UNION_TYPE or ENUMERAL_TYPE.
2620 If the wrong kind of type is found, an error is reported. */
2622 static tree
2623 lookup_tag (enum tree_code code, tree name, int thislevel_only)
2625 struct c_binding *b = I_TAG_BINDING (name);
2626 int thislevel = 0;
2628 if (!b || !b->decl)
2629 return 0;
2631 /* We only care about whether it's in this level if
2632 thislevel_only was set or it might be a type clash. */
2633 if (thislevel_only || TREE_CODE (b->decl) != code)
2635 /* For our purposes, a tag in the external scope is the same as
2636 a tag in the file scope. (Primarily relevant to Objective-C
2637 and its builtin structure tags, which get pushed before the
2638 file scope is created.) */
2639 if (B_IN_CURRENT_SCOPE (b)
2640 || (current_scope == file_scope && B_IN_EXTERNAL_SCOPE (b)))
2641 thislevel = 1;
2644 if (thislevel_only && !thislevel)
2645 return 0;
2647 if (TREE_CODE (b->decl) != code)
2649 /* Definition isn't the kind we were looking for. */
2650 pending_invalid_xref = name;
2651 pending_invalid_xref_location = input_location;
2653 /* If in the same binding level as a declaration as a tag
2654 of a different type, this must not be allowed to
2655 shadow that tag, so give the error immediately.
2656 (For example, "struct foo; union foo;" is invalid.) */
2657 if (thislevel)
2658 pending_xref_error ();
2660 return b->decl;
2663 /* Print an error message now
2664 for a recent invalid struct, union or enum cross reference.
2665 We don't print them immediately because they are not invalid
2666 when used in the `struct foo;' construct for shadowing. */
2668 void
2669 pending_xref_error (void)
2671 if (pending_invalid_xref != 0)
2672 error ("%H%qE defined as wrong kind of tag",
2673 &pending_invalid_xref_location, pending_invalid_xref);
2674 pending_invalid_xref = 0;
2678 /* Look up NAME in the current scope and its superiors
2679 in the namespace of variables, functions and typedefs.
2680 Return a ..._DECL node of some kind representing its definition,
2681 or return 0 if it is undefined. */
2683 tree
2684 lookup_name (tree name)
2686 struct c_binding *b = I_SYMBOL_BINDING (name);
2687 if (b && !b->invisible)
2688 return b->decl;
2689 return 0;
2692 /* Similar to `lookup_name' but look only at the indicated scope. */
2694 static tree
2695 lookup_name_in_scope (tree name, struct c_scope *scope)
2697 struct c_binding *b;
2699 for (b = I_SYMBOL_BINDING (name); b; b = b->shadowed)
2700 if (B_IN_SCOPE (b, scope))
2701 return b->decl;
2702 return 0;
2705 /* Create the predefined scalar types of C,
2706 and some nodes representing standard constants (0, 1, (void *) 0).
2707 Initialize the global scope.
2708 Make definitions for built-in primitive functions. */
2710 void
2711 c_init_decl_processing (void)
2713 location_t save_loc = input_location;
2715 /* Initialize reserved words for parser. */
2716 c_parse_init ();
2718 current_function_decl = 0;
2720 gcc_obstack_init (&parser_obstack);
2722 /* Make the externals scope. */
2723 push_scope ();
2724 external_scope = current_scope;
2726 /* Declarations from c_common_nodes_and_builtins must not be associated
2727 with this input file, lest we get differences between using and not
2728 using preprocessed headers. */
2729 #ifdef USE_MAPPED_LOCATION
2730 input_location = BUILTINS_LOCATION;
2731 #else
2732 input_location.file = "<built-in>";
2733 input_location.line = 0;
2734 #endif
2736 build_common_tree_nodes (flag_signed_char, false);
2738 c_common_nodes_and_builtins ();
2740 /* In C, comparisons and TRUTH_* expressions have type int. */
2741 truthvalue_type_node = integer_type_node;
2742 truthvalue_true_node = integer_one_node;
2743 truthvalue_false_node = integer_zero_node;
2745 /* Even in C99, which has a real boolean type. */
2746 pushdecl (build_decl (TYPE_DECL, get_identifier ("_Bool"),
2747 boolean_type_node));
2749 input_location = save_loc;
2751 pedantic_lvalues = true;
2753 make_fname_decl = c_make_fname_decl;
2754 start_fname_decls ();
2757 /* Create the VAR_DECL for __FUNCTION__ etc. ID is the name to give the
2758 decl, NAME is the initialization string and TYPE_DEP indicates whether
2759 NAME depended on the type of the function. As we don't yet implement
2760 delayed emission of static data, we mark the decl as emitted
2761 so it is not placed in the output. Anything using it must therefore pull
2762 out the STRING_CST initializer directly. FIXME. */
2764 static tree
2765 c_make_fname_decl (tree id, int type_dep)
2767 const char *name = fname_as_string (type_dep);
2768 tree decl, type, init;
2769 size_t length = strlen (name);
2771 type = build_array_type (char_type_node,
2772 build_index_type (size_int (length)));
2773 type = c_build_qualified_type (type, TYPE_QUAL_CONST);
2775 decl = build_decl (VAR_DECL, id, type);
2777 TREE_STATIC (decl) = 1;
2778 TREE_READONLY (decl) = 1;
2779 DECL_ARTIFICIAL (decl) = 1;
2781 init = build_string (length + 1, name);
2782 free ((char *) name);
2783 TREE_TYPE (init) = type;
2784 DECL_INITIAL (decl) = init;
2786 TREE_USED (decl) = 1;
2788 if (current_function_decl)
2790 DECL_CONTEXT (decl) = current_function_decl;
2791 bind (id, decl, current_function_scope,
2792 /*invisible=*/false, /*nested=*/false);
2795 finish_decl (decl, init, NULL_TREE);
2797 return decl;
2800 /* Return a definition for a builtin function named NAME and whose data type
2801 is TYPE. TYPE should be a function type with argument types.
2802 FUNCTION_CODE tells later passes how to compile calls to this function.
2803 See tree.h for its possible values.
2805 If LIBRARY_NAME is nonzero, use that for DECL_ASSEMBLER_NAME,
2806 the name to be called if we can't opencode the function. If
2807 ATTRS is nonzero, use that for the function's attribute list. */
2809 tree
2810 builtin_function (const char *name, tree type, int function_code,
2811 enum built_in_class cl, const char *library_name,
2812 tree attrs)
2814 tree id = get_identifier (name);
2815 tree decl = build_decl (FUNCTION_DECL, id, type);
2816 TREE_PUBLIC (decl) = 1;
2817 DECL_EXTERNAL (decl) = 1;
2818 DECL_LANG_SPECIFIC (decl) = GGC_CNEW (struct lang_decl);
2819 DECL_BUILT_IN_CLASS (decl) = cl;
2820 DECL_FUNCTION_CODE (decl) = function_code;
2821 C_DECL_BUILTIN_PROTOTYPE (decl) = (TYPE_ARG_TYPES (type) != 0);
2822 if (library_name)
2823 SET_DECL_ASSEMBLER_NAME (decl, get_identifier (library_name));
2825 /* Should never be called on a symbol with a preexisting meaning. */
2826 gcc_assert (!I_SYMBOL_BINDING (id));
2828 bind (id, decl, external_scope, /*invisible=*/true, /*nested=*/false);
2830 /* Builtins in the implementation namespace are made visible without
2831 needing to be explicitly declared. See push_file_scope. */
2832 if (name[0] == '_' && (name[1] == '_' || ISUPPER (name[1])))
2834 TREE_CHAIN (decl) = visible_builtins;
2835 visible_builtins = decl;
2838 /* Possibly apply some default attributes to this built-in function. */
2839 if (attrs)
2840 decl_attributes (&decl, attrs, ATTR_FLAG_BUILT_IN);
2841 else
2842 decl_attributes (&decl, NULL_TREE, 0);
2844 return decl;
2847 /* Called when a declaration is seen that contains no names to declare.
2848 If its type is a reference to a structure, union or enum inherited
2849 from a containing scope, shadow that tag name for the current scope
2850 with a forward reference.
2851 If its type defines a new named structure or union
2852 or defines an enum, it is valid but we need not do anything here.
2853 Otherwise, it is an error. */
2855 void
2856 shadow_tag (const struct c_declspecs *declspecs)
2858 shadow_tag_warned (declspecs, 0);
2861 /* WARNED is 1 if we have done a pedwarn, 2 if we have done a warning,
2862 but no pedwarn. */
2863 void
2864 shadow_tag_warned (const struct c_declspecs *declspecs, int warned)
2866 bool found_tag = false;
2868 if (declspecs->type && !declspecs->default_int_p && !declspecs->typedef_p)
2870 tree value = declspecs->type;
2871 enum tree_code code = TREE_CODE (value);
2873 if (code == RECORD_TYPE || code == UNION_TYPE || code == ENUMERAL_TYPE)
2874 /* Used to test also that TYPE_SIZE (value) != 0.
2875 That caused warning for `struct foo;' at top level in the file. */
2877 tree name = TYPE_NAME (value);
2878 tree t;
2880 found_tag = true;
2882 if (name == 0)
2884 if (warned != 1 && code != ENUMERAL_TYPE)
2885 /* Empty unnamed enum OK */
2887 pedwarn ("unnamed struct/union that defines no instances");
2888 warned = 1;
2891 else if (!declspecs->tag_defined_p
2892 && declspecs->storage_class != csc_none)
2894 if (warned != 1)
2895 pedwarn ("empty declaration with storage class specifier "
2896 "does not redeclare tag");
2897 warned = 1;
2898 pending_xref_error ();
2900 else if (!declspecs->tag_defined_p
2901 && (declspecs->const_p
2902 || declspecs->volatile_p
2903 || declspecs->restrict_p))
2905 if (warned != 1)
2906 pedwarn ("empty declaration with type qualifier "
2907 "does not redeclare tag");
2908 warned = 1;
2909 pending_xref_error ();
2911 else
2913 pending_invalid_xref = 0;
2914 t = lookup_tag (code, name, 1);
2916 if (t == 0)
2918 t = make_node (code);
2919 pushtag (name, t);
2923 else
2925 if (warned != 1 && !in_system_header)
2927 pedwarn ("useless type name in empty declaration");
2928 warned = 1;
2932 else if (warned != 1 && !in_system_header && declspecs->typedef_p)
2934 pedwarn ("useless type name in empty declaration");
2935 warned = 1;
2938 pending_invalid_xref = 0;
2940 if (declspecs->inline_p)
2942 error ("%<inline%> in empty declaration");
2943 warned = 1;
2946 if (current_scope == file_scope && declspecs->storage_class == csc_auto)
2948 error ("%<auto%> in file-scope empty declaration");
2949 warned = 1;
2952 if (current_scope == file_scope && declspecs->storage_class == csc_register)
2954 error ("%<register%> in file-scope empty declaration");
2955 warned = 1;
2958 if (!warned && !in_system_header && declspecs->storage_class != csc_none)
2960 warning (0, "useless storage class specifier in empty declaration");
2961 warned = 2;
2964 if (!warned && !in_system_header && declspecs->thread_p)
2966 warning (0, "useless %<__thread%> in empty declaration");
2967 warned = 2;
2970 if (!warned && !in_system_header && (declspecs->const_p
2971 || declspecs->volatile_p
2972 || declspecs->restrict_p))
2974 warning (0, "useless type qualifier in empty declaration");
2975 warned = 2;
2978 if (warned != 1)
2980 if (!found_tag)
2981 pedwarn ("empty declaration");
2986 /* Return the qualifiers from SPECS as a bitwise OR of TYPE_QUAL_*
2987 bits. SPECS represents declaration specifiers that the grammar
2988 only permits to contain type qualifiers and attributes. */
2991 quals_from_declspecs (const struct c_declspecs *specs)
2993 int quals = ((specs->const_p ? TYPE_QUAL_CONST : 0)
2994 | (specs->volatile_p ? TYPE_QUAL_VOLATILE : 0)
2995 | (specs->restrict_p ? TYPE_QUAL_RESTRICT : 0));
2996 gcc_assert (!specs->type
2997 && !specs->decl_attr
2998 && specs->typespec_word == cts_none
2999 && specs->storage_class == csc_none
3000 && !specs->typedef_p
3001 && !specs->explicit_signed_p
3002 && !specs->deprecated_p
3003 && !specs->long_p
3004 && !specs->long_long_p
3005 && !specs->short_p
3006 && !specs->signed_p
3007 && !specs->unsigned_p
3008 && !specs->complex_p
3009 && !specs->inline_p
3010 && !specs->thread_p);
3011 return quals;
3014 /* Construct an array declarator. EXPR is the expression inside [],
3015 or NULL_TREE. QUALS are the type qualifiers inside the [] (to be
3016 applied to the pointer to which a parameter array is converted).
3017 STATIC_P is true if "static" is inside the [], false otherwise.
3018 VLA_UNSPEC_P is true if the array is [*], a VLA of unspecified
3019 length which is nevertheless a complete type, false otherwise. The
3020 field for the contained declarator is left to be filled in by
3021 set_array_declarator_inner. */
3023 struct c_declarator *
3024 build_array_declarator (tree expr, struct c_declspecs *quals, bool static_p,
3025 bool vla_unspec_p)
3027 struct c_declarator *declarator = XOBNEW (&parser_obstack,
3028 struct c_declarator);
3029 declarator->kind = cdk_array;
3030 declarator->declarator = 0;
3031 declarator->u.array.dimen = expr;
3032 if (quals)
3034 declarator->u.array.attrs = quals->attrs;
3035 declarator->u.array.quals = quals_from_declspecs (quals);
3037 else
3039 declarator->u.array.attrs = NULL_TREE;
3040 declarator->u.array.quals = 0;
3042 declarator->u.array.static_p = static_p;
3043 declarator->u.array.vla_unspec_p = vla_unspec_p;
3044 if (pedantic && !flag_isoc99)
3046 if (static_p || quals != NULL)
3047 pedwarn ("ISO C90 does not support %<static%> or type "
3048 "qualifiers in parameter array declarators");
3049 if (vla_unspec_p)
3050 pedwarn ("ISO C90 does not support %<[*]%> array declarators");
3052 if (vla_unspec_p)
3054 if (!current_scope->parm_flag)
3056 /* C99 6.7.5.2p4 */
3057 error ("%<[*]%> not allowed in other than function prototype scope");
3058 declarator->u.array.vla_unspec_p = false;
3059 return NULL;
3061 current_scope->had_vla_unspec = true;
3063 return declarator;
3066 /* Set the contained declarator of an array declarator. DECL is the
3067 declarator, as constructed by build_array_declarator; INNER is what
3068 appears on the left of the []. ABSTRACT_P is true if it is an
3069 abstract declarator, false otherwise; this is used to reject static
3070 and type qualifiers in abstract declarators, where they are not in
3071 the C99 grammar (subject to possible change in DR#289). */
3073 struct c_declarator *
3074 set_array_declarator_inner (struct c_declarator *decl,
3075 struct c_declarator *inner, bool abstract_p)
3077 decl->declarator = inner;
3078 if (abstract_p && (decl->u.array.quals != TYPE_UNQUALIFIED
3079 || decl->u.array.attrs != NULL_TREE
3080 || decl->u.array.static_p))
3081 error ("static or type qualifiers in abstract declarator");
3082 return decl;
3085 /* INIT is a constructor that forms DECL's initializer. If the final
3086 element initializes a flexible array field, add the size of that
3087 initializer to DECL's size. */
3089 static void
3090 add_flexible_array_elts_to_size (tree decl, tree init)
3092 tree elt, type;
3094 if (VEC_empty (constructor_elt, CONSTRUCTOR_ELTS (init)))
3095 return;
3097 elt = VEC_last (constructor_elt, CONSTRUCTOR_ELTS (init))->value;
3098 type = TREE_TYPE (elt);
3099 if (TREE_CODE (type) == ARRAY_TYPE
3100 && TYPE_SIZE (type) == NULL_TREE
3101 && TYPE_DOMAIN (type) != NULL_TREE
3102 && TYPE_MAX_VALUE (TYPE_DOMAIN (type)) == NULL_TREE)
3104 complete_array_type (&type, elt, false);
3105 DECL_SIZE (decl)
3106 = size_binop (PLUS_EXPR, DECL_SIZE (decl), TYPE_SIZE (type));
3107 DECL_SIZE_UNIT (decl)
3108 = size_binop (PLUS_EXPR, DECL_SIZE_UNIT (decl), TYPE_SIZE_UNIT (type));
3112 /* Decode a "typename", such as "int **", returning a ..._TYPE node. */
3114 tree
3115 groktypename (struct c_type_name *type_name)
3117 tree type;
3118 tree attrs = type_name->specs->attrs;
3120 type_name->specs->attrs = NULL_TREE;
3122 type = grokdeclarator (type_name->declarator, type_name->specs, TYPENAME,
3123 false, NULL);
3125 /* Apply attributes. */
3126 decl_attributes (&type, attrs, 0);
3128 return type;
3131 /* Decode a declarator in an ordinary declaration or data definition.
3132 This is called as soon as the type information and variable name
3133 have been parsed, before parsing the initializer if any.
3134 Here we create the ..._DECL node, fill in its type,
3135 and put it on the list of decls for the current context.
3136 The ..._DECL node is returned as the value.
3138 Exception: for arrays where the length is not specified,
3139 the type is left null, to be filled in by `finish_decl'.
3141 Function definitions do not come here; they go to start_function
3142 instead. However, external and forward declarations of functions
3143 do go through here. Structure field declarations are done by
3144 grokfield and not through here. */
3146 tree
3147 start_decl (struct c_declarator *declarator, struct c_declspecs *declspecs,
3148 bool initialized, tree attributes)
3150 tree decl;
3151 tree tem;
3153 /* An object declared as __attribute__((deprecated)) suppresses
3154 warnings of uses of other deprecated items. */
3155 if (lookup_attribute ("deprecated", attributes))
3156 deprecated_state = DEPRECATED_SUPPRESS;
3158 decl = grokdeclarator (declarator, declspecs,
3159 NORMAL, initialized, NULL);
3160 if (!decl)
3161 return 0;
3163 deprecated_state = DEPRECATED_NORMAL;
3165 if (warn_main > 0 && TREE_CODE (decl) != FUNCTION_DECL
3166 && MAIN_NAME_P (DECL_NAME (decl)))
3167 warning (OPT_Wmain, "%q+D is usually a function", decl);
3169 if (initialized)
3170 /* Is it valid for this decl to have an initializer at all?
3171 If not, set INITIALIZED to zero, which will indirectly
3172 tell 'finish_decl' to ignore the initializer once it is parsed. */
3173 switch (TREE_CODE (decl))
3175 case TYPE_DECL:
3176 error ("typedef %qD is initialized (use __typeof__ instead)", decl);
3177 initialized = 0;
3178 break;
3180 case FUNCTION_DECL:
3181 error ("function %qD is initialized like a variable", decl);
3182 initialized = 0;
3183 break;
3185 case PARM_DECL:
3186 /* DECL_INITIAL in a PARM_DECL is really DECL_ARG_TYPE. */
3187 error ("parameter %qD is initialized", decl);
3188 initialized = 0;
3189 break;
3191 default:
3192 /* Don't allow initializations for incomplete types except for
3193 arrays which might be completed by the initialization. */
3195 /* This can happen if the array size is an undefined macro.
3196 We already gave a warning, so we don't need another one. */
3197 if (TREE_TYPE (decl) == error_mark_node)
3198 initialized = 0;
3199 else if (COMPLETE_TYPE_P (TREE_TYPE (decl)))
3201 /* A complete type is ok if size is fixed. */
3203 if (TREE_CODE (TYPE_SIZE (TREE_TYPE (decl))) != INTEGER_CST
3204 || C_DECL_VARIABLE_SIZE (decl))
3206 error ("variable-sized object may not be initialized");
3207 initialized = 0;
3210 else if (TREE_CODE (TREE_TYPE (decl)) != ARRAY_TYPE)
3212 error ("variable %qD has initializer but incomplete type", decl);
3213 initialized = 0;
3215 else if (C_DECL_VARIABLE_SIZE (decl))
3217 /* Although C99 is unclear about whether incomplete arrays
3218 of VLAs themselves count as VLAs, it does not make
3219 sense to permit them to be initialized given that
3220 ordinary VLAs may not be initialized. */
3221 error ("variable-sized object may not be initialized");
3222 initialized = 0;
3226 if (initialized)
3228 if (current_scope == file_scope)
3229 TREE_STATIC (decl) = 1;
3231 /* Tell 'pushdecl' this is an initialized decl
3232 even though we don't yet have the initializer expression.
3233 Also tell 'finish_decl' it may store the real initializer. */
3234 DECL_INITIAL (decl) = error_mark_node;
3237 /* If this is a function declaration, write a record describing it to the
3238 prototypes file (if requested). */
3240 if (TREE_CODE (decl) == FUNCTION_DECL)
3241 gen_aux_info_record (decl, 0, 0, TYPE_ARG_TYPES (TREE_TYPE (decl)) != 0);
3243 /* ANSI specifies that a tentative definition which is not merged with
3244 a non-tentative definition behaves exactly like a definition with an
3245 initializer equal to zero. (Section 3.7.2)
3247 -fno-common gives strict ANSI behavior, though this tends to break
3248 a large body of code that grew up without this rule.
3250 Thread-local variables are never common, since there's no entrenched
3251 body of code to break, and it allows more efficient variable references
3252 in the presence of dynamic linking. */
3254 if (TREE_CODE (decl) == VAR_DECL
3255 && !initialized
3256 && TREE_PUBLIC (decl)
3257 && !DECL_THREAD_LOCAL_P (decl)
3258 && !flag_no_common)
3259 DECL_COMMON (decl) = 1;
3261 /* Set attributes here so if duplicate decl, will have proper attributes. */
3262 decl_attributes (&decl, attributes, 0);
3264 if (TREE_CODE (decl) == FUNCTION_DECL
3265 && targetm.calls.promote_prototypes (TREE_TYPE (decl)))
3267 struct c_declarator *ce = declarator;
3269 if (ce->kind == cdk_pointer)
3270 ce = declarator->declarator;
3271 if (ce->kind == cdk_function)
3273 tree args = ce->u.arg_info->parms;
3274 for (; args; args = TREE_CHAIN (args))
3276 tree type = TREE_TYPE (args);
3277 if (type && INTEGRAL_TYPE_P (type)
3278 && TYPE_PRECISION (type) < TYPE_PRECISION (integer_type_node))
3279 DECL_ARG_TYPE (args) = integer_type_node;
3284 if (TREE_CODE (decl) == FUNCTION_DECL
3285 && DECL_DECLARED_INLINE_P (decl)
3286 && DECL_UNINLINABLE (decl)
3287 && lookup_attribute ("noinline", DECL_ATTRIBUTES (decl)))
3288 warning (OPT_Wattributes, "inline function %q+D given attribute noinline",
3289 decl);
3291 /* Add this decl to the current scope.
3292 TEM may equal DECL or it may be a previous decl of the same name. */
3293 tem = pushdecl (decl);
3295 if (initialized && DECL_EXTERNAL (tem))
3297 DECL_EXTERNAL (tem) = 0;
3298 TREE_STATIC (tem) = 1;
3301 return tem;
3304 /* Finish processing of a declaration;
3305 install its initial value.
3306 If the length of an array type is not known before,
3307 it must be determined now, from the initial value, or it is an error. */
3309 void
3310 finish_decl (tree decl, tree init, tree asmspec_tree)
3312 tree type = TREE_TYPE (decl);
3313 int was_incomplete = (DECL_SIZE (decl) == 0);
3314 const char *asmspec = 0;
3316 /* If a name was specified, get the string. */
3317 if ((TREE_CODE (decl) == FUNCTION_DECL || TREE_CODE (decl) == VAR_DECL)
3318 && DECL_FILE_SCOPE_P (decl))
3319 asmspec_tree = maybe_apply_renaming_pragma (decl, asmspec_tree);
3320 if (asmspec_tree)
3321 asmspec = TREE_STRING_POINTER (asmspec_tree);
3323 /* If `start_decl' didn't like having an initialization, ignore it now. */
3324 if (init != 0 && DECL_INITIAL (decl) == 0)
3325 init = 0;
3327 /* Don't crash if parm is initialized. */
3328 if (TREE_CODE (decl) == PARM_DECL)
3329 init = 0;
3331 if (init)
3332 store_init_value (decl, init);
3334 if (c_dialect_objc () && (TREE_CODE (decl) == VAR_DECL
3335 || TREE_CODE (decl) == FUNCTION_DECL
3336 || TREE_CODE (decl) == FIELD_DECL))
3337 objc_check_decl (decl);
3339 /* Deduce size of array from initialization, if not already known. */
3340 if (TREE_CODE (type) == ARRAY_TYPE
3341 && TYPE_DOMAIN (type) == 0
3342 && TREE_CODE (decl) != TYPE_DECL)
3344 bool do_default
3345 = (TREE_STATIC (decl)
3346 /* Even if pedantic, an external linkage array
3347 may have incomplete type at first. */
3348 ? pedantic && !TREE_PUBLIC (decl)
3349 : !DECL_EXTERNAL (decl));
3350 int failure
3351 = complete_array_type (&TREE_TYPE (decl), DECL_INITIAL (decl),
3352 do_default);
3354 /* Get the completed type made by complete_array_type. */
3355 type = TREE_TYPE (decl);
3357 switch (failure)
3359 case 1:
3360 error ("initializer fails to determine size of %q+D", decl);
3361 break;
3363 case 2:
3364 if (do_default)
3365 error ("array size missing in %q+D", decl);
3366 /* If a `static' var's size isn't known,
3367 make it extern as well as static, so it does not get
3368 allocated.
3369 If it is not `static', then do not mark extern;
3370 finish_incomplete_decl will give it a default size
3371 and it will get allocated. */
3372 else if (!pedantic && TREE_STATIC (decl) && !TREE_PUBLIC (decl))
3373 DECL_EXTERNAL (decl) = 1;
3374 break;
3376 case 3:
3377 error ("zero or negative size array %q+D", decl);
3378 break;
3380 case 0:
3381 /* For global variables, update the copy of the type that
3382 exists in the binding. */
3383 if (TREE_PUBLIC (decl))
3385 struct c_binding *b_ext = I_SYMBOL_BINDING (DECL_NAME (decl));
3386 while (b_ext && !B_IN_EXTERNAL_SCOPE (b_ext))
3387 b_ext = b_ext->shadowed;
3388 if (b_ext)
3390 if (b_ext->type)
3391 b_ext->type = composite_type (b_ext->type, type);
3392 else
3393 b_ext->type = type;
3396 break;
3398 default:
3399 gcc_unreachable ();
3402 if (DECL_INITIAL (decl))
3403 TREE_TYPE (DECL_INITIAL (decl)) = type;
3405 layout_decl (decl, 0);
3408 if (TREE_CODE (decl) == VAR_DECL)
3410 if (init && TREE_CODE (init) == CONSTRUCTOR)
3411 add_flexible_array_elts_to_size (decl, init);
3413 if (DECL_SIZE (decl) == 0 && TREE_TYPE (decl) != error_mark_node
3414 && COMPLETE_TYPE_P (TREE_TYPE (decl)))
3415 layout_decl (decl, 0);
3417 if (DECL_SIZE (decl) == 0
3418 /* Don't give an error if we already gave one earlier. */
3419 && TREE_TYPE (decl) != error_mark_node
3420 && (TREE_STATIC (decl)
3421 /* A static variable with an incomplete type
3422 is an error if it is initialized.
3423 Also if it is not file scope.
3424 Otherwise, let it through, but if it is not `extern'
3425 then it may cause an error message later. */
3426 ? (DECL_INITIAL (decl) != 0
3427 || !DECL_FILE_SCOPE_P (decl))
3428 /* An automatic variable with an incomplete type
3429 is an error. */
3430 : !DECL_EXTERNAL (decl)))
3432 error ("storage size of %q+D isn%'t known", decl);
3433 TREE_TYPE (decl) = error_mark_node;
3436 if ((DECL_EXTERNAL (decl) || TREE_STATIC (decl))
3437 && DECL_SIZE (decl) != 0)
3439 if (TREE_CODE (DECL_SIZE (decl)) == INTEGER_CST)
3440 constant_expression_warning (DECL_SIZE (decl));
3441 else
3442 error ("storage size of %q+D isn%'t constant", decl);
3445 if (TREE_USED (type))
3446 TREE_USED (decl) = 1;
3449 /* If this is a function and an assembler name is specified, reset DECL_RTL
3450 so we can give it its new name. Also, update built_in_decls if it
3451 was a normal built-in. */
3452 if (TREE_CODE (decl) == FUNCTION_DECL && asmspec)
3454 if (DECL_BUILT_IN_CLASS (decl) == BUILT_IN_NORMAL)
3455 set_builtin_user_assembler_name (decl, asmspec);
3456 set_user_assembler_name (decl, asmspec);
3459 /* If #pragma weak was used, mark the decl weak now. */
3460 maybe_apply_pragma_weak (decl);
3462 /* Output the assembler code and/or RTL code for variables and functions,
3463 unless the type is an undefined structure or union.
3464 If not, it will get done when the type is completed. */
3466 if (TREE_CODE (decl) == VAR_DECL || TREE_CODE (decl) == FUNCTION_DECL)
3468 /* Determine the ELF visibility. */
3469 if (TREE_PUBLIC (decl))
3470 c_determine_visibility (decl);
3472 /* This is a no-op in c-lang.c or something real in objc-act.c. */
3473 if (c_dialect_objc ())
3474 objc_check_decl (decl);
3476 if (asmspec)
3478 /* If this is not a static variable, issue a warning.
3479 It doesn't make any sense to give an ASMSPEC for an
3480 ordinary, non-register local variable. Historically,
3481 GCC has accepted -- but ignored -- the ASMSPEC in
3482 this case. */
3483 if (!DECL_FILE_SCOPE_P (decl)
3484 && TREE_CODE (decl) == VAR_DECL
3485 && !C_DECL_REGISTER (decl)
3486 && !TREE_STATIC (decl))
3487 warning (0, "ignoring asm-specifier for non-static local "
3488 "variable %q+D", decl);
3489 else
3490 set_user_assembler_name (decl, asmspec);
3493 if (DECL_FILE_SCOPE_P (decl))
3495 if (DECL_INITIAL (decl) == NULL_TREE
3496 || DECL_INITIAL (decl) == error_mark_node)
3497 /* Don't output anything
3498 when a tentative file-scope definition is seen.
3499 But at end of compilation, do output code for them. */
3500 DECL_DEFER_OUTPUT (decl) = 1;
3501 rest_of_decl_compilation (decl, true, 0);
3503 else
3505 /* In conjunction with an ASMSPEC, the `register'
3506 keyword indicates that we should place the variable
3507 in a particular register. */
3508 if (asmspec && C_DECL_REGISTER (decl))
3510 DECL_HARD_REGISTER (decl) = 1;
3511 /* This cannot be done for a structure with volatile
3512 fields, on which DECL_REGISTER will have been
3513 reset. */
3514 if (!DECL_REGISTER (decl))
3515 error ("cannot put object with volatile field into register");
3518 if (TREE_CODE (decl) != FUNCTION_DECL)
3520 /* If we're building a variable sized type, and we might be
3521 reachable other than via the top of the current binding
3522 level, then create a new BIND_EXPR so that we deallocate
3523 the object at the right time. */
3524 /* Note that DECL_SIZE can be null due to errors. */
3525 if (DECL_SIZE (decl)
3526 && !TREE_CONSTANT (DECL_SIZE (decl))
3527 && STATEMENT_LIST_HAS_LABEL (cur_stmt_list))
3529 tree bind;
3530 bind = build3 (BIND_EXPR, void_type_node, NULL, NULL, NULL);
3531 TREE_SIDE_EFFECTS (bind) = 1;
3532 add_stmt (bind);
3533 BIND_EXPR_BODY (bind) = push_stmt_list ();
3535 add_stmt (build_stmt (DECL_EXPR, decl));
3540 if (!DECL_FILE_SCOPE_P (decl))
3542 /* Recompute the RTL of a local array now
3543 if it used to be an incomplete type. */
3544 if (was_incomplete
3545 && !TREE_STATIC (decl) && !DECL_EXTERNAL (decl))
3547 /* If we used it already as memory, it must stay in memory. */
3548 TREE_ADDRESSABLE (decl) = TREE_USED (decl);
3549 /* If it's still incomplete now, no init will save it. */
3550 if (DECL_SIZE (decl) == 0)
3551 DECL_INITIAL (decl) = 0;
3556 /* If this was marked 'used', be sure it will be output. */
3557 if (lookup_attribute ("used", DECL_ATTRIBUTES (decl)))
3558 mark_decl_referenced (decl);
3560 if (TREE_CODE (decl) == TYPE_DECL)
3562 if (!DECL_FILE_SCOPE_P (decl)
3563 && variably_modified_type_p (TREE_TYPE (decl), NULL_TREE))
3564 add_stmt (build_stmt (DECL_EXPR, decl));
3566 rest_of_decl_compilation (decl, DECL_FILE_SCOPE_P (decl), 0);
3569 /* At the end of a declaration, throw away any variable type sizes
3570 of types defined inside that declaration. There is no use
3571 computing them in the following function definition. */
3572 if (current_scope == file_scope)
3573 get_pending_sizes ();
3575 /* Install a cleanup (aka destructor) if one was given. */
3576 if (TREE_CODE (decl) == VAR_DECL && !TREE_STATIC (decl))
3578 tree attr = lookup_attribute ("cleanup", DECL_ATTRIBUTES (decl));
3579 if (attr)
3581 tree cleanup_id = TREE_VALUE (TREE_VALUE (attr));
3582 tree cleanup_decl = lookup_name (cleanup_id);
3583 tree cleanup;
3585 /* Build "cleanup(&decl)" for the destructor. */
3586 cleanup = build_unary_op (ADDR_EXPR, decl, 0);
3587 cleanup = build_tree_list (NULL_TREE, cleanup);
3588 cleanup = build_function_call (cleanup_decl, cleanup);
3590 /* Don't warn about decl unused; the cleanup uses it. */
3591 TREE_USED (decl) = 1;
3592 TREE_USED (cleanup_decl) = 1;
3594 /* Initialize EH, if we've been told to do so. */
3595 if (flag_exceptions && !c_eh_initialized_p)
3597 c_eh_initialized_p = true;
3598 eh_personality_libfunc
3599 = init_one_libfunc (USING_SJLJ_EXCEPTIONS
3600 ? "__gcc_personality_sj0"
3601 : "__gcc_personality_v0");
3602 default_init_unwind_resume_libfunc ();
3603 using_eh_for_cleanups ();
3606 push_cleanup (decl, cleanup, false);
3611 /* Given a parsed parameter declaration, decode it into a PARM_DECL. */
3613 tree
3614 grokparm (const struct c_parm *parm)
3616 tree decl = grokdeclarator (parm->declarator, parm->specs, PARM, false,
3617 NULL);
3619 decl_attributes (&decl, parm->attrs, 0);
3621 return decl;
3624 /* Given a parsed parameter declaration, decode it into a PARM_DECL
3625 and push that on the current scope. */
3627 void
3628 push_parm_decl (const struct c_parm *parm)
3630 tree decl;
3632 decl = grokdeclarator (parm->declarator, parm->specs, PARM, false, NULL);
3633 decl_attributes (&decl, parm->attrs, 0);
3635 decl = pushdecl (decl);
3637 finish_decl (decl, NULL_TREE, NULL_TREE);
3640 /* Mark all the parameter declarations to date as forward decls.
3641 Also diagnose use of this extension. */
3643 void
3644 mark_forward_parm_decls (void)
3646 struct c_binding *b;
3648 if (pedantic && !current_scope->warned_forward_parm_decls)
3650 pedwarn ("ISO C forbids forward parameter declarations");
3651 current_scope->warned_forward_parm_decls = true;
3654 for (b = current_scope->bindings; b; b = b->prev)
3655 if (TREE_CODE (b->decl) == PARM_DECL)
3656 TREE_ASM_WRITTEN (b->decl) = 1;
3659 /* Build a COMPOUND_LITERAL_EXPR. TYPE is the type given in the compound
3660 literal, which may be an incomplete array type completed by the
3661 initializer; INIT is a CONSTRUCTOR that initializes the compound
3662 literal. */
3664 tree
3665 build_compound_literal (tree type, tree init)
3667 /* We do not use start_decl here because we have a type, not a declarator;
3668 and do not use finish_decl because the decl should be stored inside
3669 the COMPOUND_LITERAL_EXPR rather than added elsewhere as a DECL_EXPR. */
3670 tree decl;
3671 tree complit;
3672 tree stmt;
3674 if (type == error_mark_node)
3675 return error_mark_node;
3677 decl = build_decl (VAR_DECL, NULL_TREE, type);
3678 DECL_EXTERNAL (decl) = 0;
3679 TREE_PUBLIC (decl) = 0;
3680 TREE_STATIC (decl) = (current_scope == file_scope);
3681 DECL_CONTEXT (decl) = current_function_decl;
3682 TREE_USED (decl) = 1;
3683 TREE_TYPE (decl) = type;
3684 TREE_READONLY (decl) = TYPE_READONLY (type);
3685 store_init_value (decl, init);
3687 if (TREE_CODE (type) == ARRAY_TYPE && !COMPLETE_TYPE_P (type))
3689 int failure = complete_array_type (&TREE_TYPE (decl),
3690 DECL_INITIAL (decl), true);
3691 gcc_assert (!failure);
3693 type = TREE_TYPE (decl);
3694 TREE_TYPE (DECL_INITIAL (decl)) = type;
3697 if (type == error_mark_node || !COMPLETE_TYPE_P (type))
3698 return error_mark_node;
3700 stmt = build_stmt (DECL_EXPR, decl);
3701 complit = build1 (COMPOUND_LITERAL_EXPR, type, stmt);
3702 TREE_SIDE_EFFECTS (complit) = 1;
3704 layout_decl (decl, 0);
3706 if (TREE_STATIC (decl))
3708 /* This decl needs a name for the assembler output. */
3709 set_compound_literal_name (decl);
3710 DECL_DEFER_OUTPUT (decl) = 1;
3711 DECL_COMDAT (decl) = 1;
3712 DECL_ARTIFICIAL (decl) = 1;
3713 DECL_IGNORED_P (decl) = 1;
3714 pushdecl (decl);
3715 rest_of_decl_compilation (decl, 1, 0);
3718 return complit;
3721 /* Determine whether TYPE is a structure with a flexible array member,
3722 or a union containing such a structure (possibly recursively). */
3724 static bool
3725 flexible_array_type_p (tree type)
3727 tree x;
3728 switch (TREE_CODE (type))
3730 case RECORD_TYPE:
3731 x = TYPE_FIELDS (type);
3732 if (x == NULL_TREE)
3733 return false;
3734 while (TREE_CHAIN (x) != NULL_TREE)
3735 x = TREE_CHAIN (x);
3736 if (TREE_CODE (TREE_TYPE (x)) == ARRAY_TYPE
3737 && TYPE_SIZE (TREE_TYPE (x)) == NULL_TREE
3738 && TYPE_DOMAIN (TREE_TYPE (x)) != NULL_TREE
3739 && TYPE_MAX_VALUE (TYPE_DOMAIN (TREE_TYPE (x))) == NULL_TREE)
3740 return true;
3741 return false;
3742 case UNION_TYPE:
3743 for (x = TYPE_FIELDS (type); x != NULL_TREE; x = TREE_CHAIN (x))
3745 if (flexible_array_type_p (TREE_TYPE (x)))
3746 return true;
3748 return false;
3749 default:
3750 return false;
3754 /* Performs sanity checks on the TYPE and WIDTH of the bit-field NAME,
3755 replacing with appropriate values if they are invalid. */
3756 static void
3757 check_bitfield_type_and_width (tree *type, tree *width, const char *orig_name)
3759 tree type_mv;
3760 unsigned int max_width;
3761 unsigned HOST_WIDE_INT w;
3762 const char *name = orig_name ? orig_name: _("<anonymous>");
3764 /* Detect and ignore out of range field width and process valid
3765 field widths. */
3766 if (!INTEGRAL_TYPE_P (TREE_TYPE (*width))
3767 || TREE_CODE (*width) != INTEGER_CST)
3769 error ("bit-field %qs width not an integer constant", name);
3770 *width = integer_one_node;
3772 else
3774 constant_expression_warning (*width);
3775 if (tree_int_cst_sgn (*width) < 0)
3777 error ("negative width in bit-field %qs", name);
3778 *width = integer_one_node;
3780 else if (integer_zerop (*width) && orig_name)
3782 error ("zero width for bit-field %qs", name);
3783 *width = integer_one_node;
3787 /* Detect invalid bit-field type. */
3788 if (TREE_CODE (*type) != INTEGER_TYPE
3789 && TREE_CODE (*type) != BOOLEAN_TYPE
3790 && TREE_CODE (*type) != ENUMERAL_TYPE)
3792 error ("bit-field %qs has invalid type", name);
3793 *type = unsigned_type_node;
3796 type_mv = TYPE_MAIN_VARIANT (*type);
3797 if (pedantic
3798 && !in_system_header
3799 && type_mv != integer_type_node
3800 && type_mv != unsigned_type_node
3801 && type_mv != boolean_type_node)
3802 pedwarn ("type of bit-field %qs is a GCC extension", name);
3804 if (type_mv == boolean_type_node)
3805 max_width = CHAR_TYPE_SIZE;
3806 else
3807 max_width = TYPE_PRECISION (*type);
3809 if (0 < compare_tree_int (*width, max_width))
3811 error ("width of %qs exceeds its type", name);
3812 w = max_width;
3813 *width = build_int_cst (NULL_TREE, w);
3815 else
3816 w = tree_low_cst (*width, 1);
3818 if (TREE_CODE (*type) == ENUMERAL_TYPE)
3820 struct lang_type *lt = TYPE_LANG_SPECIFIC (*type);
3821 if (!lt
3822 || w < min_precision (lt->enum_min, TYPE_UNSIGNED (*type))
3823 || w < min_precision (lt->enum_max, TYPE_UNSIGNED (*type)))
3824 warning (0, "%qs is narrower than values of its type", name);
3829 /* Given declspecs and a declarator,
3830 determine the name and type of the object declared
3831 and construct a ..._DECL node for it.
3832 (In one case we can return a ..._TYPE node instead.
3833 For invalid input we sometimes return 0.)
3835 DECLSPECS is a c_declspecs structure for the declaration specifiers.
3837 DECL_CONTEXT says which syntactic context this declaration is in:
3838 NORMAL for most contexts. Make a VAR_DECL or FUNCTION_DECL or TYPE_DECL.
3839 FUNCDEF for a function definition. Like NORMAL but a few different
3840 error messages in each case. Return value may be zero meaning
3841 this definition is too screwy to try to parse.
3842 PARM for a parameter declaration (either within a function prototype
3843 or before a function body). Make a PARM_DECL, or return void_type_node.
3844 TYPENAME if for a typename (in a cast or sizeof).
3845 Don't make a DECL node; just return the ..._TYPE node.
3846 FIELD for a struct or union field; make a FIELD_DECL.
3847 INITIALIZED is true if the decl has an initializer.
3848 WIDTH is non-NULL for bit-fields, and is a pointer to an INTEGER_CST node
3849 representing the width of the bit-field.
3851 In the TYPENAME case, DECLARATOR is really an absolute declarator.
3852 It may also be so in the PARM case, for a prototype where the
3853 argument type is specified but not the name.
3855 This function is where the complicated C meanings of `static'
3856 and `extern' are interpreted. */
3858 static tree
3859 grokdeclarator (const struct c_declarator *declarator,
3860 struct c_declspecs *declspecs,
3861 enum decl_context decl_context, bool initialized, tree *width)
3863 tree type = declspecs->type;
3864 bool threadp = declspecs->thread_p;
3865 enum c_storage_class storage_class = declspecs->storage_class;
3866 int constp;
3867 int restrictp;
3868 int volatilep;
3869 int type_quals = TYPE_UNQUALIFIED;
3870 const char *name, *orig_name;
3871 tree typedef_type = 0;
3872 bool funcdef_flag = false;
3873 bool funcdef_syntax = false;
3874 int size_varies = 0;
3875 tree decl_attr = declspecs->decl_attr;
3876 int array_ptr_quals = TYPE_UNQUALIFIED;
3877 tree array_ptr_attrs = NULL_TREE;
3878 int array_parm_static = 0;
3879 bool array_parm_vla_unspec_p = false;
3880 tree returned_attrs = NULL_TREE;
3881 bool bitfield = width != NULL;
3882 tree element_type;
3883 struct c_arg_info *arg_info = 0;
3885 if (decl_context == FUNCDEF)
3886 funcdef_flag = true, decl_context = NORMAL;
3888 /* Look inside a declarator for the name being declared
3889 and get it as a string, for an error message. */
3891 const struct c_declarator *decl = declarator;
3892 name = 0;
3894 while (decl)
3895 switch (decl->kind)
3897 case cdk_function:
3898 case cdk_array:
3899 case cdk_pointer:
3900 funcdef_syntax = (decl->kind == cdk_function);
3901 decl = decl->declarator;
3902 break;
3904 case cdk_attrs:
3905 decl = decl->declarator;
3906 break;
3908 case cdk_id:
3909 if (decl->u.id)
3910 name = IDENTIFIER_POINTER (decl->u.id);
3911 decl = 0;
3912 break;
3914 default:
3915 gcc_unreachable ();
3917 orig_name = name;
3918 if (name == 0)
3919 name = "type name";
3922 /* A function definition's declarator must have the form of
3923 a function declarator. */
3925 if (funcdef_flag && !funcdef_syntax)
3926 return 0;
3928 /* If this looks like a function definition, make it one,
3929 even if it occurs where parms are expected.
3930 Then store_parm_decls will reject it and not use it as a parm. */
3931 if (decl_context == NORMAL && !funcdef_flag && current_scope->parm_flag)
3932 decl_context = PARM;
3934 if (declspecs->deprecated_p && deprecated_state != DEPRECATED_SUPPRESS)
3935 warn_deprecated_use (declspecs->type);
3937 if ((decl_context == NORMAL || decl_context == FIELD)
3938 && current_scope == file_scope
3939 && variably_modified_type_p (type, NULL_TREE))
3941 error ("variably modified %qs at file scope", name);
3942 type = integer_type_node;
3945 typedef_type = type;
3946 size_varies = C_TYPE_VARIABLE_SIZE (type);
3948 /* Diagnose defaulting to "int". */
3950 if (declspecs->default_int_p && !in_system_header)
3952 /* Issue a warning if this is an ISO C 99 program or if
3953 -Wreturn-type and this is a function, or if -Wimplicit;
3954 prefer the former warning since it is more explicit. */
3955 if ((warn_implicit_int || warn_return_type || flag_isoc99)
3956 && funcdef_flag)
3957 warn_about_return_type = 1;
3958 else if (warn_implicit_int || flag_isoc99)
3959 pedwarn_c99 ("type defaults to %<int%> in declaration of %qs", name);
3962 /* Adjust the type if a bit-field is being declared,
3963 -funsigned-bitfields applied and the type is not explicitly
3964 "signed". */
3965 if (bitfield && !flag_signed_bitfields && !declspecs->explicit_signed_p
3966 && TREE_CODE (type) == INTEGER_TYPE)
3967 type = c_common_unsigned_type (type);
3969 /* Figure out the type qualifiers for the declaration. There are
3970 two ways a declaration can become qualified. One is something
3971 like `const int i' where the `const' is explicit. Another is
3972 something like `typedef const int CI; CI i' where the type of the
3973 declaration contains the `const'. A third possibility is that
3974 there is a type qualifier on the element type of a typedefed
3975 array type, in which case we should extract that qualifier so
3976 that c_apply_type_quals_to_decls receives the full list of
3977 qualifiers to work with (C90 is not entirely clear about whether
3978 duplicate qualifiers should be diagnosed in this case, but it
3979 seems most appropriate to do so). */
3980 element_type = strip_array_types (type);
3981 constp = declspecs->const_p + TYPE_READONLY (element_type);
3982 restrictp = declspecs->restrict_p + TYPE_RESTRICT (element_type);
3983 volatilep = declspecs->volatile_p + TYPE_VOLATILE (element_type);
3984 if (pedantic && !flag_isoc99)
3986 if (constp > 1)
3987 pedwarn ("duplicate %<const%>");
3988 if (restrictp > 1)
3989 pedwarn ("duplicate %<restrict%>");
3990 if (volatilep > 1)
3991 pedwarn ("duplicate %<volatile%>");
3993 if (!flag_gen_aux_info && (TYPE_QUALS (element_type)))
3994 type = TYPE_MAIN_VARIANT (type);
3995 type_quals = ((constp ? TYPE_QUAL_CONST : 0)
3996 | (restrictp ? TYPE_QUAL_RESTRICT : 0)
3997 | (volatilep ? TYPE_QUAL_VOLATILE : 0));
3999 /* Warn about storage classes that are invalid for certain
4000 kinds of declarations (parameters, typenames, etc.). */
4002 if (funcdef_flag
4003 && (threadp
4004 || storage_class == csc_auto
4005 || storage_class == csc_register
4006 || storage_class == csc_typedef))
4008 if (storage_class == csc_auto
4009 && (pedantic || current_scope == file_scope))
4010 pedwarn ("function definition declared %<auto%>");
4011 if (storage_class == csc_register)
4012 error ("function definition declared %<register%>");
4013 if (storage_class == csc_typedef)
4014 error ("function definition declared %<typedef%>");
4015 if (threadp)
4016 error ("function definition declared %<__thread%>");
4017 threadp = false;
4018 if (storage_class == csc_auto
4019 || storage_class == csc_register
4020 || storage_class == csc_typedef)
4021 storage_class = csc_none;
4023 else if (decl_context != NORMAL && (storage_class != csc_none || threadp))
4025 if (decl_context == PARM && storage_class == csc_register)
4027 else
4029 switch (decl_context)
4031 case FIELD:
4032 error ("storage class specified for structure field %qs",
4033 name);
4034 break;
4035 case PARM:
4036 error ("storage class specified for parameter %qs", name);
4037 break;
4038 default:
4039 error ("storage class specified for typename");
4040 break;
4042 storage_class = csc_none;
4043 threadp = false;
4046 else if (storage_class == csc_extern
4047 && initialized
4048 && !funcdef_flag)
4050 /* 'extern' with initialization is invalid if not at file scope. */
4051 if (current_scope == file_scope)
4053 /* It is fine to have 'extern const' when compiling at C
4054 and C++ intersection. */
4055 if (!(warn_cxx_compat && constp))
4056 warning (0, "%qs initialized and declared %<extern%>", name);
4058 else
4059 error ("%qs has both %<extern%> and initializer", name);
4061 else if (current_scope == file_scope)
4063 if (storage_class == csc_auto)
4064 error ("file-scope declaration of %qs specifies %<auto%>", name);
4065 if (pedantic && storage_class == csc_register)
4066 pedwarn ("file-scope declaration of %qs specifies %<register%>", name);
4068 else
4070 if (storage_class == csc_extern && funcdef_flag)
4071 error ("nested function %qs declared %<extern%>", name);
4072 else if (threadp && storage_class == csc_none)
4074 error ("function-scope %qs implicitly auto and declared "
4075 "%<__thread%>",
4076 name);
4077 threadp = false;
4081 /* Now figure out the structure of the declarator proper.
4082 Descend through it, creating more complex types, until we reach
4083 the declared identifier (or NULL_TREE, in an absolute declarator).
4084 At each stage we maintain an unqualified version of the type
4085 together with any qualifiers that should be applied to it with
4086 c_build_qualified_type; this way, array types including
4087 multidimensional array types are first built up in unqualified
4088 form and then the qualified form is created with
4089 TYPE_MAIN_VARIANT pointing to the unqualified form. */
4091 while (declarator && declarator->kind != cdk_id)
4093 if (type == error_mark_node)
4095 declarator = declarator->declarator;
4096 continue;
4099 /* Each level of DECLARATOR is either a cdk_array (for ...[..]),
4100 a cdk_pointer (for *...),
4101 a cdk_function (for ...(...)),
4102 a cdk_attrs (for nested attributes),
4103 or a cdk_id (for the name being declared
4104 or the place in an absolute declarator
4105 where the name was omitted).
4106 For the last case, we have just exited the loop.
4108 At this point, TYPE is the type of elements of an array,
4109 or for a function to return, or for a pointer to point to.
4110 After this sequence of ifs, TYPE is the type of the
4111 array or function or pointer, and DECLARATOR has had its
4112 outermost layer removed. */
4114 if (array_ptr_quals != TYPE_UNQUALIFIED
4115 || array_ptr_attrs != NULL_TREE
4116 || array_parm_static)
4118 /* Only the innermost declarator (making a parameter be of
4119 array type which is converted to pointer type)
4120 may have static or type qualifiers. */
4121 error ("static or type qualifiers in non-parameter array declarator");
4122 array_ptr_quals = TYPE_UNQUALIFIED;
4123 array_ptr_attrs = NULL_TREE;
4124 array_parm_static = 0;
4127 switch (declarator->kind)
4129 case cdk_attrs:
4131 /* A declarator with embedded attributes. */
4132 tree attrs = declarator->u.attrs;
4133 const struct c_declarator *inner_decl;
4134 int attr_flags = 0;
4135 declarator = declarator->declarator;
4136 inner_decl = declarator;
4137 while (inner_decl->kind == cdk_attrs)
4138 inner_decl = inner_decl->declarator;
4139 if (inner_decl->kind == cdk_id)
4140 attr_flags |= (int) ATTR_FLAG_DECL_NEXT;
4141 else if (inner_decl->kind == cdk_function)
4142 attr_flags |= (int) ATTR_FLAG_FUNCTION_NEXT;
4143 else if (inner_decl->kind == cdk_array)
4144 attr_flags |= (int) ATTR_FLAG_ARRAY_NEXT;
4145 returned_attrs = decl_attributes (&type,
4146 chainon (returned_attrs, attrs),
4147 attr_flags);
4148 break;
4150 case cdk_array:
4152 tree itype = NULL_TREE;
4153 tree size = declarator->u.array.dimen;
4154 /* The index is a signed object `sizetype' bits wide. */
4155 tree index_type = c_common_signed_type (sizetype);
4157 array_ptr_quals = declarator->u.array.quals;
4158 array_ptr_attrs = declarator->u.array.attrs;
4159 array_parm_static = declarator->u.array.static_p;
4160 array_parm_vla_unspec_p = declarator->u.array.vla_unspec_p;
4162 declarator = declarator->declarator;
4164 /* Check for some types that there cannot be arrays of. */
4166 if (VOID_TYPE_P (type))
4168 error ("declaration of %qs as array of voids", name);
4169 type = error_mark_node;
4172 if (TREE_CODE (type) == FUNCTION_TYPE)
4174 error ("declaration of %qs as array of functions", name);
4175 type = error_mark_node;
4178 if (pedantic && !in_system_header && flexible_array_type_p (type))
4179 pedwarn ("invalid use of structure with flexible array member");
4181 if (size == error_mark_node)
4182 type = error_mark_node;
4184 if (type == error_mark_node)
4185 continue;
4187 /* If size was specified, set ITYPE to a range-type for
4188 that size. Otherwise, ITYPE remains null. finish_decl
4189 may figure it out from an initial value. */
4191 if (size)
4193 /* Strip NON_LVALUE_EXPRs since we aren't using as an
4194 lvalue. */
4195 STRIP_TYPE_NOPS (size);
4197 if (!INTEGRAL_TYPE_P (TREE_TYPE (size)))
4199 error ("size of array %qs has non-integer type", name);
4200 size = integer_one_node;
4203 if (pedantic && integer_zerop (size))
4204 pedwarn ("ISO C forbids zero-size array %qs", name);
4206 if (TREE_CODE (size) == INTEGER_CST)
4208 constant_expression_warning (size);
4209 if (tree_int_cst_sgn (size) < 0)
4211 error ("size of array %qs is negative", name);
4212 size = integer_one_node;
4215 else if ((decl_context == NORMAL || decl_context == FIELD)
4216 && current_scope == file_scope)
4218 error ("variably modified %qs at file scope", name);
4219 size = integer_one_node;
4221 else
4223 /* Make sure the array size remains visibly
4224 nonconstant even if it is (eg) a const variable
4225 with known value. */
4226 size_varies = 1;
4228 if (!flag_isoc99 && pedantic)
4230 if (TREE_CONSTANT (size))
4231 pedwarn ("ISO C90 forbids array %qs whose size "
4232 "can%'t be evaluated",
4233 name);
4234 else
4235 pedwarn ("ISO C90 forbids variable-size array %qs",
4236 name);
4240 if (integer_zerop (size))
4242 /* A zero-length array cannot be represented with
4243 an unsigned index type, which is what we'll
4244 get with build_index_type. Create an
4245 open-ended range instead. */
4246 itype = build_range_type (sizetype, size, NULL_TREE);
4248 else
4250 /* Arrange for the SAVE_EXPR on the inside of the
4251 MINUS_EXPR, which allows the -1 to get folded
4252 with the +1 that happens when building TYPE_SIZE. */
4253 if (size_varies)
4254 size = variable_size (size);
4256 /* Compute the maximum valid index, that is, size
4257 - 1. Do the calculation in index_type, so that
4258 if it is a variable the computations will be
4259 done in the proper mode. */
4260 itype = fold_build2 (MINUS_EXPR, index_type,
4261 convert (index_type, size),
4262 convert (index_type,
4263 size_one_node));
4265 /* If that overflowed, the array is too big. ???
4266 While a size of INT_MAX+1 technically shouldn't
4267 cause an overflow (because we subtract 1), the
4268 overflow is recorded during the conversion to
4269 index_type, before the subtraction. Handling
4270 this case seems like an unnecessary
4271 complication. */
4272 if (TREE_CODE (itype) == INTEGER_CST
4273 && TREE_OVERFLOW (itype))
4275 error ("size of array %qs is too large", name);
4276 type = error_mark_node;
4277 continue;
4280 itype = build_index_type (itype);
4283 else if (decl_context == FIELD)
4285 if (pedantic && !flag_isoc99 && !in_system_header)
4286 pedwarn ("ISO C90 does not support flexible array members");
4288 /* ISO C99 Flexible array members are effectively
4289 identical to GCC's zero-length array extension. */
4290 itype = build_range_type (sizetype, size_zero_node, NULL_TREE);
4292 else if (decl_context == PARM)
4294 if (array_parm_vla_unspec_p)
4296 if (! orig_name)
4298 /* C99 6.7.5.2p4 */
4299 error ("%<[*]%> not allowed in other than a declaration");
4302 itype = build_range_type (sizetype, size_zero_node, NULL_TREE);
4303 size_varies = 1;
4307 /* Complain about arrays of incomplete types. */
4308 if (!COMPLETE_TYPE_P (type))
4310 error ("array type has incomplete element type");
4311 type = error_mark_node;
4313 else
4314 type = build_array_type (type, itype);
4316 if (type != error_mark_node)
4318 if (size_varies)
4320 if (size && TREE_CODE (size) == INTEGER_CST)
4321 type
4322 = build_distinct_type_copy (TYPE_MAIN_VARIANT (type));
4323 C_TYPE_VARIABLE_SIZE (type) = 1;
4326 /* The GCC extension for zero-length arrays differs from
4327 ISO flexible array members in that sizeof yields
4328 zero. */
4329 if (size && integer_zerop (size))
4331 TYPE_SIZE (type) = bitsize_zero_node;
4332 TYPE_SIZE_UNIT (type) = size_zero_node;
4334 if (array_parm_vla_unspec_p)
4336 /* The type is complete. C99 6.7.5.2p4 */
4337 TYPE_SIZE (type) = bitsize_zero_node;
4338 TYPE_SIZE_UNIT (type) = size_zero_node;
4342 if (decl_context != PARM
4343 && (array_ptr_quals != TYPE_UNQUALIFIED
4344 || array_ptr_attrs != NULL_TREE
4345 || array_parm_static))
4347 error ("static or type qualifiers in non-parameter array declarator");
4348 array_ptr_quals = TYPE_UNQUALIFIED;
4349 array_ptr_attrs = NULL_TREE;
4350 array_parm_static = 0;
4352 break;
4354 case cdk_function:
4356 /* Say it's a definition only for the declarator closest
4357 to the identifier, apart possibly from some
4358 attributes. */
4359 bool really_funcdef = false;
4360 tree arg_types;
4361 if (funcdef_flag)
4363 const struct c_declarator *t = declarator->declarator;
4364 while (t->kind == cdk_attrs)
4365 t = t->declarator;
4366 really_funcdef = (t->kind == cdk_id);
4369 /* Declaring a function type. Make sure we have a valid
4370 type for the function to return. */
4371 if (type == error_mark_node)
4372 continue;
4374 size_varies = 0;
4376 /* Warn about some types functions can't return. */
4377 if (TREE_CODE (type) == FUNCTION_TYPE)
4379 error ("%qs declared as function returning a function", name);
4380 type = integer_type_node;
4382 if (TREE_CODE (type) == ARRAY_TYPE)
4384 error ("%qs declared as function returning an array", name);
4385 type = integer_type_node;
4388 /* Construct the function type and go to the next
4389 inner layer of declarator. */
4390 arg_info = declarator->u.arg_info;
4391 arg_types = grokparms (arg_info, really_funcdef);
4393 /* Type qualifiers before the return type of the function
4394 qualify the return type, not the function type. */
4395 if (type_quals)
4397 /* Type qualifiers on a function return type are
4398 normally permitted by the standard but have no
4399 effect, so give a warning at -Wreturn-type.
4400 Qualifiers on a void return type are banned on
4401 function definitions in ISO C; GCC used to used
4402 them for noreturn functions. */
4403 if (VOID_TYPE_P (type) && really_funcdef)
4404 pedwarn ("function definition has qualified void return type");
4405 else
4406 warning (OPT_Wreturn_type,
4407 "type qualifiers ignored on function return type");
4409 type = c_build_qualified_type (type, type_quals);
4411 type_quals = TYPE_UNQUALIFIED;
4413 type = build_function_type (type, arg_types);
4414 declarator = declarator->declarator;
4416 /* Set the TYPE_CONTEXTs for each tagged type which is local to
4417 the formal parameter list of this FUNCTION_TYPE to point to
4418 the FUNCTION_TYPE node itself. */
4420 tree link;
4422 for (link = arg_info->tags;
4423 link;
4424 link = TREE_CHAIN (link))
4425 TYPE_CONTEXT (TREE_VALUE (link)) = type;
4427 break;
4429 case cdk_pointer:
4431 /* Merge any constancy or volatility into the target type
4432 for the pointer. */
4434 if (pedantic && TREE_CODE (type) == FUNCTION_TYPE
4435 && type_quals)
4436 pedwarn ("ISO C forbids qualified function types");
4437 if (type_quals)
4438 type = c_build_qualified_type (type, type_quals);
4439 size_varies = 0;
4441 type = build_pointer_type (type);
4443 /* Process type qualifiers (such as const or volatile)
4444 that were given inside the `*'. */
4445 type_quals = declarator->u.pointer_quals;
4447 declarator = declarator->declarator;
4448 break;
4450 default:
4451 gcc_unreachable ();
4455 /* Now TYPE has the actual type, apart from any qualifiers in
4456 TYPE_QUALS. */
4458 /* Check the type and width of a bit-field. */
4459 if (bitfield)
4460 check_bitfield_type_and_width (&type, width, orig_name);
4462 /* Did array size calculations overflow? */
4464 if (TREE_CODE (type) == ARRAY_TYPE
4465 && COMPLETE_TYPE_P (type)
4466 && TREE_CODE (TYPE_SIZE_UNIT (type)) == INTEGER_CST
4467 && TREE_OVERFLOW (TYPE_SIZE_UNIT (type)))
4469 error ("size of array %qs is too large", name);
4470 /* If we proceed with the array type as it is, we'll eventually
4471 crash in tree_low_cst(). */
4472 type = error_mark_node;
4475 /* If this is declaring a typedef name, return a TYPE_DECL. */
4477 if (storage_class == csc_typedef)
4479 tree decl;
4480 if (pedantic && TREE_CODE (type) == FUNCTION_TYPE
4481 && type_quals)
4482 pedwarn ("ISO C forbids qualified function types");
4483 if (type_quals)
4484 type = c_build_qualified_type (type, type_quals);
4485 decl = build_decl (TYPE_DECL, declarator->u.id, type);
4486 if (declspecs->explicit_signed_p)
4487 C_TYPEDEF_EXPLICITLY_SIGNED (decl) = 1;
4488 decl_attributes (&decl, returned_attrs, 0);
4489 if (declspecs->inline_p)
4490 pedwarn ("typedef %q+D declared %<inline%>", decl);
4491 return decl;
4494 /* Detect the case of an array type of unspecified size
4495 which came, as such, direct from a typedef name.
4496 We must copy the type, so that each identifier gets
4497 a distinct type, so that each identifier's size can be
4498 controlled separately by its own initializer. */
4500 if (type != 0 && typedef_type != 0
4501 && TREE_CODE (type) == ARRAY_TYPE && TYPE_DOMAIN (type) == 0
4502 && TYPE_MAIN_VARIANT (type) == TYPE_MAIN_VARIANT (typedef_type))
4504 type = build_array_type (TREE_TYPE (type), 0);
4505 if (size_varies)
4506 C_TYPE_VARIABLE_SIZE (type) = 1;
4509 /* If this is a type name (such as, in a cast or sizeof),
4510 compute the type and return it now. */
4512 if (decl_context == TYPENAME)
4514 /* Note that the grammar rejects storage classes in typenames
4515 and fields. */
4516 gcc_assert (storage_class == csc_none && !threadp
4517 && !declspecs->inline_p);
4518 if (pedantic && TREE_CODE (type) == FUNCTION_TYPE
4519 && type_quals)
4520 pedwarn ("ISO C forbids const or volatile function types");
4521 if (type_quals)
4522 type = c_build_qualified_type (type, type_quals);
4523 decl_attributes (&type, returned_attrs, 0);
4524 return type;
4527 if (pedantic && decl_context == FIELD
4528 && variably_modified_type_p (type, NULL_TREE))
4530 /* C99 6.7.2.1p8 */
4531 pedwarn ("a member of a structure or union cannot have a variably modified type");
4534 /* Aside from typedefs and type names (handle above),
4535 `void' at top level (not within pointer)
4536 is allowed only in public variables.
4537 We don't complain about parms either, but that is because
4538 a better error message can be made later. */
4540 if (VOID_TYPE_P (type) && decl_context != PARM
4541 && !((decl_context != FIELD && TREE_CODE (type) != FUNCTION_TYPE)
4542 && (storage_class == csc_extern
4543 || (current_scope == file_scope
4544 && !(storage_class == csc_static
4545 || storage_class == csc_register)))))
4547 error ("variable or field %qs declared void", name);
4548 type = integer_type_node;
4551 /* Now create the decl, which may be a VAR_DECL, a PARM_DECL
4552 or a FUNCTION_DECL, depending on DECL_CONTEXT and TYPE. */
4555 tree decl;
4557 if (decl_context == PARM)
4559 tree type_as_written;
4560 tree promoted_type;
4562 /* A parameter declared as an array of T is really a pointer to T.
4563 One declared as a function is really a pointer to a function. */
4565 if (TREE_CODE (type) == ARRAY_TYPE)
4567 /* Transfer const-ness of array into that of type pointed to. */
4568 type = TREE_TYPE (type);
4569 if (type_quals)
4570 type = c_build_qualified_type (type, type_quals);
4571 type = build_pointer_type (type);
4572 type_quals = array_ptr_quals;
4574 /* We don't yet implement attributes in this context. */
4575 if (array_ptr_attrs != NULL_TREE)
4576 warning (OPT_Wattributes,
4577 "attributes in parameter array declarator ignored");
4579 size_varies = 0;
4581 else if (TREE_CODE (type) == FUNCTION_TYPE)
4583 if (pedantic && type_quals)
4584 pedwarn ("ISO C forbids qualified function types");
4585 if (type_quals)
4586 type = c_build_qualified_type (type, type_quals);
4587 type = build_pointer_type (type);
4588 type_quals = TYPE_UNQUALIFIED;
4590 else if (type_quals)
4591 type = c_build_qualified_type (type, type_quals);
4593 type_as_written = type;
4595 decl = build_decl (PARM_DECL, declarator->u.id, type);
4596 if (size_varies)
4597 C_DECL_VARIABLE_SIZE (decl) = 1;
4599 /* Compute the type actually passed in the parmlist,
4600 for the case where there is no prototype.
4601 (For example, shorts and chars are passed as ints.)
4602 When there is a prototype, this is overridden later. */
4604 if (type == error_mark_node)
4605 promoted_type = type;
4606 else
4607 promoted_type = c_type_promotes_to (type);
4609 DECL_ARG_TYPE (decl) = promoted_type;
4610 if (declspecs->inline_p)
4611 pedwarn ("parameter %q+D declared %<inline%>", decl);
4613 else if (decl_context == FIELD)
4615 /* Note that the grammar rejects storage classes in typenames
4616 and fields. */
4617 gcc_assert (storage_class == csc_none && !threadp
4618 && !declspecs->inline_p);
4620 /* Structure field. It may not be a function. */
4622 if (TREE_CODE (type) == FUNCTION_TYPE)
4624 error ("field %qs declared as a function", name);
4625 type = build_pointer_type (type);
4627 else if (TREE_CODE (type) != ERROR_MARK
4628 && !COMPLETE_OR_UNBOUND_ARRAY_TYPE_P (type))
4630 error ("field %qs has incomplete type", name);
4631 type = error_mark_node;
4633 type = c_build_qualified_type (type, type_quals);
4634 decl = build_decl (FIELD_DECL, declarator->u.id, type);
4635 DECL_NONADDRESSABLE_P (decl) = bitfield;
4637 if (size_varies)
4638 C_DECL_VARIABLE_SIZE (decl) = 1;
4640 else if (TREE_CODE (type) == FUNCTION_TYPE)
4642 if (storage_class == csc_register || threadp)
4644 error ("invalid storage class for function %qs", name);
4646 else if (current_scope != file_scope)
4648 /* Function declaration not at file scope. Storage
4649 classes other than `extern' are not allowed, C99
4650 6.7.1p5, and `extern' makes no difference. However,
4651 GCC allows 'auto', perhaps with 'inline', to support
4652 nested functions. */
4653 if (storage_class == csc_auto)
4655 if (pedantic)
4656 pedwarn ("invalid storage class for function %qs", name);
4658 else if (storage_class == csc_static)
4660 error ("invalid storage class for function %qs", name);
4661 if (funcdef_flag)
4662 storage_class = declspecs->storage_class = csc_none;
4663 else
4664 return 0;
4668 decl = build_decl (FUNCTION_DECL, declarator->u.id, type);
4669 decl = build_decl_attribute_variant (decl, decl_attr);
4671 DECL_LANG_SPECIFIC (decl) = GGC_CNEW (struct lang_decl);
4673 if (pedantic && type_quals && !DECL_IN_SYSTEM_HEADER (decl))
4674 pedwarn ("ISO C forbids qualified function types");
4676 /* GNU C interprets a volatile-qualified function type to indicate
4677 that the function does not return. */
4678 if ((type_quals & TYPE_QUAL_VOLATILE)
4679 && !VOID_TYPE_P (TREE_TYPE (TREE_TYPE (decl))))
4680 warning (0, "%<noreturn%> function returns non-void value");
4682 /* Every function declaration is an external reference
4683 (DECL_EXTERNAL) except for those which are not at file
4684 scope and are explicitly declared "auto". This is
4685 forbidden by standard C (C99 6.7.1p5) and is interpreted by
4686 GCC to signify a forward declaration of a nested function. */
4687 if (storage_class == csc_auto && current_scope != file_scope)
4688 DECL_EXTERNAL (decl) = 0;
4689 else
4690 DECL_EXTERNAL (decl) = 1;
4692 /* Record absence of global scope for `static' or `auto'. */
4693 TREE_PUBLIC (decl)
4694 = !(storage_class == csc_static || storage_class == csc_auto);
4696 /* For a function definition, record the argument information
4697 block where store_parm_decls will look for it. */
4698 if (funcdef_flag)
4699 current_function_arg_info = arg_info;
4701 if (declspecs->default_int_p)
4702 C_FUNCTION_IMPLICIT_INT (decl) = 1;
4704 /* Record presence of `inline', if it is reasonable. */
4705 if (flag_hosted && MAIN_NAME_P (declarator->u.id))
4707 if (declspecs->inline_p)
4708 pedwarn ("cannot inline function %<main%>");
4710 else if (declspecs->inline_p)
4712 /* Record that the function is declared `inline'. */
4713 DECL_DECLARED_INLINE_P (decl) = 1;
4715 /* Do not mark bare declarations as DECL_INLINE. Doing so
4716 in the presence of multiple declarations can result in
4717 the abstract origin pointing between the declarations,
4718 which will confuse dwarf2out. */
4719 if (initialized)
4721 DECL_INLINE (decl) = 1;
4722 if (storage_class == csc_extern)
4723 current_extern_inline = 1;
4726 /* If -finline-functions, assume it can be inlined. This does
4727 two things: let the function be deferred until it is actually
4728 needed, and let dwarf2 know that the function is inlinable. */
4729 else if (flag_inline_trees == 2 && initialized)
4730 DECL_INLINE (decl) = 1;
4732 else
4734 /* It's a variable. */
4735 /* An uninitialized decl with `extern' is a reference. */
4736 int extern_ref = !initialized && storage_class == csc_extern;
4738 type = c_build_qualified_type (type, type_quals);
4740 /* C99 6.2.2p7: It is invalid (compile-time undefined
4741 behavior) to create an 'extern' declaration for a
4742 variable if there is a global declaration that is
4743 'static' and the global declaration is not visible.
4744 (If the static declaration _is_ currently visible,
4745 the 'extern' declaration is taken to refer to that decl.) */
4746 if (extern_ref && current_scope != file_scope)
4748 tree global_decl = identifier_global_value (declarator->u.id);
4749 tree visible_decl = lookup_name (declarator->u.id);
4751 if (global_decl
4752 && global_decl != visible_decl
4753 && TREE_CODE (global_decl) == VAR_DECL
4754 && !TREE_PUBLIC (global_decl))
4755 error ("variable previously declared %<static%> redeclared "
4756 "%<extern%>");
4759 decl = build_decl (VAR_DECL, declarator->u.id, type);
4760 DECL_SOURCE_LOCATION (decl) = declarator->id_loc;
4761 if (size_varies)
4762 C_DECL_VARIABLE_SIZE (decl) = 1;
4764 if (declspecs->inline_p)
4765 pedwarn ("variable %q+D declared %<inline%>", decl);
4767 /* At file scope, an initialized extern declaration may follow
4768 a static declaration. In that case, DECL_EXTERNAL will be
4769 reset later in start_decl. */
4770 DECL_EXTERNAL (decl) = (storage_class == csc_extern);
4772 /* At file scope, the presence of a `static' or `register' storage
4773 class specifier, or the absence of all storage class specifiers
4774 makes this declaration a definition (perhaps tentative). Also,
4775 the absence of `static' makes it public. */
4776 if (current_scope == file_scope)
4778 TREE_PUBLIC (decl) = storage_class != csc_static;
4779 TREE_STATIC (decl) = !extern_ref;
4781 /* Not at file scope, only `static' makes a static definition. */
4782 else
4784 TREE_STATIC (decl) = (storage_class == csc_static);
4785 TREE_PUBLIC (decl) = extern_ref;
4788 if (threadp)
4790 if (targetm.have_tls)
4791 DECL_TLS_MODEL (decl) = decl_default_tls_model (decl);
4792 else
4793 /* A mere warning is sure to result in improper semantics
4794 at runtime. Don't bother to allow this to compile. */
4795 error ("thread-local storage not supported for this target");
4799 if (storage_class == csc_extern
4800 && variably_modified_type_p (type, NULL_TREE))
4802 /* C99 6.7.5.2p2 */
4803 error ("object with variably modified type must have no linkage");
4806 /* Record `register' declaration for warnings on &
4807 and in case doing stupid register allocation. */
4809 if (storage_class == csc_register)
4811 C_DECL_REGISTER (decl) = 1;
4812 DECL_REGISTER (decl) = 1;
4815 /* Record constancy and volatility. */
4816 c_apply_type_quals_to_decl (type_quals, decl);
4818 /* If a type has volatile components, it should be stored in memory.
4819 Otherwise, the fact that those components are volatile
4820 will be ignored, and would even crash the compiler.
4821 Of course, this only makes sense on VAR,PARM, and RESULT decl's. */
4822 if (C_TYPE_FIELDS_VOLATILE (TREE_TYPE (decl))
4823 && (TREE_CODE (decl) == VAR_DECL || TREE_CODE (decl) == PARM_DECL
4824 || TREE_CODE (decl) == RESULT_DECL))
4826 /* It is not an error for a structure with volatile fields to
4827 be declared register, but reset DECL_REGISTER since it
4828 cannot actually go in a register. */
4829 int was_reg = C_DECL_REGISTER (decl);
4830 C_DECL_REGISTER (decl) = 0;
4831 DECL_REGISTER (decl) = 0;
4832 c_mark_addressable (decl);
4833 C_DECL_REGISTER (decl) = was_reg;
4836 /* This is the earliest point at which we might know the assembler
4837 name of a variable. Thus, if it's known before this, die horribly. */
4838 gcc_assert (!DECL_ASSEMBLER_NAME_SET_P (decl));
4840 decl_attributes (&decl, returned_attrs, 0);
4842 return decl;
4846 /* Decode the parameter-list info for a function type or function definition.
4847 The argument is the value returned by `get_parm_info' (or made in c-parse.c
4848 if there is an identifier list instead of a parameter decl list).
4849 These two functions are separate because when a function returns
4850 or receives functions then each is called multiple times but the order
4851 of calls is different. The last call to `grokparms' is always the one
4852 that contains the formal parameter names of a function definition.
4854 Return a list of arg types to use in the FUNCTION_TYPE for this function.
4856 FUNCDEF_FLAG is true for a function definition, false for
4857 a mere declaration. A nonempty identifier-list gets an error message
4858 when FUNCDEF_FLAG is false. */
4860 static tree
4861 grokparms (struct c_arg_info *arg_info, bool funcdef_flag)
4863 tree arg_types = arg_info->types;
4865 if (funcdef_flag && arg_info->had_vla_unspec)
4867 /* A function definition isn't function prototype scope C99 6.2.1p4. */
4868 /* C99 6.7.5.2p4 */
4869 error ("%<[*]%> not allowed in other than function prototype scope");
4872 if (arg_types == 0 && !funcdef_flag && !in_system_header)
4873 warning (OPT_Wstrict_prototypes,
4874 "function declaration isn%'t a prototype");
4876 if (arg_types == error_mark_node)
4877 return 0; /* don't set TYPE_ARG_TYPES in this case */
4879 else if (arg_types && TREE_CODE (TREE_VALUE (arg_types)) == IDENTIFIER_NODE)
4881 if (!funcdef_flag)
4882 pedwarn ("parameter names (without types) in function declaration");
4884 arg_info->parms = arg_info->types;
4885 arg_info->types = 0;
4886 return 0;
4888 else
4890 tree parm, type, typelt;
4891 unsigned int parmno;
4893 /* If there is a parameter of incomplete type in a definition,
4894 this is an error. In a declaration this is valid, and a
4895 struct or union type may be completed later, before any calls
4896 or definition of the function. In the case where the tag was
4897 first declared within the parameter list, a warning has
4898 already been given. If a parameter has void type, then
4899 however the function cannot be defined or called, so
4900 warn. */
4902 for (parm = arg_info->parms, typelt = arg_types, parmno = 1;
4903 parm;
4904 parm = TREE_CHAIN (parm), typelt = TREE_CHAIN (typelt), parmno++)
4906 type = TREE_VALUE (typelt);
4907 if (type == error_mark_node)
4908 continue;
4910 if (!COMPLETE_TYPE_P (type))
4912 if (funcdef_flag)
4914 if (DECL_NAME (parm))
4915 error ("parameter %u (%q+D) has incomplete type",
4916 parmno, parm);
4917 else
4918 error ("%Jparameter %u has incomplete type",
4919 parm, parmno);
4921 TREE_VALUE (typelt) = error_mark_node;
4922 TREE_TYPE (parm) = error_mark_node;
4924 else if (VOID_TYPE_P (type))
4926 if (DECL_NAME (parm))
4927 warning (0, "parameter %u (%q+D) has void type",
4928 parmno, parm);
4929 else
4930 warning (0, "%Jparameter %u has void type",
4931 parm, parmno);
4935 if (DECL_NAME (parm) && TREE_USED (parm))
4936 warn_if_shadowing (parm);
4938 return arg_types;
4942 /* Take apart the current scope and return a c_arg_info structure with
4943 info on a parameter list just parsed.
4945 This structure is later fed to 'grokparms' and 'store_parm_decls'.
4947 ELLIPSIS being true means the argument list ended in '...' so don't
4948 append a sentinel (void_list_node) to the end of the type-list. */
4950 struct c_arg_info *
4951 get_parm_info (bool ellipsis)
4953 struct c_binding *b = current_scope->bindings;
4954 struct c_arg_info *arg_info = XOBNEW (&parser_obstack,
4955 struct c_arg_info);
4956 tree parms = 0;
4957 tree tags = 0;
4958 tree types = 0;
4959 tree others = 0;
4961 static bool explained_incomplete_types = false;
4962 bool gave_void_only_once_err = false;
4964 arg_info->parms = 0;
4965 arg_info->tags = 0;
4966 arg_info->types = 0;
4967 arg_info->others = 0;
4968 arg_info->had_vla_unspec = current_scope->had_vla_unspec;
4970 /* The bindings in this scope must not get put into a block.
4971 We will take care of deleting the binding nodes. */
4972 current_scope->bindings = 0;
4974 /* This function is only called if there was *something* on the
4975 parameter list. */
4976 gcc_assert (b);
4978 /* A parameter list consisting solely of 'void' indicates that the
4979 function takes no arguments. But if the 'void' is qualified
4980 (by 'const' or 'volatile'), or has a storage class specifier
4981 ('register'), then the behavior is undefined; issue an error.
4982 Typedefs for 'void' are OK (see DR#157). */
4983 if (b->prev == 0 /* one binding */
4984 && TREE_CODE (b->decl) == PARM_DECL /* which is a parameter */
4985 && !DECL_NAME (b->decl) /* anonymous */
4986 && VOID_TYPE_P (TREE_TYPE (b->decl))) /* of void type */
4988 if (TREE_THIS_VOLATILE (b->decl)
4989 || TREE_READONLY (b->decl)
4990 || C_DECL_REGISTER (b->decl))
4991 error ("%<void%> as only parameter may not be qualified");
4993 /* There cannot be an ellipsis. */
4994 if (ellipsis)
4995 error ("%<void%> must be the only parameter");
4997 arg_info->types = void_list_node;
4998 return arg_info;
5001 if (!ellipsis)
5002 types = void_list_node;
5004 /* Break up the bindings list into parms, tags, types, and others;
5005 apply sanity checks; purge the name-to-decl bindings. */
5006 while (b)
5008 tree decl = b->decl;
5009 tree type = TREE_TYPE (decl);
5010 const char *keyword;
5012 switch (TREE_CODE (decl))
5014 case PARM_DECL:
5015 if (b->id)
5017 gcc_assert (I_SYMBOL_BINDING (b->id) == b);
5018 I_SYMBOL_BINDING (b->id) = b->shadowed;
5021 /* Check for forward decls that never got their actual decl. */
5022 if (TREE_ASM_WRITTEN (decl))
5023 error ("parameter %q+D has just a forward declaration", decl);
5024 /* Check for (..., void, ...) and issue an error. */
5025 else if (VOID_TYPE_P (type) && !DECL_NAME (decl))
5027 if (!gave_void_only_once_err)
5029 error ("%<void%> must be the only parameter");
5030 gave_void_only_once_err = true;
5033 else
5035 /* Valid parameter, add it to the list. */
5036 TREE_CHAIN (decl) = parms;
5037 parms = decl;
5039 /* Since there is a prototype, args are passed in their
5040 declared types. The back end may override this later. */
5041 DECL_ARG_TYPE (decl) = type;
5042 types = tree_cons (0, type, types);
5044 break;
5046 case ENUMERAL_TYPE: keyword = "enum"; goto tag;
5047 case UNION_TYPE: keyword = "union"; goto tag;
5048 case RECORD_TYPE: keyword = "struct"; goto tag;
5049 tag:
5050 /* Types may not have tag-names, in which case the type
5051 appears in the bindings list with b->id NULL. */
5052 if (b->id)
5054 gcc_assert (I_TAG_BINDING (b->id) == b);
5055 I_TAG_BINDING (b->id) = b->shadowed;
5058 /* Warn about any struct, union or enum tags defined in a
5059 parameter list. The scope of such types is limited to
5060 the parameter list, which is rarely if ever desirable
5061 (it's impossible to call such a function with type-
5062 correct arguments). An anonymous union parm type is
5063 meaningful as a GNU extension, so don't warn for that. */
5064 if (TREE_CODE (decl) != UNION_TYPE || b->id != 0)
5066 if (b->id)
5067 /* The %s will be one of 'struct', 'union', or 'enum'. */
5068 warning (0, "%<%s %E%> declared inside parameter list",
5069 keyword, b->id);
5070 else
5071 /* The %s will be one of 'struct', 'union', or 'enum'. */
5072 warning (0, "anonymous %s declared inside parameter list",
5073 keyword);
5075 if (!explained_incomplete_types)
5077 warning (0, "its scope is only this definition or declaration,"
5078 " which is probably not what you want");
5079 explained_incomplete_types = true;
5083 tags = tree_cons (b->id, decl, tags);
5084 break;
5086 case CONST_DECL:
5087 case TYPE_DECL:
5088 case FUNCTION_DECL:
5089 /* CONST_DECLs appear here when we have an embedded enum,
5090 and TYPE_DECLs appear here when we have an embedded struct
5091 or union. No warnings for this - we already warned about the
5092 type itself. FUNCTION_DECLs appear when there is an implicit
5093 function declaration in the parameter list. */
5095 TREE_CHAIN (decl) = others;
5096 others = decl;
5097 /* fall through */
5099 case ERROR_MARK:
5100 /* error_mark_node appears here when we have an undeclared
5101 variable. Just throw it away. */
5102 if (b->id)
5104 gcc_assert (I_SYMBOL_BINDING (b->id) == b);
5105 I_SYMBOL_BINDING (b->id) = b->shadowed;
5107 break;
5109 /* Other things that might be encountered. */
5110 case LABEL_DECL:
5111 case VAR_DECL:
5112 default:
5113 gcc_unreachable ();
5116 b = free_binding_and_advance (b);
5119 arg_info->parms = parms;
5120 arg_info->tags = tags;
5121 arg_info->types = types;
5122 arg_info->others = others;
5123 return arg_info;
5126 /* Get the struct, enum or union (CODE says which) with tag NAME.
5127 Define the tag as a forward-reference if it is not defined.
5128 Return a c_typespec structure for the type specifier. */
5130 struct c_typespec
5131 parser_xref_tag (enum tree_code code, tree name)
5133 struct c_typespec ret;
5134 /* If a cross reference is requested, look up the type
5135 already defined for this tag and return it. */
5137 tree ref = lookup_tag (code, name, 0);
5138 /* If this is the right type of tag, return what we found.
5139 (This reference will be shadowed by shadow_tag later if appropriate.)
5140 If this is the wrong type of tag, do not return it. If it was the
5141 wrong type in the same scope, we will have had an error
5142 message already; if in a different scope and declaring
5143 a name, pending_xref_error will give an error message; but if in a
5144 different scope and not declaring a name, this tag should
5145 shadow the previous declaration of a different type of tag, and
5146 this would not work properly if we return the reference found.
5147 (For example, with "struct foo" in an outer scope, "union foo;"
5148 must shadow that tag with a new one of union type.) */
5149 ret.kind = (ref ? ctsk_tagref : ctsk_tagfirstref);
5150 if (ref && TREE_CODE (ref) == code)
5152 ret.spec = ref;
5153 return ret;
5156 /* If no such tag is yet defined, create a forward-reference node
5157 and record it as the "definition".
5158 When a real declaration of this type is found,
5159 the forward-reference will be altered into a real type. */
5161 ref = make_node (code);
5162 if (code == ENUMERAL_TYPE)
5164 /* Give the type a default layout like unsigned int
5165 to avoid crashing if it does not get defined. */
5166 TYPE_MODE (ref) = TYPE_MODE (unsigned_type_node);
5167 TYPE_ALIGN (ref) = TYPE_ALIGN (unsigned_type_node);
5168 TYPE_USER_ALIGN (ref) = 0;
5169 TYPE_UNSIGNED (ref) = 1;
5170 TYPE_PRECISION (ref) = TYPE_PRECISION (unsigned_type_node);
5171 TYPE_MIN_VALUE (ref) = TYPE_MIN_VALUE (unsigned_type_node);
5172 TYPE_MAX_VALUE (ref) = TYPE_MAX_VALUE (unsigned_type_node);
5175 pushtag (name, ref);
5177 ret.spec = ref;
5178 return ret;
5181 /* Get the struct, enum or union (CODE says which) with tag NAME.
5182 Define the tag as a forward-reference if it is not defined.
5183 Return a tree for the type. */
5185 tree
5186 xref_tag (enum tree_code code, tree name)
5188 return parser_xref_tag (code, name).spec;
5191 /* Make sure that the tag NAME is defined *in the current scope*
5192 at least as a forward reference.
5193 CODE says which kind of tag NAME ought to be. */
5195 tree
5196 start_struct (enum tree_code code, tree name)
5198 /* If there is already a tag defined at this scope
5199 (as a forward reference), just return it. */
5201 tree ref = 0;
5203 if (name != 0)
5204 ref = lookup_tag (code, name, 1);
5205 if (ref && TREE_CODE (ref) == code)
5207 if (TYPE_SIZE (ref))
5209 if (code == UNION_TYPE)
5210 error ("redefinition of %<union %E%>", name);
5211 else
5212 error ("redefinition of %<struct %E%>", name);
5214 else if (C_TYPE_BEING_DEFINED (ref))
5216 if (code == UNION_TYPE)
5217 error ("nested redefinition of %<union %E%>", name);
5218 else
5219 error ("nested redefinition of %<struct %E%>", name);
5222 else
5224 /* Otherwise create a forward-reference just so the tag is in scope. */
5226 ref = make_node (code);
5227 pushtag (name, ref);
5230 C_TYPE_BEING_DEFINED (ref) = 1;
5231 TYPE_PACKED (ref) = flag_pack_struct;
5232 return ref;
5235 /* Process the specs, declarator and width (NULL if omitted)
5236 of a structure component, returning a FIELD_DECL node.
5237 WIDTH is non-NULL for bit-fields only, and is an INTEGER_CST node.
5239 This is done during the parsing of the struct declaration.
5240 The FIELD_DECL nodes are chained together and the lot of them
5241 are ultimately passed to `build_struct' to make the RECORD_TYPE node. */
5243 tree
5244 grokfield (struct c_declarator *declarator, struct c_declspecs *declspecs,
5245 tree width)
5247 tree value;
5249 if (declarator->kind == cdk_id && declarator->u.id == NULL_TREE
5250 && width == NULL_TREE)
5252 /* This is an unnamed decl.
5254 If we have something of the form "union { list } ;" then this
5255 is the anonymous union extension. Similarly for struct.
5257 If this is something of the form "struct foo;", then
5258 If MS extensions are enabled, this is handled as an
5259 anonymous struct.
5260 Otherwise this is a forward declaration of a structure tag.
5262 If this is something of the form "foo;" and foo is a TYPE_DECL, then
5263 If MS extensions are enabled and foo names a structure, then
5264 again this is an anonymous struct.
5265 Otherwise this is an error.
5267 Oh what a horrid tangled web we weave. I wonder if MS consciously
5268 took this from Plan 9 or if it was an accident of implementation
5269 that took root before someone noticed the bug... */
5271 tree type = declspecs->type;
5272 bool type_ok = (TREE_CODE (type) == RECORD_TYPE
5273 || TREE_CODE (type) == UNION_TYPE);
5274 bool ok = false;
5276 if (type_ok
5277 && (flag_ms_extensions || !declspecs->typedef_p))
5279 if (flag_ms_extensions)
5280 ok = true;
5281 else if (flag_iso)
5282 ok = false;
5283 else if (TYPE_NAME (type) == NULL)
5284 ok = true;
5285 else
5286 ok = false;
5288 if (!ok)
5290 pedwarn ("declaration does not declare anything");
5291 return NULL_TREE;
5293 if (pedantic)
5294 pedwarn ("ISO C doesn%'t support unnamed structs/unions");
5297 value = grokdeclarator (declarator, declspecs, FIELD, false,
5298 width ? &width : NULL);
5300 finish_decl (value, NULL_TREE, NULL_TREE);
5301 DECL_INITIAL (value) = width;
5303 return value;
5306 /* Generate an error for any duplicate field names in FIELDLIST. Munge
5307 the list such that this does not present a problem later. */
5309 static void
5310 detect_field_duplicates (tree fieldlist)
5312 tree x, y;
5313 int timeout = 10;
5315 /* First, see if there are more than "a few" fields.
5316 This is trivially true if there are zero or one fields. */
5317 if (!fieldlist)
5318 return;
5319 x = TREE_CHAIN (fieldlist);
5320 if (!x)
5321 return;
5322 do {
5323 timeout--;
5324 x = TREE_CHAIN (x);
5325 } while (timeout > 0 && x);
5327 /* If there were "few" fields, avoid the overhead of allocating
5328 a hash table. Instead just do the nested traversal thing. */
5329 if (timeout > 0)
5331 for (x = TREE_CHAIN (fieldlist); x ; x = TREE_CHAIN (x))
5332 if (DECL_NAME (x))
5334 for (y = fieldlist; y != x; y = TREE_CHAIN (y))
5335 if (DECL_NAME (y) == DECL_NAME (x))
5337 error ("duplicate member %q+D", x);
5338 DECL_NAME (x) = NULL_TREE;
5342 else
5344 htab_t htab = htab_create (37, htab_hash_pointer, htab_eq_pointer, NULL);
5345 void **slot;
5347 for (x = fieldlist; x ; x = TREE_CHAIN (x))
5348 if ((y = DECL_NAME (x)) != 0)
5350 slot = htab_find_slot (htab, y, INSERT);
5351 if (*slot)
5353 error ("duplicate member %q+D", x);
5354 DECL_NAME (x) = NULL_TREE;
5356 *slot = y;
5359 htab_delete (htab);
5363 /* Fill in the fields of a RECORD_TYPE or UNION_TYPE node, T.
5364 FIELDLIST is a chain of FIELD_DECL nodes for the fields.
5365 ATTRIBUTES are attributes to be applied to the structure. */
5367 tree
5368 finish_struct (tree t, tree fieldlist, tree attributes)
5370 tree x;
5371 bool toplevel = file_scope == current_scope;
5372 int saw_named_field;
5374 /* If this type was previously laid out as a forward reference,
5375 make sure we lay it out again. */
5377 TYPE_SIZE (t) = 0;
5379 decl_attributes (&t, attributes, (int) ATTR_FLAG_TYPE_IN_PLACE);
5381 if (pedantic)
5383 for (x = fieldlist; x; x = TREE_CHAIN (x))
5384 if (DECL_NAME (x) != 0)
5385 break;
5387 if (x == 0)
5389 if (TREE_CODE (t) == UNION_TYPE)
5391 if (fieldlist)
5392 pedwarn ("union has no named members");
5393 else
5394 pedwarn ("union has no members");
5396 else
5398 if (fieldlist)
5399 pedwarn ("struct has no named members");
5400 else
5401 pedwarn ("struct has no members");
5406 /* Install struct as DECL_CONTEXT of each field decl.
5407 Also process specified field sizes, found in the DECL_INITIAL,
5408 storing 0 there after the type has been changed to precision equal
5409 to its width, rather than the precision of the specified standard
5410 type. (Correct layout requires the original type to have been preserved
5411 until now.) */
5413 saw_named_field = 0;
5414 for (x = fieldlist; x; x = TREE_CHAIN (x))
5416 if (TREE_TYPE (x) == error_mark_node)
5417 continue;
5419 DECL_CONTEXT (x) = t;
5421 if (TYPE_PACKED (t) && TYPE_ALIGN (TREE_TYPE (x)) > BITS_PER_UNIT)
5422 DECL_PACKED (x) = 1;
5424 /* If any field is const, the structure type is pseudo-const. */
5425 if (TREE_READONLY (x))
5426 C_TYPE_FIELDS_READONLY (t) = 1;
5427 else
5429 /* A field that is pseudo-const makes the structure likewise. */
5430 tree t1 = TREE_TYPE (x);
5431 while (TREE_CODE (t1) == ARRAY_TYPE)
5432 t1 = TREE_TYPE (t1);
5433 if ((TREE_CODE (t1) == RECORD_TYPE || TREE_CODE (t1) == UNION_TYPE)
5434 && C_TYPE_FIELDS_READONLY (t1))
5435 C_TYPE_FIELDS_READONLY (t) = 1;
5438 /* Any field that is volatile means variables of this type must be
5439 treated in some ways as volatile. */
5440 if (TREE_THIS_VOLATILE (x))
5441 C_TYPE_FIELDS_VOLATILE (t) = 1;
5443 /* Any field of nominal variable size implies structure is too. */
5444 if (C_DECL_VARIABLE_SIZE (x))
5445 C_TYPE_VARIABLE_SIZE (t) = 1;
5447 if (DECL_INITIAL (x))
5449 unsigned HOST_WIDE_INT width = tree_low_cst (DECL_INITIAL (x), 1);
5450 DECL_SIZE (x) = bitsize_int (width);
5451 DECL_BIT_FIELD (x) = 1;
5452 SET_DECL_C_BIT_FIELD (x);
5455 /* Detect flexible array member in an invalid context. */
5456 if (TREE_CODE (TREE_TYPE (x)) == ARRAY_TYPE
5457 && TYPE_SIZE (TREE_TYPE (x)) == NULL_TREE
5458 && TYPE_DOMAIN (TREE_TYPE (x)) != NULL_TREE
5459 && TYPE_MAX_VALUE (TYPE_DOMAIN (TREE_TYPE (x))) == NULL_TREE)
5461 if (TREE_CODE (t) == UNION_TYPE)
5463 error ("%Jflexible array member in union", x);
5464 TREE_TYPE (x) = error_mark_node;
5466 else if (TREE_CHAIN (x) != NULL_TREE)
5468 error ("%Jflexible array member not at end of struct", x);
5469 TREE_TYPE (x) = error_mark_node;
5471 else if (!saw_named_field)
5473 error ("%Jflexible array member in otherwise empty struct", x);
5474 TREE_TYPE (x) = error_mark_node;
5478 if (pedantic && !in_system_header && TREE_CODE (t) == RECORD_TYPE
5479 && flexible_array_type_p (TREE_TYPE (x)))
5480 pedwarn ("%Jinvalid use of structure with flexible array member", x);
5482 if (DECL_NAME (x))
5483 saw_named_field = 1;
5486 detect_field_duplicates (fieldlist);
5488 /* Now we have the nearly final fieldlist. Record it,
5489 then lay out the structure or union (including the fields). */
5491 TYPE_FIELDS (t) = fieldlist;
5493 layout_type (t);
5495 /* Give bit-fields their proper types. */
5497 tree *fieldlistp = &fieldlist;
5498 while (*fieldlistp)
5499 if (TREE_CODE (*fieldlistp) == FIELD_DECL && DECL_INITIAL (*fieldlistp)
5500 && TREE_TYPE (*fieldlistp) != error_mark_node)
5502 unsigned HOST_WIDE_INT width
5503 = tree_low_cst (DECL_INITIAL (*fieldlistp), 1);
5504 tree type = TREE_TYPE (*fieldlistp);
5505 if (width != TYPE_PRECISION (type))
5507 TREE_TYPE (*fieldlistp)
5508 = c_build_bitfield_integer_type (width, TYPE_UNSIGNED (type));
5509 DECL_MODE (*fieldlistp) = TYPE_MODE (TREE_TYPE (*fieldlistp));
5511 DECL_INITIAL (*fieldlistp) = 0;
5513 else
5514 fieldlistp = &TREE_CHAIN (*fieldlistp);
5517 /* Now we have the truly final field list.
5518 Store it in this type and in the variants. */
5520 TYPE_FIELDS (t) = fieldlist;
5522 /* If there are lots of fields, sort so we can look through them fast.
5523 We arbitrarily consider 16 or more elts to be "a lot". */
5526 int len = 0;
5528 for (x = fieldlist; x; x = TREE_CHAIN (x))
5530 if (len > 15 || DECL_NAME (x) == NULL)
5531 break;
5532 len += 1;
5535 if (len > 15)
5537 tree *field_array;
5538 struct lang_type *space;
5539 struct sorted_fields_type *space2;
5541 len += list_length (x);
5543 /* Use the same allocation policy here that make_node uses, to
5544 ensure that this lives as long as the rest of the struct decl.
5545 All decls in an inline function need to be saved. */
5547 space = GGC_CNEW (struct lang_type);
5548 space2 = GGC_NEWVAR (struct sorted_fields_type,
5549 sizeof (struct sorted_fields_type) + len * sizeof (tree));
5551 len = 0;
5552 space->s = space2;
5553 field_array = &space2->elts[0];
5554 for (x = fieldlist; x; x = TREE_CHAIN (x))
5556 field_array[len++] = x;
5558 /* If there is anonymous struct or union, break out of the loop. */
5559 if (DECL_NAME (x) == NULL)
5560 break;
5562 /* Found no anonymous struct/union. Add the TYPE_LANG_SPECIFIC. */
5563 if (x == NULL)
5565 TYPE_LANG_SPECIFIC (t) = space;
5566 TYPE_LANG_SPECIFIC (t)->s->len = len;
5567 field_array = TYPE_LANG_SPECIFIC (t)->s->elts;
5568 qsort (field_array, len, sizeof (tree), field_decl_cmp);
5573 for (x = TYPE_MAIN_VARIANT (t); x; x = TYPE_NEXT_VARIANT (x))
5575 TYPE_FIELDS (x) = TYPE_FIELDS (t);
5576 TYPE_LANG_SPECIFIC (x) = TYPE_LANG_SPECIFIC (t);
5577 C_TYPE_FIELDS_READONLY (x) = C_TYPE_FIELDS_READONLY (t);
5578 C_TYPE_FIELDS_VOLATILE (x) = C_TYPE_FIELDS_VOLATILE (t);
5579 C_TYPE_VARIABLE_SIZE (x) = C_TYPE_VARIABLE_SIZE (t);
5582 /* If this was supposed to be a transparent union, but we can't
5583 make it one, warn and turn off the flag. */
5584 if (TREE_CODE (t) == UNION_TYPE
5585 && TYPE_TRANSPARENT_UNION (t)
5586 && (!TYPE_FIELDS (t) || TYPE_MODE (t) != DECL_MODE (TYPE_FIELDS (t))))
5588 TYPE_TRANSPARENT_UNION (t) = 0;
5589 warning (0, "union cannot be made transparent");
5592 /* If this structure or union completes the type of any previous
5593 variable declaration, lay it out and output its rtl. */
5594 for (x = C_TYPE_INCOMPLETE_VARS (TYPE_MAIN_VARIANT (t));
5596 x = TREE_CHAIN (x))
5598 tree decl = TREE_VALUE (x);
5599 if (TREE_CODE (TREE_TYPE (decl)) == ARRAY_TYPE)
5600 layout_array_type (TREE_TYPE (decl));
5601 if (TREE_CODE (decl) != TYPE_DECL)
5603 layout_decl (decl, 0);
5604 if (c_dialect_objc ())
5605 objc_check_decl (decl);
5606 rest_of_decl_compilation (decl, toplevel, 0);
5607 if (!toplevel)
5608 expand_decl (decl);
5611 C_TYPE_INCOMPLETE_VARS (TYPE_MAIN_VARIANT (t)) = 0;
5613 /* Finish debugging output for this type. */
5614 rest_of_type_compilation (t, toplevel);
5616 /* If we're inside a function proper, i.e. not file-scope and not still
5617 parsing parameters, then arrange for the size of a variable sized type
5618 to be bound now. */
5619 if (cur_stmt_list && variably_modified_type_p (t, NULL_TREE))
5620 add_stmt (build_stmt (DECL_EXPR, build_decl (TYPE_DECL, NULL, t)));
5622 return t;
5625 /* Lay out the type T, and its element type, and so on. */
5627 static void
5628 layout_array_type (tree t)
5630 if (TREE_CODE (TREE_TYPE (t)) == ARRAY_TYPE)
5631 layout_array_type (TREE_TYPE (t));
5632 layout_type (t);
5635 /* Begin compiling the definition of an enumeration type.
5636 NAME is its name (or null if anonymous).
5637 Returns the type object, as yet incomplete.
5638 Also records info about it so that build_enumerator
5639 may be used to declare the individual values as they are read. */
5641 tree
5642 start_enum (tree name)
5644 tree enumtype = 0;
5646 /* If this is the real definition for a previous forward reference,
5647 fill in the contents in the same object that used to be the
5648 forward reference. */
5650 if (name != 0)
5651 enumtype = lookup_tag (ENUMERAL_TYPE, name, 1);
5653 if (enumtype == 0 || TREE_CODE (enumtype) != ENUMERAL_TYPE)
5655 enumtype = make_node (ENUMERAL_TYPE);
5656 pushtag (name, enumtype);
5659 if (C_TYPE_BEING_DEFINED (enumtype))
5660 error ("nested redefinition of %<enum %E%>", name);
5662 C_TYPE_BEING_DEFINED (enumtype) = 1;
5664 if (TYPE_VALUES (enumtype) != 0)
5666 /* This enum is a named one that has been declared already. */
5667 error ("redeclaration of %<enum %E%>", name);
5669 /* Completely replace its old definition.
5670 The old enumerators remain defined, however. */
5671 TYPE_VALUES (enumtype) = 0;
5674 enum_next_value = integer_zero_node;
5675 enum_overflow = 0;
5677 if (flag_short_enums)
5678 TYPE_PACKED (enumtype) = 1;
5680 return enumtype;
5683 /* After processing and defining all the values of an enumeration type,
5684 install their decls in the enumeration type and finish it off.
5685 ENUMTYPE is the type object, VALUES a list of decl-value pairs,
5686 and ATTRIBUTES are the specified attributes.
5687 Returns ENUMTYPE. */
5689 tree
5690 finish_enum (tree enumtype, tree values, tree attributes)
5692 tree pair, tem;
5693 tree minnode = 0, maxnode = 0;
5694 int precision, unsign;
5695 bool toplevel = (file_scope == current_scope);
5696 struct lang_type *lt;
5698 decl_attributes (&enumtype, attributes, (int) ATTR_FLAG_TYPE_IN_PLACE);
5700 /* Calculate the maximum value of any enumerator in this type. */
5702 if (values == error_mark_node)
5703 minnode = maxnode = integer_zero_node;
5704 else
5706 minnode = maxnode = TREE_VALUE (values);
5707 for (pair = TREE_CHAIN (values); pair; pair = TREE_CHAIN (pair))
5709 tree value = TREE_VALUE (pair);
5710 if (tree_int_cst_lt (maxnode, value))
5711 maxnode = value;
5712 if (tree_int_cst_lt (value, minnode))
5713 minnode = value;
5717 /* Construct the final type of this enumeration. It is the same
5718 as one of the integral types - the narrowest one that fits, except
5719 that normally we only go as narrow as int - and signed iff any of
5720 the values are negative. */
5721 unsign = (tree_int_cst_sgn (minnode) >= 0);
5722 precision = MAX (min_precision (minnode, unsign),
5723 min_precision (maxnode, unsign));
5725 if (TYPE_PACKED (enumtype) || precision > TYPE_PRECISION (integer_type_node))
5727 tem = c_common_type_for_size (precision, unsign);
5728 if (tem == NULL)
5730 warning (0, "enumeration values exceed range of largest integer");
5731 tem = long_long_integer_type_node;
5734 else
5735 tem = unsign ? unsigned_type_node : integer_type_node;
5737 TYPE_MIN_VALUE (enumtype) = TYPE_MIN_VALUE (tem);
5738 TYPE_MAX_VALUE (enumtype) = TYPE_MAX_VALUE (tem);
5739 TYPE_UNSIGNED (enumtype) = TYPE_UNSIGNED (tem);
5740 TYPE_SIZE (enumtype) = 0;
5742 /* If the precision of the type was specific with an attribute and it
5743 was too small, give an error. Otherwise, use it. */
5744 if (TYPE_PRECISION (enumtype))
5746 if (precision > TYPE_PRECISION (enumtype))
5747 error ("specified mode too small for enumeral values");
5749 else
5750 TYPE_PRECISION (enumtype) = TYPE_PRECISION (tem);
5752 layout_type (enumtype);
5754 if (values != error_mark_node)
5756 /* Change the type of the enumerators to be the enum type. We
5757 need to do this irrespective of the size of the enum, for
5758 proper type checking. Replace the DECL_INITIALs of the
5759 enumerators, and the value slots of the list, with copies
5760 that have the enum type; they cannot be modified in place
5761 because they may be shared (e.g. integer_zero_node) Finally,
5762 change the purpose slots to point to the names of the decls. */
5763 for (pair = values; pair; pair = TREE_CHAIN (pair))
5765 tree enu = TREE_PURPOSE (pair);
5766 tree ini = DECL_INITIAL (enu);
5768 TREE_TYPE (enu) = enumtype;
5770 /* The ISO C Standard mandates enumerators to have type int,
5771 even though the underlying type of an enum type is
5772 unspecified. Here we convert any enumerators that fit in
5773 an int to type int, to avoid promotions to unsigned types
5774 when comparing integers with enumerators that fit in the
5775 int range. When -pedantic is given, build_enumerator()
5776 would have already taken care of those that don't fit. */
5777 if (int_fits_type_p (ini, integer_type_node))
5778 tem = integer_type_node;
5779 else
5780 tem = enumtype;
5781 ini = convert (tem, ini);
5783 DECL_INITIAL (enu) = ini;
5784 TREE_PURPOSE (pair) = DECL_NAME (enu);
5785 TREE_VALUE (pair) = ini;
5788 TYPE_VALUES (enumtype) = values;
5791 /* Record the min/max values so that we can warn about bit-field
5792 enumerations that are too small for the values. */
5793 lt = GGC_CNEW (struct lang_type);
5794 lt->enum_min = minnode;
5795 lt->enum_max = maxnode;
5796 TYPE_LANG_SPECIFIC (enumtype) = lt;
5798 /* Fix up all variant types of this enum type. */
5799 for (tem = TYPE_MAIN_VARIANT (enumtype); tem; tem = TYPE_NEXT_VARIANT (tem))
5801 if (tem == enumtype)
5802 continue;
5803 TYPE_VALUES (tem) = TYPE_VALUES (enumtype);
5804 TYPE_MIN_VALUE (tem) = TYPE_MIN_VALUE (enumtype);
5805 TYPE_MAX_VALUE (tem) = TYPE_MAX_VALUE (enumtype);
5806 TYPE_SIZE (tem) = TYPE_SIZE (enumtype);
5807 TYPE_SIZE_UNIT (tem) = TYPE_SIZE_UNIT (enumtype);
5808 TYPE_MODE (tem) = TYPE_MODE (enumtype);
5809 TYPE_PRECISION (tem) = TYPE_PRECISION (enumtype);
5810 TYPE_ALIGN (tem) = TYPE_ALIGN (enumtype);
5811 TYPE_USER_ALIGN (tem) = TYPE_USER_ALIGN (enumtype);
5812 TYPE_UNSIGNED (tem) = TYPE_UNSIGNED (enumtype);
5813 TYPE_LANG_SPECIFIC (tem) = TYPE_LANG_SPECIFIC (enumtype);
5816 /* Finish debugging output for this type. */
5817 rest_of_type_compilation (enumtype, toplevel);
5819 return enumtype;
5822 /* Build and install a CONST_DECL for one value of the
5823 current enumeration type (one that was begun with start_enum).
5824 Return a tree-list containing the CONST_DECL and its value.
5825 Assignment of sequential values by default is handled here. */
5827 tree
5828 build_enumerator (tree name, tree value)
5830 tree decl, type;
5832 /* Validate and default VALUE. */
5834 if (value != 0)
5836 /* Don't issue more errors for error_mark_node (i.e. an
5837 undeclared identifier) - just ignore the value expression. */
5838 if (value == error_mark_node)
5839 value = 0;
5840 else if (!INTEGRAL_TYPE_P (TREE_TYPE (value))
5841 || TREE_CODE (value) != INTEGER_CST)
5843 error ("enumerator value for %qE is not an integer constant", name);
5844 value = 0;
5846 else
5848 value = default_conversion (value);
5849 constant_expression_warning (value);
5853 /* Default based on previous value. */
5854 /* It should no longer be possible to have NON_LVALUE_EXPR
5855 in the default. */
5856 if (value == 0)
5858 value = enum_next_value;
5859 if (enum_overflow)
5860 error ("overflow in enumeration values");
5863 if (pedantic && !int_fits_type_p (value, integer_type_node))
5865 pedwarn ("ISO C restricts enumerator values to range of %<int%>");
5866 /* XXX This causes -pedantic to change the meaning of the program.
5867 Remove? -zw 2004-03-15 */
5868 value = convert (integer_type_node, value);
5871 /* Set basis for default for next value. */
5872 enum_next_value = build_binary_op (PLUS_EXPR, value, integer_one_node, 0);
5873 enum_overflow = tree_int_cst_lt (enum_next_value, value);
5875 /* Now create a declaration for the enum value name. */
5877 type = TREE_TYPE (value);
5878 type = c_common_type_for_size (MAX (TYPE_PRECISION (type),
5879 TYPE_PRECISION (integer_type_node)),
5880 (TYPE_PRECISION (type)
5881 >= TYPE_PRECISION (integer_type_node)
5882 && TYPE_UNSIGNED (type)));
5884 decl = build_decl (CONST_DECL, name, type);
5885 DECL_INITIAL (decl) = convert (type, value);
5886 pushdecl (decl);
5888 return tree_cons (decl, value, NULL_TREE);
5892 /* Create the FUNCTION_DECL for a function definition.
5893 DECLSPECS, DECLARATOR and ATTRIBUTES are the parts of
5894 the declaration; they describe the function's name and the type it returns,
5895 but twisted together in a fashion that parallels the syntax of C.
5897 This function creates a binding context for the function body
5898 as well as setting up the FUNCTION_DECL in current_function_decl.
5900 Returns 1 on success. If the DECLARATOR is not suitable for a function
5901 (it defines a datum instead), we return 0, which tells
5902 yyparse to report a parse error. */
5905 start_function (struct c_declspecs *declspecs, struct c_declarator *declarator,
5906 tree attributes)
5908 tree decl1, old_decl;
5909 tree restype, resdecl;
5910 struct c_label_context_se *nstack_se;
5911 struct c_label_context_vm *nstack_vm;
5913 current_function_returns_value = 0; /* Assume, until we see it does. */
5914 current_function_returns_null = 0;
5915 current_function_returns_abnormally = 0;
5916 warn_about_return_type = 0;
5917 current_extern_inline = 0;
5918 c_switch_stack = NULL;
5920 nstack_se = XOBNEW (&parser_obstack, struct c_label_context_se);
5921 nstack_se->labels_def = NULL;
5922 nstack_se->labels_used = NULL;
5923 nstack_se->next = label_context_stack_se;
5924 label_context_stack_se = nstack_se;
5926 nstack_vm = XOBNEW (&parser_obstack, struct c_label_context_vm);
5927 nstack_vm->labels_def = NULL;
5928 nstack_vm->labels_used = NULL;
5929 nstack_vm->scope = 0;
5930 nstack_vm->next = label_context_stack_vm;
5931 label_context_stack_vm = nstack_vm;
5933 /* Indicate no valid break/continue context by setting these variables
5934 to some non-null, non-label value. We'll notice and emit the proper
5935 error message in c_finish_bc_stmt. */
5936 c_break_label = c_cont_label = size_zero_node;
5938 decl1 = grokdeclarator (declarator, declspecs, FUNCDEF, true, NULL);
5940 /* If the declarator is not suitable for a function definition,
5941 cause a syntax error. */
5942 if (decl1 == 0)
5944 label_context_stack_se = label_context_stack_se->next;
5945 label_context_stack_vm = label_context_stack_vm->next;
5946 return 0;
5949 decl_attributes (&decl1, attributes, 0);
5951 if (DECL_DECLARED_INLINE_P (decl1)
5952 && DECL_UNINLINABLE (decl1)
5953 && lookup_attribute ("noinline", DECL_ATTRIBUTES (decl1)))
5954 warning (OPT_Wattributes, "inline function %q+D given attribute noinline",
5955 decl1);
5957 announce_function (decl1);
5959 if (!COMPLETE_OR_VOID_TYPE_P (TREE_TYPE (TREE_TYPE (decl1))))
5961 error ("return type is an incomplete type");
5962 /* Make it return void instead. */
5963 TREE_TYPE (decl1)
5964 = build_function_type (void_type_node,
5965 TYPE_ARG_TYPES (TREE_TYPE (decl1)));
5968 if (warn_about_return_type)
5969 pedwarn_c99 ("return type defaults to %<int%>");
5971 /* Make the init_value nonzero so pushdecl knows this is not tentative.
5972 error_mark_node is replaced below (in pop_scope) with the BLOCK. */
5973 DECL_INITIAL (decl1) = error_mark_node;
5975 /* If this definition isn't a prototype and we had a prototype declaration
5976 before, copy the arg type info from that prototype. */
5977 old_decl = lookup_name_in_scope (DECL_NAME (decl1), current_scope);
5978 current_function_prototype_locus = UNKNOWN_LOCATION;
5979 current_function_prototype_built_in = false;
5980 current_function_prototype_arg_types = NULL_TREE;
5981 if (TYPE_ARG_TYPES (TREE_TYPE (decl1)) == 0)
5983 if (old_decl != 0 && TREE_CODE (TREE_TYPE (old_decl)) == FUNCTION_TYPE
5984 && comptypes (TREE_TYPE (TREE_TYPE (decl1)),
5985 TREE_TYPE (TREE_TYPE (old_decl))))
5987 TREE_TYPE (decl1) = composite_type (TREE_TYPE (old_decl),
5988 TREE_TYPE (decl1));
5989 current_function_prototype_locus = DECL_SOURCE_LOCATION (old_decl);
5990 current_function_prototype_built_in
5991 = C_DECL_BUILTIN_PROTOTYPE (old_decl);
5992 current_function_prototype_arg_types
5993 = TYPE_ARG_TYPES (TREE_TYPE (decl1));
5995 if (TREE_PUBLIC (decl1))
5997 /* If there is an external prototype declaration of this
5998 function, record its location but do not copy information
5999 to this decl. This may be an invisible declaration
6000 (built-in or in a scope which has finished) or simply
6001 have more refined argument types than any declaration
6002 found above. */
6003 struct c_binding *b;
6004 for (b = I_SYMBOL_BINDING (DECL_NAME (decl1)); b; b = b->shadowed)
6005 if (B_IN_SCOPE (b, external_scope))
6006 break;
6007 if (b)
6009 tree ext_decl, ext_type;
6010 ext_decl = b->decl;
6011 ext_type = b->type ? b->type : TREE_TYPE (ext_decl);
6012 if (TREE_CODE (ext_type) == FUNCTION_TYPE
6013 && comptypes (TREE_TYPE (TREE_TYPE (decl1)),
6014 TREE_TYPE (ext_type)))
6016 current_function_prototype_locus
6017 = DECL_SOURCE_LOCATION (ext_decl);
6018 current_function_prototype_built_in
6019 = C_DECL_BUILTIN_PROTOTYPE (ext_decl);
6020 current_function_prototype_arg_types
6021 = TYPE_ARG_TYPES (ext_type);
6027 /* Optionally warn of old-fashioned def with no previous prototype. */
6028 if (warn_strict_prototypes
6029 && old_decl != error_mark_node
6030 && TYPE_ARG_TYPES (TREE_TYPE (decl1)) == 0
6031 && C_DECL_ISNT_PROTOTYPE (old_decl))
6032 warning (OPT_Wstrict_prototypes,
6033 "function declaration isn%'t a prototype");
6034 /* Optionally warn of any global def with no previous prototype. */
6035 else if (warn_missing_prototypes
6036 && old_decl != error_mark_node
6037 && TREE_PUBLIC (decl1)
6038 && !MAIN_NAME_P (DECL_NAME (decl1))
6039 && C_DECL_ISNT_PROTOTYPE (old_decl))
6040 warning (OPT_Wmissing_prototypes, "no previous prototype for %q+D", decl1);
6041 /* Optionally warn of any def with no previous prototype
6042 if the function has already been used. */
6043 else if (warn_missing_prototypes
6044 && old_decl != 0
6045 && old_decl != error_mark_node
6046 && TREE_USED (old_decl)
6047 && TYPE_ARG_TYPES (TREE_TYPE (old_decl)) == 0)
6048 warning (OPT_Wmissing_prototypes,
6049 "%q+D was used with no prototype before its definition", decl1);
6050 /* Optionally warn of any global def with no previous declaration. */
6051 else if (warn_missing_declarations
6052 && TREE_PUBLIC (decl1)
6053 && old_decl == 0
6054 && !MAIN_NAME_P (DECL_NAME (decl1)))
6055 warning (OPT_Wmissing_declarations, "no previous declaration for %q+D",
6056 decl1);
6057 /* Optionally warn of any def with no previous declaration
6058 if the function has already been used. */
6059 else if (warn_missing_declarations
6060 && old_decl != 0
6061 && old_decl != error_mark_node
6062 && TREE_USED (old_decl)
6063 && C_DECL_IMPLICIT (old_decl))
6064 warning (OPT_Wmissing_declarations,
6065 "%q+D was used with no declaration before its definition", decl1);
6067 /* This is a definition, not a reference.
6068 So normally clear DECL_EXTERNAL.
6069 However, `extern inline' acts like a declaration
6070 except for defining how to inline. So set DECL_EXTERNAL in that case. */
6071 DECL_EXTERNAL (decl1) = current_extern_inline;
6073 /* This function exists in static storage.
6074 (This does not mean `static' in the C sense!) */
6075 TREE_STATIC (decl1) = 1;
6077 /* A nested function is not global. */
6078 if (current_function_decl != 0)
6079 TREE_PUBLIC (decl1) = 0;
6081 /* This is the earliest point at which we might know the assembler
6082 name of the function. Thus, if it's set before this, die horribly. */
6083 gcc_assert (!DECL_ASSEMBLER_NAME_SET_P (decl1));
6085 /* If #pragma weak was used, mark the decl weak now. */
6086 if (current_scope == file_scope)
6087 maybe_apply_pragma_weak (decl1);
6089 /* Warn for unlikely, improbable, or stupid declarations of `main'. */
6090 if (warn_main > 0 && MAIN_NAME_P (DECL_NAME (decl1)))
6092 tree args;
6093 int argct = 0;
6095 if (TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (decl1)))
6096 != integer_type_node)
6097 pedwarn ("return type of %q+D is not %<int%>", decl1);
6099 for (args = TYPE_ARG_TYPES (TREE_TYPE (decl1)); args;
6100 args = TREE_CHAIN (args))
6102 tree type = args ? TREE_VALUE (args) : 0;
6104 if (type == void_type_node)
6105 break;
6107 ++argct;
6108 switch (argct)
6110 case 1:
6111 if (TYPE_MAIN_VARIANT (type) != integer_type_node)
6112 pedwarn ("first argument of %q+D should be %<int%>", decl1);
6113 break;
6115 case 2:
6116 if (TREE_CODE (type) != POINTER_TYPE
6117 || TREE_CODE (TREE_TYPE (type)) != POINTER_TYPE
6118 || (TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (type)))
6119 != char_type_node))
6120 pedwarn ("second argument of %q+D should be %<char **%>",
6121 decl1);
6122 break;
6124 case 3:
6125 if (TREE_CODE (type) != POINTER_TYPE
6126 || TREE_CODE (TREE_TYPE (type)) != POINTER_TYPE
6127 || (TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (type)))
6128 != char_type_node))
6129 pedwarn ("third argument of %q+D should probably be "
6130 "%<char **%>", decl1);
6131 break;
6135 /* It is intentional that this message does not mention the third
6136 argument because it's only mentioned in an appendix of the
6137 standard. */
6138 if (argct > 0 && (argct < 2 || argct > 3))
6139 pedwarn ("%q+D takes only zero or two arguments", decl1);
6141 if (!TREE_PUBLIC (decl1))
6142 pedwarn ("%q+D is normally a non-static function", decl1);
6145 /* Record the decl so that the function name is defined.
6146 If we already have a decl for this name, and it is a FUNCTION_DECL,
6147 use the old decl. */
6149 current_function_decl = pushdecl (decl1);
6151 push_scope ();
6152 declare_parm_level ();
6154 restype = TREE_TYPE (TREE_TYPE (current_function_decl));
6155 /* Promote the value to int before returning it. */
6156 if (c_promoting_integer_type_p (restype))
6158 /* It retains unsignedness if not really getting wider. */
6159 if (TYPE_UNSIGNED (restype)
6160 && (TYPE_PRECISION (restype)
6161 == TYPE_PRECISION (integer_type_node)))
6162 restype = unsigned_type_node;
6163 else
6164 restype = integer_type_node;
6167 resdecl = build_decl (RESULT_DECL, NULL_TREE, restype);
6168 DECL_ARTIFICIAL (resdecl) = 1;
6169 DECL_IGNORED_P (resdecl) = 1;
6170 DECL_RESULT (current_function_decl) = resdecl;
6172 start_fname_decls ();
6174 return 1;
6177 /* Subroutine of store_parm_decls which handles new-style function
6178 definitions (prototype format). The parms already have decls, so we
6179 need only record them as in effect and complain if any redundant
6180 old-style parm decls were written. */
6181 static void
6182 store_parm_decls_newstyle (tree fndecl, const struct c_arg_info *arg_info)
6184 tree decl;
6186 if (current_scope->bindings)
6188 error ("%Jold-style parameter declarations in prototyped "
6189 "function definition", fndecl);
6191 /* Get rid of the old-style declarations. */
6192 pop_scope ();
6193 push_scope ();
6195 /* Don't issue this warning for nested functions, and don't issue this
6196 warning if we got here because ARG_INFO_TYPES was error_mark_node
6197 (this happens when a function definition has just an ellipsis in
6198 its parameter list). */
6199 else if (!in_system_header && !current_function_scope
6200 && arg_info->types != error_mark_node)
6201 warning (OPT_Wtraditional,
6202 "%Jtraditional C rejects ISO C style function definitions",
6203 fndecl);
6205 /* Now make all the parameter declarations visible in the function body.
6206 We can bypass most of the grunt work of pushdecl. */
6207 for (decl = arg_info->parms; decl; decl = TREE_CHAIN (decl))
6209 DECL_CONTEXT (decl) = current_function_decl;
6210 if (DECL_NAME (decl))
6212 bind (DECL_NAME (decl), decl, current_scope,
6213 /*invisible=*/false, /*nested=*/false);
6214 if (!TREE_USED (decl))
6215 warn_if_shadowing (decl);
6217 else
6218 error ("%Jparameter name omitted", decl);
6221 /* Record the parameter list in the function declaration. */
6222 DECL_ARGUMENTS (fndecl) = arg_info->parms;
6224 /* Now make all the ancillary declarations visible, likewise. */
6225 for (decl = arg_info->others; decl; decl = TREE_CHAIN (decl))
6227 DECL_CONTEXT (decl) = current_function_decl;
6228 if (DECL_NAME (decl))
6229 bind (DECL_NAME (decl), decl, current_scope,
6230 /*invisible=*/false, /*nested=*/false);
6233 /* And all the tag declarations. */
6234 for (decl = arg_info->tags; decl; decl = TREE_CHAIN (decl))
6235 if (TREE_PURPOSE (decl))
6236 bind (TREE_PURPOSE (decl), TREE_VALUE (decl), current_scope,
6237 /*invisible=*/false, /*nested=*/false);
6240 /* Subroutine of store_parm_decls which handles old-style function
6241 definitions (separate parameter list and declarations). */
6243 static void
6244 store_parm_decls_oldstyle (tree fndecl, const struct c_arg_info *arg_info)
6246 struct c_binding *b;
6247 tree parm, decl, last;
6248 tree parmids = arg_info->parms;
6249 struct pointer_set_t *seen_args = pointer_set_create ();
6251 if (!in_system_header)
6252 warning (OPT_Wold_style_definition, "%Jold-style function definition",
6253 fndecl);
6255 /* Match each formal parameter name with its declaration. Save each
6256 decl in the appropriate TREE_PURPOSE slot of the parmids chain. */
6257 for (parm = parmids; parm; parm = TREE_CHAIN (parm))
6259 if (TREE_VALUE (parm) == 0)
6261 error ("%Jparameter name missing from parameter list", fndecl);
6262 TREE_PURPOSE (parm) = 0;
6263 continue;
6266 b = I_SYMBOL_BINDING (TREE_VALUE (parm));
6267 if (b && B_IN_CURRENT_SCOPE (b))
6269 decl = b->decl;
6270 /* If we got something other than a PARM_DECL it is an error. */
6271 if (TREE_CODE (decl) != PARM_DECL)
6272 error ("%q+D declared as a non-parameter", decl);
6273 /* If the declaration is already marked, we have a duplicate
6274 name. Complain and ignore the duplicate. */
6275 else if (pointer_set_contains (seen_args, decl))
6277 error ("multiple parameters named %q+D", decl);
6278 TREE_PURPOSE (parm) = 0;
6279 continue;
6281 /* If the declaration says "void", complain and turn it into
6282 an int. */
6283 else if (VOID_TYPE_P (TREE_TYPE (decl)))
6285 error ("parameter %q+D declared with void type", decl);
6286 TREE_TYPE (decl) = integer_type_node;
6287 DECL_ARG_TYPE (decl) = integer_type_node;
6288 layout_decl (decl, 0);
6290 warn_if_shadowing (decl);
6292 /* If no declaration found, default to int. */
6293 else
6295 decl = build_decl (PARM_DECL, TREE_VALUE (parm), integer_type_node);
6296 DECL_ARG_TYPE (decl) = TREE_TYPE (decl);
6297 DECL_SOURCE_LOCATION (decl) = DECL_SOURCE_LOCATION (fndecl);
6298 pushdecl (decl);
6299 warn_if_shadowing (decl);
6301 if (flag_isoc99)
6302 pedwarn ("type of %q+D defaults to %<int%>", decl);
6303 else if (extra_warnings)
6304 warning (OPT_Wextra, "type of %q+D defaults to %<int%>", decl);
6307 TREE_PURPOSE (parm) = decl;
6308 pointer_set_insert (seen_args, decl);
6311 /* Now examine the parms chain for incomplete declarations
6312 and declarations with no corresponding names. */
6314 for (b = current_scope->bindings; b; b = b->prev)
6316 parm = b->decl;
6317 if (TREE_CODE (parm) != PARM_DECL)
6318 continue;
6320 if (TREE_TYPE (parm) != error_mark_node
6321 && !COMPLETE_TYPE_P (TREE_TYPE (parm)))
6323 error ("parameter %q+D has incomplete type", parm);
6324 TREE_TYPE (parm) = error_mark_node;
6327 if (!pointer_set_contains (seen_args, parm))
6329 error ("declaration for parameter %q+D but no such parameter", parm);
6331 /* Pretend the parameter was not missing.
6332 This gets us to a standard state and minimizes
6333 further error messages. */
6334 parmids = chainon (parmids, tree_cons (parm, 0, 0));
6338 /* Chain the declarations together in the order of the list of
6339 names. Store that chain in the function decl, replacing the
6340 list of names. Update the current scope to match. */
6341 DECL_ARGUMENTS (fndecl) = 0;
6343 for (parm = parmids; parm; parm = TREE_CHAIN (parm))
6344 if (TREE_PURPOSE (parm))
6345 break;
6346 if (parm && TREE_PURPOSE (parm))
6348 last = TREE_PURPOSE (parm);
6349 DECL_ARGUMENTS (fndecl) = last;
6351 for (parm = TREE_CHAIN (parm); parm; parm = TREE_CHAIN (parm))
6352 if (TREE_PURPOSE (parm))
6354 TREE_CHAIN (last) = TREE_PURPOSE (parm);
6355 last = TREE_PURPOSE (parm);
6357 TREE_CHAIN (last) = 0;
6360 pointer_set_destroy (seen_args);
6362 /* If there was a previous prototype,
6363 set the DECL_ARG_TYPE of each argument according to
6364 the type previously specified, and report any mismatches. */
6366 if (current_function_prototype_arg_types)
6368 tree type;
6369 for (parm = DECL_ARGUMENTS (fndecl),
6370 type = current_function_prototype_arg_types;
6371 parm || (type && (TYPE_MAIN_VARIANT (TREE_VALUE (type))
6372 != void_type_node));
6373 parm = TREE_CHAIN (parm), type = TREE_CHAIN (type))
6375 if (parm == 0 || type == 0
6376 || TYPE_MAIN_VARIANT (TREE_VALUE (type)) == void_type_node)
6378 if (current_function_prototype_built_in)
6379 warning (0, "number of arguments doesn%'t match "
6380 "built-in prototype");
6381 else
6383 error ("number of arguments doesn%'t match prototype");
6384 error ("%Hprototype declaration",
6385 &current_function_prototype_locus);
6387 break;
6389 /* Type for passing arg must be consistent with that
6390 declared for the arg. ISO C says we take the unqualified
6391 type for parameters declared with qualified type. */
6392 if (!comptypes (TYPE_MAIN_VARIANT (DECL_ARG_TYPE (parm)),
6393 TYPE_MAIN_VARIANT (TREE_VALUE (type))))
6395 if (TYPE_MAIN_VARIANT (TREE_TYPE (parm))
6396 == TYPE_MAIN_VARIANT (TREE_VALUE (type)))
6398 /* Adjust argument to match prototype. E.g. a previous
6399 `int foo(float);' prototype causes
6400 `int foo(x) float x; {...}' to be treated like
6401 `int foo(float x) {...}'. This is particularly
6402 useful for argument types like uid_t. */
6403 DECL_ARG_TYPE (parm) = TREE_TYPE (parm);
6405 if (targetm.calls.promote_prototypes (TREE_TYPE (current_function_decl))
6406 && INTEGRAL_TYPE_P (TREE_TYPE (parm))
6407 && TYPE_PRECISION (TREE_TYPE (parm))
6408 < TYPE_PRECISION (integer_type_node))
6409 DECL_ARG_TYPE (parm) = integer_type_node;
6411 if (pedantic)
6413 /* ??? Is it possible to get here with a
6414 built-in prototype or will it always have
6415 been diagnosed as conflicting with an
6416 old-style definition and discarded? */
6417 if (current_function_prototype_built_in)
6418 warning (0, "promoted argument %qD "
6419 "doesn%'t match built-in prototype", parm);
6420 else
6422 pedwarn ("promoted argument %qD "
6423 "doesn%'t match prototype", parm);
6424 pedwarn ("%Hprototype declaration",
6425 &current_function_prototype_locus);
6429 else
6431 if (current_function_prototype_built_in)
6432 warning (0, "argument %qD doesn%'t match "
6433 "built-in prototype", parm);
6434 else
6436 error ("argument %qD doesn%'t match prototype", parm);
6437 error ("%Hprototype declaration",
6438 &current_function_prototype_locus);
6443 TYPE_ACTUAL_ARG_TYPES (TREE_TYPE (fndecl)) = 0;
6446 /* Otherwise, create a prototype that would match. */
6448 else
6450 tree actual = 0, last = 0, type;
6452 for (parm = DECL_ARGUMENTS (fndecl); parm; parm = TREE_CHAIN (parm))
6454 type = tree_cons (NULL_TREE, DECL_ARG_TYPE (parm), NULL_TREE);
6455 if (last)
6456 TREE_CHAIN (last) = type;
6457 else
6458 actual = type;
6459 last = type;
6461 type = tree_cons (NULL_TREE, void_type_node, NULL_TREE);
6462 if (last)
6463 TREE_CHAIN (last) = type;
6464 else
6465 actual = type;
6467 /* We are going to assign a new value for the TYPE_ACTUAL_ARG_TYPES
6468 of the type of this function, but we need to avoid having this
6469 affect the types of other similarly-typed functions, so we must
6470 first force the generation of an identical (but separate) type
6471 node for the relevant function type. The new node we create
6472 will be a variant of the main variant of the original function
6473 type. */
6475 TREE_TYPE (fndecl) = build_variant_type_copy (TREE_TYPE (fndecl));
6477 TYPE_ACTUAL_ARG_TYPES (TREE_TYPE (fndecl)) = actual;
6481 /* Store parameter declarations passed in ARG_INFO into the current
6482 function declaration. */
6484 void
6485 store_parm_decls_from (struct c_arg_info *arg_info)
6487 current_function_arg_info = arg_info;
6488 store_parm_decls ();
6491 /* Store the parameter declarations into the current function declaration.
6492 This is called after parsing the parameter declarations, before
6493 digesting the body of the function.
6495 For an old-style definition, construct a prototype out of the old-style
6496 parameter declarations and inject it into the function's type. */
6498 void
6499 store_parm_decls (void)
6501 tree fndecl = current_function_decl;
6502 bool proto;
6504 /* The argument information block for FNDECL. */
6505 struct c_arg_info *arg_info = current_function_arg_info;
6506 current_function_arg_info = 0;
6508 /* True if this definition is written with a prototype. Note:
6509 despite C99 6.7.5.3p14, we can *not* treat an empty argument
6510 list in a function definition as equivalent to (void) -- an
6511 empty argument list specifies the function has no parameters,
6512 but only (void) sets up a prototype for future calls. */
6513 proto = arg_info->types != 0;
6515 if (proto)
6516 store_parm_decls_newstyle (fndecl, arg_info);
6517 else
6518 store_parm_decls_oldstyle (fndecl, arg_info);
6520 /* The next call to push_scope will be a function body. */
6522 next_is_function_body = true;
6524 /* Write a record describing this function definition to the prototypes
6525 file (if requested). */
6527 gen_aux_info_record (fndecl, 1, 0, proto);
6529 /* Initialize the RTL code for the function. */
6530 allocate_struct_function (fndecl);
6532 /* Begin the statement tree for this function. */
6533 DECL_SAVED_TREE (fndecl) = push_stmt_list ();
6535 /* ??? Insert the contents of the pending sizes list into the function
6536 to be evaluated. The only reason left to have this is
6537 void foo(int n, int array[n++])
6538 because we throw away the array type in favor of a pointer type, and
6539 thus won't naturally see the SAVE_EXPR containing the increment. All
6540 other pending sizes would be handled by gimplify_parameters. */
6542 tree t;
6543 for (t = nreverse (get_pending_sizes ()); t ; t = TREE_CHAIN (t))
6544 add_stmt (TREE_VALUE (t));
6547 /* Even though we're inside a function body, we still don't want to
6548 call expand_expr to calculate the size of a variable-sized array.
6549 We haven't necessarily assigned RTL to all variables yet, so it's
6550 not safe to try to expand expressions involving them. */
6551 cfun->x_dont_save_pending_sizes_p = 1;
6554 /* Emit diagnostics that require gimple input for detection. Operate on
6555 FNDECL and all its nested functions. */
6557 static void
6558 c_gimple_diagnostics_recursively (tree fndecl)
6560 struct cgraph_node *cgn;
6562 /* Handle attribute((warn_unused_result)). Relies on gimple input. */
6563 c_warn_unused_result (&DECL_SAVED_TREE (fndecl));
6565 /* Notice when OpenMP structured block constraints are violated. */
6566 if (flag_openmp)
6567 diagnose_omp_structured_block_errors (fndecl);
6569 /* Finalize all nested functions now. */
6570 cgn = cgraph_node (fndecl);
6571 for (cgn = cgn->nested; cgn ; cgn = cgn->next_nested)
6572 c_gimple_diagnostics_recursively (cgn->decl);
6575 /* Finish up a function declaration and compile that function
6576 all the way to assembler language output. The free the storage
6577 for the function definition.
6579 This is called after parsing the body of the function definition. */
6581 void
6582 finish_function (void)
6584 tree fndecl = current_function_decl;
6586 label_context_stack_se = label_context_stack_se->next;
6587 label_context_stack_vm = label_context_stack_vm->next;
6589 if (TREE_CODE (fndecl) == FUNCTION_DECL
6590 && targetm.calls.promote_prototypes (TREE_TYPE (fndecl)))
6592 tree args = DECL_ARGUMENTS (fndecl);
6593 for (; args; args = TREE_CHAIN (args))
6595 tree type = TREE_TYPE (args);
6596 if (INTEGRAL_TYPE_P (type)
6597 && TYPE_PRECISION (type) < TYPE_PRECISION (integer_type_node))
6598 DECL_ARG_TYPE (args) = integer_type_node;
6602 if (DECL_INITIAL (fndecl) && DECL_INITIAL (fndecl) != error_mark_node)
6603 BLOCK_SUPERCONTEXT (DECL_INITIAL (fndecl)) = fndecl;
6605 /* Must mark the RESULT_DECL as being in this function. */
6607 if (DECL_RESULT (fndecl) && DECL_RESULT (fndecl) != error_mark_node)
6608 DECL_CONTEXT (DECL_RESULT (fndecl)) = fndecl;
6610 if (MAIN_NAME_P (DECL_NAME (fndecl)) && flag_hosted)
6612 if (TYPE_MAIN_VARIANT (TREE_TYPE (TREE_TYPE (fndecl)))
6613 != integer_type_node)
6615 /* If warn_main is 1 (-Wmain) or 2 (-Wall), we have already warned.
6616 If warn_main is -1 (-Wno-main) we don't want to be warned. */
6617 if (!warn_main)
6618 pedwarn ("return type of %q+D is not %<int%>", fndecl);
6620 else
6622 if (flag_isoc99)
6624 tree stmt = c_finish_return (integer_zero_node);
6625 #ifdef USE_MAPPED_LOCATION
6626 /* Hack. We don't want the middle-end to warn that this return
6627 is unreachable, so we mark its location as special. Using
6628 UNKNOWN_LOCATION has the problem that it gets clobbered in
6629 annotate_one_with_locus. A cleaner solution might be to
6630 ensure ! should_carry_locus_p (stmt), but that needs a flag.
6632 SET_EXPR_LOCATION (stmt, BUILTINS_LOCATION);
6633 #else
6634 /* Hack. We don't want the middle-end to warn that this
6635 return is unreachable, so put the statement on the
6636 special line 0. */
6637 annotate_with_file_line (stmt, input_filename, 0);
6638 #endif
6643 /* Tie off the statement tree for this function. */
6644 DECL_SAVED_TREE (fndecl) = pop_stmt_list (DECL_SAVED_TREE (fndecl));
6646 finish_fname_decls ();
6648 /* Complain if there's just no return statement. */
6649 if (warn_return_type
6650 && TREE_CODE (TREE_TYPE (TREE_TYPE (fndecl))) != VOID_TYPE
6651 && !current_function_returns_value && !current_function_returns_null
6652 /* Don't complain if we are no-return. */
6653 && !current_function_returns_abnormally
6654 /* Don't warn for main(). */
6655 && !MAIN_NAME_P (DECL_NAME (fndecl))
6656 /* Or if they didn't actually specify a return type. */
6657 && !C_FUNCTION_IMPLICIT_INT (fndecl)
6658 /* Normally, with -Wreturn-type, flow will complain. Unless we're an
6659 inline function, as we might never be compiled separately. */
6660 && DECL_INLINE (fndecl))
6662 warning (OPT_Wreturn_type,
6663 "no return statement in function returning non-void");
6664 TREE_NO_WARNING (fndecl) = 1;
6667 /* With just -Wextra, complain only if function returns both with
6668 and without a value. */
6669 if (extra_warnings
6670 && current_function_returns_value
6671 && current_function_returns_null)
6672 warning (OPT_Wextra, "this function may return with or without a value");
6674 /* Store the end of the function, so that we get good line number
6675 info for the epilogue. */
6676 cfun->function_end_locus = input_location;
6678 /* If we don't have ctors/dtors sections, and this is a static
6679 constructor or destructor, it must be recorded now. */
6680 if (DECL_STATIC_CONSTRUCTOR (fndecl)
6681 && !targetm.have_ctors_dtors)
6682 static_ctors = tree_cons (NULL_TREE, fndecl, static_ctors);
6683 if (DECL_STATIC_DESTRUCTOR (fndecl)
6684 && !targetm.have_ctors_dtors)
6685 static_dtors = tree_cons (NULL_TREE, fndecl, static_dtors);
6687 /* Finalize the ELF visibility for the function. */
6688 c_determine_visibility (fndecl);
6690 /* Genericize before inlining. Delay genericizing nested functions
6691 until their parent function is genericized. Since finalizing
6692 requires GENERIC, delay that as well. */
6694 if (DECL_INITIAL (fndecl) && DECL_INITIAL (fndecl) != error_mark_node
6695 && !undef_nested_function)
6697 if (!decl_function_context (fndecl))
6699 c_genericize (fndecl);
6700 c_gimple_diagnostics_recursively (fndecl);
6702 /* ??? Objc emits functions after finalizing the compilation unit.
6703 This should be cleaned up later and this conditional removed. */
6704 if (cgraph_global_info_ready)
6706 c_expand_body (fndecl);
6707 return;
6710 cgraph_finalize_function (fndecl, false);
6712 else
6714 /* Register this function with cgraph just far enough to get it
6715 added to our parent's nested function list. Handy, since the
6716 C front end doesn't have such a list. */
6717 (void) cgraph_node (fndecl);
6721 if (!decl_function_context (fndecl))
6722 undef_nested_function = false;
6724 /* We're leaving the context of this function, so zap cfun.
6725 It's still in DECL_STRUCT_FUNCTION, and we'll restore it in
6726 tree_rest_of_compilation. */
6727 cfun = NULL;
6728 current_function_decl = NULL;
6731 /* Generate the RTL for the body of FNDECL. */
6733 void
6734 c_expand_body (tree fndecl)
6737 if (!DECL_INITIAL (fndecl)
6738 || DECL_INITIAL (fndecl) == error_mark_node)
6739 return;
6741 tree_rest_of_compilation (fndecl);
6743 if (DECL_STATIC_CONSTRUCTOR (fndecl)
6744 && targetm.have_ctors_dtors)
6745 targetm.asm_out.constructor (XEXP (DECL_RTL (fndecl), 0),
6746 DEFAULT_INIT_PRIORITY);
6747 if (DECL_STATIC_DESTRUCTOR (fndecl)
6748 && targetm.have_ctors_dtors)
6749 targetm.asm_out.destructor (XEXP (DECL_RTL (fndecl), 0),
6750 DEFAULT_INIT_PRIORITY);
6753 /* Check the declarations given in a for-loop for satisfying the C99
6754 constraints. If exactly one such decl is found, return it. */
6756 tree
6757 check_for_loop_decls (void)
6759 struct c_binding *b;
6760 tree one_decl = NULL_TREE;
6761 int n_decls = 0;
6764 if (!flag_isoc99)
6766 /* If we get here, declarations have been used in a for loop without
6767 the C99 for loop scope. This doesn't make much sense, so don't
6768 allow it. */
6769 error ("%<for%> loop initial declaration used outside C99 mode");
6770 return NULL_TREE;
6772 /* C99 subclause 6.8.5 paragraph 3:
6774 [#3] The declaration part of a for statement shall only
6775 declare identifiers for objects having storage class auto or
6776 register.
6778 It isn't clear whether, in this sentence, "identifiers" binds to
6779 "shall only declare" or to "objects" - that is, whether all identifiers
6780 declared must be identifiers for objects, or whether the restriction
6781 only applies to those that are. (A question on this in comp.std.c
6782 in November 2000 received no answer.) We implement the strictest
6783 interpretation, to avoid creating an extension which later causes
6784 problems. */
6786 for (b = current_scope->bindings; b; b = b->prev)
6788 tree id = b->id;
6789 tree decl = b->decl;
6791 if (!id)
6792 continue;
6794 switch (TREE_CODE (decl))
6796 case VAR_DECL:
6797 if (TREE_STATIC (decl))
6798 error ("declaration of static variable %q+D in %<for%> loop "
6799 "initial declaration", decl);
6800 else if (DECL_EXTERNAL (decl))
6801 error ("declaration of %<extern%> variable %q+D in %<for%> loop "
6802 "initial declaration", decl);
6803 break;
6805 case RECORD_TYPE:
6806 error ("%<struct %E%> declared in %<for%> loop initial declaration",
6807 id);
6808 break;
6809 case UNION_TYPE:
6810 error ("%<union %E%> declared in %<for%> loop initial declaration",
6811 id);
6812 break;
6813 case ENUMERAL_TYPE:
6814 error ("%<enum %E%> declared in %<for%> loop initial declaration",
6815 id);
6816 break;
6817 default:
6818 error ("declaration of non-variable %q+D in %<for%> loop "
6819 "initial declaration", decl);
6822 n_decls++;
6823 one_decl = decl;
6826 return n_decls == 1 ? one_decl : NULL_TREE;
6829 /* Save and reinitialize the variables
6830 used during compilation of a C function. */
6832 void
6833 c_push_function_context (struct function *f)
6835 struct language_function *p;
6836 p = GGC_NEW (struct language_function);
6837 f->language = p;
6839 p->base.x_stmt_tree = c_stmt_tree;
6840 p->x_break_label = c_break_label;
6841 p->x_cont_label = c_cont_label;
6842 p->x_switch_stack = c_switch_stack;
6843 p->arg_info = current_function_arg_info;
6844 p->returns_value = current_function_returns_value;
6845 p->returns_null = current_function_returns_null;
6846 p->returns_abnormally = current_function_returns_abnormally;
6847 p->warn_about_return_type = warn_about_return_type;
6848 p->extern_inline = current_extern_inline;
6851 /* Restore the variables used during compilation of a C function. */
6853 void
6854 c_pop_function_context (struct function *f)
6856 struct language_function *p = f->language;
6858 if (DECL_STRUCT_FUNCTION (current_function_decl) == 0
6859 && DECL_SAVED_TREE (current_function_decl) == NULL_TREE)
6861 /* Stop pointing to the local nodes about to be freed. */
6862 /* But DECL_INITIAL must remain nonzero so we know this
6863 was an actual function definition. */
6864 DECL_INITIAL (current_function_decl) = error_mark_node;
6865 DECL_ARGUMENTS (current_function_decl) = 0;
6868 c_stmt_tree = p->base.x_stmt_tree;
6869 c_break_label = p->x_break_label;
6870 c_cont_label = p->x_cont_label;
6871 c_switch_stack = p->x_switch_stack;
6872 current_function_arg_info = p->arg_info;
6873 current_function_returns_value = p->returns_value;
6874 current_function_returns_null = p->returns_null;
6875 current_function_returns_abnormally = p->returns_abnormally;
6876 warn_about_return_type = p->warn_about_return_type;
6877 current_extern_inline = p->extern_inline;
6879 f->language = NULL;
6882 /* Copy the DECL_LANG_SPECIFIC data associated with DECL. */
6884 void
6885 c_dup_lang_specific_decl (tree decl)
6887 struct lang_decl *ld;
6889 if (!DECL_LANG_SPECIFIC (decl))
6890 return;
6892 ld = GGC_NEW (struct lang_decl);
6893 memcpy (ld, DECL_LANG_SPECIFIC (decl), sizeof (struct lang_decl));
6894 DECL_LANG_SPECIFIC (decl) = ld;
6897 /* The functions below are required for functionality of doing
6898 function at once processing in the C front end. Currently these
6899 functions are not called from anywhere in the C front end, but as
6900 these changes continue, that will change. */
6902 /* Returns the stmt_tree (if any) to which statements are currently
6903 being added. If there is no active statement-tree, NULL is
6904 returned. */
6906 stmt_tree
6907 current_stmt_tree (void)
6909 return &c_stmt_tree;
6912 /* Nonzero if TYPE is an anonymous union or struct type. Always 0 in
6913 C. */
6916 anon_aggr_type_p (tree ARG_UNUSED (node))
6918 return 0;
6921 /* Return the global value of T as a symbol. */
6923 tree
6924 identifier_global_value (tree t)
6926 struct c_binding *b;
6928 for (b = I_SYMBOL_BINDING (t); b; b = b->shadowed)
6929 if (B_IN_FILE_SCOPE (b) || B_IN_EXTERNAL_SCOPE (b))
6930 return b->decl;
6932 return 0;
6935 /* Record a builtin type for C. If NAME is non-NULL, it is the name used;
6936 otherwise the name is found in ridpointers from RID_INDEX. */
6938 void
6939 record_builtin_type (enum rid rid_index, const char *name, tree type)
6941 tree id, decl;
6942 if (name == 0)
6943 id = ridpointers[(int) rid_index];
6944 else
6945 id = get_identifier (name);
6946 decl = build_decl (TYPE_DECL, id, type);
6947 pushdecl (decl);
6948 if (debug_hooks->type_decl)
6949 debug_hooks->type_decl (decl, false);
6952 /* Build the void_list_node (void_type_node having been created). */
6953 tree
6954 build_void_list_node (void)
6956 tree t = build_tree_list (NULL_TREE, void_type_node);
6957 return t;
6960 /* Return a c_parm structure with the given SPECS, ATTRS and DECLARATOR. */
6962 struct c_parm *
6963 build_c_parm (struct c_declspecs *specs, tree attrs,
6964 struct c_declarator *declarator)
6966 struct c_parm *ret = XOBNEW (&parser_obstack, struct c_parm);
6967 ret->specs = specs;
6968 ret->attrs = attrs;
6969 ret->declarator = declarator;
6970 return ret;
6973 /* Return a declarator with nested attributes. TARGET is the inner
6974 declarator to which these attributes apply. ATTRS are the
6975 attributes. */
6977 struct c_declarator *
6978 build_attrs_declarator (tree attrs, struct c_declarator *target)
6980 struct c_declarator *ret = XOBNEW (&parser_obstack, struct c_declarator);
6981 ret->kind = cdk_attrs;
6982 ret->declarator = target;
6983 ret->u.attrs = attrs;
6984 return ret;
6987 /* Return a declarator for a function with arguments specified by ARGS
6988 and return type specified by TARGET. */
6990 struct c_declarator *
6991 build_function_declarator (struct c_arg_info *args,
6992 struct c_declarator *target)
6994 struct c_declarator *ret = XOBNEW (&parser_obstack, struct c_declarator);
6995 ret->kind = cdk_function;
6996 ret->declarator = target;
6997 ret->u.arg_info = args;
6998 return ret;
7001 /* Return a declarator for the identifier IDENT (which may be
7002 NULL_TREE for an abstract declarator). */
7004 struct c_declarator *
7005 build_id_declarator (tree ident)
7007 struct c_declarator *ret = XOBNEW (&parser_obstack, struct c_declarator);
7008 ret->kind = cdk_id;
7009 ret->declarator = 0;
7010 ret->u.id = ident;
7011 /* Default value - may get reset to a more precise location. */
7012 ret->id_loc = input_location;
7013 return ret;
7016 /* Return something to represent absolute declarators containing a *.
7017 TARGET is the absolute declarator that the * contains.
7018 TYPE_QUALS_ATTRS is a structure for type qualifiers and attributes
7019 to apply to the pointer type. */
7021 struct c_declarator *
7022 make_pointer_declarator (struct c_declspecs *type_quals_attrs,
7023 struct c_declarator *target)
7025 tree attrs;
7026 int quals = 0;
7027 struct c_declarator *itarget = target;
7028 struct c_declarator *ret = XOBNEW (&parser_obstack, struct c_declarator);
7029 if (type_quals_attrs)
7031 attrs = type_quals_attrs->attrs;
7032 quals = quals_from_declspecs (type_quals_attrs);
7033 if (attrs != NULL_TREE)
7034 itarget = build_attrs_declarator (attrs, target);
7036 ret->kind = cdk_pointer;
7037 ret->declarator = itarget;
7038 ret->u.pointer_quals = quals;
7039 return ret;
7042 /* Return a pointer to a structure for an empty list of declaration
7043 specifiers. */
7045 struct c_declspecs *
7046 build_null_declspecs (void)
7048 struct c_declspecs *ret = XOBNEW (&parser_obstack, struct c_declspecs);
7049 ret->type = 0;
7050 ret->decl_attr = 0;
7051 ret->attrs = 0;
7052 ret->typespec_word = cts_none;
7053 ret->storage_class = csc_none;
7054 ret->declspecs_seen_p = false;
7055 ret->type_seen_p = false;
7056 ret->non_sc_seen_p = false;
7057 ret->typedef_p = false;
7058 ret->tag_defined_p = false;
7059 ret->explicit_signed_p = false;
7060 ret->deprecated_p = false;
7061 ret->default_int_p = false;
7062 ret->long_p = false;
7063 ret->long_long_p = false;
7064 ret->short_p = false;
7065 ret->signed_p = false;
7066 ret->unsigned_p = false;
7067 ret->complex_p = false;
7068 ret->inline_p = false;
7069 ret->thread_p = false;
7070 ret->const_p = false;
7071 ret->volatile_p = false;
7072 ret->restrict_p = false;
7073 return ret;
7076 /* Add the type qualifier QUAL to the declaration specifiers SPECS,
7077 returning SPECS. */
7079 struct c_declspecs *
7080 declspecs_add_qual (struct c_declspecs *specs, tree qual)
7082 enum rid i;
7083 bool dupe = false;
7084 specs->non_sc_seen_p = true;
7085 specs->declspecs_seen_p = true;
7086 gcc_assert (TREE_CODE (qual) == IDENTIFIER_NODE
7087 && C_IS_RESERVED_WORD (qual));
7088 i = C_RID_CODE (qual);
7089 switch (i)
7091 case RID_CONST:
7092 dupe = specs->const_p;
7093 specs->const_p = true;
7094 break;
7095 case RID_VOLATILE:
7096 dupe = specs->volatile_p;
7097 specs->volatile_p = true;
7098 break;
7099 case RID_RESTRICT:
7100 dupe = specs->restrict_p;
7101 specs->restrict_p = true;
7102 break;
7103 default:
7104 gcc_unreachable ();
7106 if (dupe && pedantic && !flag_isoc99)
7107 pedwarn ("duplicate %qE", qual);
7108 return specs;
7111 /* Add the type specifier TYPE to the declaration specifiers SPECS,
7112 returning SPECS. */
7114 struct c_declspecs *
7115 declspecs_add_type (struct c_declspecs *specs, struct c_typespec spec)
7117 tree type = spec.spec;
7118 specs->non_sc_seen_p = true;
7119 specs->declspecs_seen_p = true;
7120 specs->type_seen_p = true;
7121 if (TREE_DEPRECATED (type))
7122 specs->deprecated_p = true;
7124 /* Handle type specifier keywords. */
7125 if (TREE_CODE (type) == IDENTIFIER_NODE && C_IS_RESERVED_WORD (type))
7127 enum rid i = C_RID_CODE (type);
7128 if (specs->type)
7130 error ("two or more data types in declaration specifiers");
7131 return specs;
7133 if ((int) i <= (int) RID_LAST_MODIFIER)
7135 /* "long", "short", "signed", "unsigned" or "_Complex". */
7136 bool dupe = false;
7137 switch (i)
7139 case RID_LONG:
7140 if (specs->long_long_p)
7142 error ("%<long long long%> is too long for GCC");
7143 break;
7145 if (specs->long_p)
7147 if (specs->typespec_word == cts_double)
7149 error ("both %<long long%> and %<double%> in "
7150 "declaration specifiers");
7151 break;
7153 if (pedantic && !flag_isoc99 && !in_system_header
7154 && warn_long_long)
7155 pedwarn ("ISO C90 does not support %<long long%>");
7156 specs->long_long_p = 1;
7157 break;
7159 if (specs->short_p)
7160 error ("both %<long%> and %<short%> in "
7161 "declaration specifiers");
7162 else if (specs->typespec_word == cts_void)
7163 error ("both %<long%> and %<void%> in "
7164 "declaration specifiers");
7165 else if (specs->typespec_word == cts_bool)
7166 error ("both %<long%> and %<_Bool%> in "
7167 "declaration specifiers");
7168 else if (specs->typespec_word == cts_char)
7169 error ("both %<long%> and %<char%> in "
7170 "declaration specifiers");
7171 else if (specs->typespec_word == cts_float)
7172 error ("both %<long%> and %<float%> in "
7173 "declaration specifiers");
7174 else if (specs->typespec_word == cts_dfloat32)
7175 error ("both %<long%> and %<_Decimal32%> in "
7176 "declaration specifiers");
7177 else if (specs->typespec_word == cts_dfloat64)
7178 error ("both %<long%> and %<_Decimal64%> in "
7179 "declaration specifiers");
7180 else if (specs->typespec_word == cts_dfloat128)
7181 error ("both %<long%> and %<_Decimal128%> in "
7182 "declaration specifiers");
7183 else
7184 specs->long_p = true;
7185 break;
7186 case RID_SHORT:
7187 dupe = specs->short_p;
7188 if (specs->long_p)
7189 error ("both %<long%> and %<short%> in "
7190 "declaration specifiers");
7191 else if (specs->typespec_word == cts_void)
7192 error ("both %<short%> and %<void%> in "
7193 "declaration specifiers");
7194 else if (specs->typespec_word == cts_bool)
7195 error ("both %<short%> and %<_Bool%> in "
7196 "declaration specifiers");
7197 else if (specs->typespec_word == cts_char)
7198 error ("both %<short%> and %<char%> in "
7199 "declaration specifiers");
7200 else if (specs->typespec_word == cts_float)
7201 error ("both %<short%> and %<float%> in "
7202 "declaration specifiers");
7203 else if (specs->typespec_word == cts_double)
7204 error ("both %<short%> and %<double%> in "
7205 "declaration specifiers");
7206 else if (specs->typespec_word == cts_dfloat32)
7207 error ("both %<short%> and %<_Decimal32%> in "
7208 "declaration specifiers");
7209 else if (specs->typespec_word == cts_dfloat64)
7210 error ("both %<short%> and %<_Decimal64%> in "
7211 "declaration specifiers");
7212 else if (specs->typespec_word == cts_dfloat128)
7213 error ("both %<short%> and %<_Decimal128%> in "
7214 "declaration specifiers");
7215 else
7216 specs->short_p = true;
7217 break;
7218 case RID_SIGNED:
7219 dupe = specs->signed_p;
7220 if (specs->unsigned_p)
7221 error ("both %<signed%> and %<unsigned%> in "
7222 "declaration specifiers");
7223 else if (specs->typespec_word == cts_void)
7224 error ("both %<signed%> and %<void%> in "
7225 "declaration specifiers");
7226 else if (specs->typespec_word == cts_bool)
7227 error ("both %<signed%> and %<_Bool%> in "
7228 "declaration specifiers");
7229 else if (specs->typespec_word == cts_float)
7230 error ("both %<signed%> and %<float%> in "
7231 "declaration specifiers");
7232 else if (specs->typespec_word == cts_double)
7233 error ("both %<signed%> and %<double%> in "
7234 "declaration specifiers");
7235 else if (specs->typespec_word == cts_dfloat32)
7236 error ("both %<signed%> and %<_Decimal32%> in "
7237 "declaration specifiers");
7238 else if (specs->typespec_word == cts_dfloat64)
7239 error ("both %<signed%> and %<_Decimal64%> in "
7240 "declaration specifiers");
7241 else if (specs->typespec_word == cts_dfloat128)
7242 error ("both %<signed%> and %<_Decimal128%> in "
7243 "declaration specifiers");
7244 else
7245 specs->signed_p = true;
7246 break;
7247 case RID_UNSIGNED:
7248 dupe = specs->unsigned_p;
7249 if (specs->signed_p)
7250 error ("both %<signed%> and %<unsigned%> in "
7251 "declaration specifiers");
7252 else if (specs->typespec_word == cts_void)
7253 error ("both %<unsigned%> and %<void%> in "
7254 "declaration specifiers");
7255 else if (specs->typespec_word == cts_bool)
7256 error ("both %<unsigned%> and %<_Bool%> in "
7257 "declaration specifiers");
7258 else if (specs->typespec_word == cts_float)
7259 error ("both %<unsigned%> and %<float%> in "
7260 "declaration specifiers");
7261 else if (specs->typespec_word == cts_double)
7262 error ("both %<unsigned%> and %<double%> in "
7263 "declaration specifiers");
7264 else if (specs->typespec_word == cts_dfloat32)
7265 error ("both %<unsigned%> and %<_Decimal32%> in "
7266 "declaration specifiers");
7267 else if (specs->typespec_word == cts_dfloat64)
7268 error ("both %<unsigned%> and %<_Decimal64%> in "
7269 "declaration specifiers");
7270 else if (specs->typespec_word == cts_dfloat128)
7271 error ("both %<unsigned%> and %<_Decimal128%> in "
7272 "declaration specifiers");
7273 else
7274 specs->unsigned_p = true;
7275 break;
7276 case RID_COMPLEX:
7277 dupe = specs->complex_p;
7278 if (pedantic && !flag_isoc99 && !in_system_header)
7279 pedwarn ("ISO C90 does not support complex types");
7280 if (specs->typespec_word == cts_void)
7281 error ("both %<complex%> and %<void%> in "
7282 "declaration specifiers");
7283 else if (specs->typespec_word == cts_bool)
7284 error ("both %<complex%> and %<_Bool%> in "
7285 "declaration specifiers");
7286 else if (specs->typespec_word == cts_dfloat32)
7287 error ("both %<complex%> and %<_Decimal32%> in "
7288 "declaration specifiers");
7289 else if (specs->typespec_word == cts_dfloat64)
7290 error ("both %<complex%> and %<_Decimal64%> in "
7291 "declaration specifiers");
7292 else if (specs->typespec_word == cts_dfloat128)
7293 error ("both %<complex%> and %<_Decimal128%> in "
7294 "declaration specifiers");
7295 else
7296 specs->complex_p = true;
7297 break;
7298 default:
7299 gcc_unreachable ();
7302 if (dupe)
7303 error ("duplicate %qE", type);
7305 return specs;
7307 else
7309 /* "void", "_Bool", "char", "int", "float" or "double". */
7310 if (specs->typespec_word != cts_none)
7312 error ("two or more data types in declaration specifiers");
7313 return specs;
7315 switch (i)
7317 case RID_VOID:
7318 if (specs->long_p)
7319 error ("both %<long%> and %<void%> in "
7320 "declaration specifiers");
7321 else if (specs->short_p)
7322 error ("both %<short%> and %<void%> in "
7323 "declaration specifiers");
7324 else if (specs->signed_p)
7325 error ("both %<signed%> and %<void%> in "
7326 "declaration specifiers");
7327 else if (specs->unsigned_p)
7328 error ("both %<unsigned%> and %<void%> in "
7329 "declaration specifiers");
7330 else if (specs->complex_p)
7331 error ("both %<complex%> and %<void%> in "
7332 "declaration specifiers");
7333 else
7334 specs->typespec_word = cts_void;
7335 return specs;
7336 case RID_BOOL:
7337 if (specs->long_p)
7338 error ("both %<long%> and %<_Bool%> in "
7339 "declaration specifiers");
7340 else if (specs->short_p)
7341 error ("both %<short%> and %<_Bool%> in "
7342 "declaration specifiers");
7343 else if (specs->signed_p)
7344 error ("both %<signed%> and %<_Bool%> in "
7345 "declaration specifiers");
7346 else if (specs->unsigned_p)
7347 error ("both %<unsigned%> and %<_Bool%> in "
7348 "declaration specifiers");
7349 else if (specs->complex_p)
7350 error ("both %<complex%> and %<_Bool%> in "
7351 "declaration specifiers");
7352 else
7353 specs->typespec_word = cts_bool;
7354 return specs;
7355 case RID_CHAR:
7356 if (specs->long_p)
7357 error ("both %<long%> and %<char%> in "
7358 "declaration specifiers");
7359 else if (specs->short_p)
7360 error ("both %<short%> and %<char%> in "
7361 "declaration specifiers");
7362 else
7363 specs->typespec_word = cts_char;
7364 return specs;
7365 case RID_INT:
7366 specs->typespec_word = cts_int;
7367 return specs;
7368 case RID_FLOAT:
7369 if (specs->long_p)
7370 error ("both %<long%> and %<float%> in "
7371 "declaration specifiers");
7372 else if (specs->short_p)
7373 error ("both %<short%> and %<float%> in "
7374 "declaration specifiers");
7375 else if (specs->signed_p)
7376 error ("both %<signed%> and %<float%> in "
7377 "declaration specifiers");
7378 else if (specs->unsigned_p)
7379 error ("both %<unsigned%> and %<float%> in "
7380 "declaration specifiers");
7381 else
7382 specs->typespec_word = cts_float;
7383 return specs;
7384 case RID_DOUBLE:
7385 if (specs->long_long_p)
7386 error ("both %<long long%> and %<double%> in "
7387 "declaration specifiers");
7388 else if (specs->short_p)
7389 error ("both %<short%> and %<double%> in "
7390 "declaration specifiers");
7391 else if (specs->signed_p)
7392 error ("both %<signed%> and %<double%> in "
7393 "declaration specifiers");
7394 else if (specs->unsigned_p)
7395 error ("both %<unsigned%> and %<double%> in "
7396 "declaration specifiers");
7397 else
7398 specs->typespec_word = cts_double;
7399 return specs;
7400 case RID_DFLOAT32:
7401 case RID_DFLOAT64:
7402 case RID_DFLOAT128:
7404 const char *str;
7405 if (i == RID_DFLOAT32)
7406 str = "_Decimal32";
7407 else if (i == RID_DFLOAT64)
7408 str = "_Decimal64";
7409 else
7410 str = "_Decimal128";
7411 if (specs->long_long_p)
7412 error ("both %<long long%> and %<%s%> in "
7413 "declaration specifiers", str);
7414 if (specs->long_p)
7415 error ("both %<long%> and %<%s%> in "
7416 "declaration specifiers", str);
7417 else if (specs->short_p)
7418 error ("both %<short%> and %<%s%> in "
7419 "declaration specifiers", str);
7420 else if (specs->signed_p)
7421 error ("both %<signed%> and %<%s%> in "
7422 "declaration specifiers", str);
7423 else if (specs->unsigned_p)
7424 error ("both %<unsigned%> and %<%s%> in "
7425 "declaration specifiers", str);
7426 else if (specs->complex_p)
7427 error ("both %<complex%> and %<%s%> in "
7428 "declaration specifiers", str);
7429 else if (i == RID_DFLOAT32)
7430 specs->typespec_word = cts_dfloat32;
7431 else if (i == RID_DFLOAT64)
7432 specs->typespec_word = cts_dfloat64;
7433 else
7434 specs->typespec_word = cts_dfloat128;
7436 if (!targetm.decimal_float_supported_p ())
7437 error ("decimal floating point not supported for this target");
7438 if (pedantic)
7439 pedwarn ("ISO C does not support decimal floating point");
7440 return specs;
7441 default:
7442 /* ObjC reserved word "id", handled below. */
7443 break;
7448 /* Now we have a typedef (a TYPE_DECL node), an identifier (some
7449 form of ObjC type, cases such as "int" and "long" being handled
7450 above), a TYPE (struct, union, enum and typeof specifiers) or an
7451 ERROR_MARK. In none of these cases may there have previously
7452 been any type specifiers. */
7453 if (specs->type || specs->typespec_word != cts_none
7454 || specs->long_p || specs->short_p || specs->signed_p
7455 || specs->unsigned_p || specs->complex_p)
7456 error ("two or more data types in declaration specifiers");
7457 else if (TREE_CODE (type) == TYPE_DECL)
7459 if (TREE_TYPE (type) == error_mark_node)
7460 ; /* Allow the type to default to int to avoid cascading errors. */
7461 else
7463 specs->type = TREE_TYPE (type);
7464 specs->decl_attr = DECL_ATTRIBUTES (type);
7465 specs->typedef_p = true;
7466 specs->explicit_signed_p = C_TYPEDEF_EXPLICITLY_SIGNED (type);
7469 else if (TREE_CODE (type) == IDENTIFIER_NODE)
7471 tree t = lookup_name (type);
7472 if (!t || TREE_CODE (t) != TYPE_DECL)
7473 error ("%qE fails to be a typedef or built in type", type);
7474 else if (TREE_TYPE (t) == error_mark_node)
7476 else
7477 specs->type = TREE_TYPE (t);
7479 else if (TREE_CODE (type) != ERROR_MARK)
7481 if (spec.kind == ctsk_tagdef || spec.kind == ctsk_tagfirstref)
7482 specs->tag_defined_p = true;
7483 if (spec.kind == ctsk_typeof)
7484 specs->typedef_p = true;
7485 specs->type = type;
7488 return specs;
7491 /* Add the storage class specifier or function specifier SCSPEC to the
7492 declaration specifiers SPECS, returning SPECS. */
7494 struct c_declspecs *
7495 declspecs_add_scspec (struct c_declspecs *specs, tree scspec)
7497 enum rid i;
7498 enum c_storage_class n = csc_none;
7499 bool dupe = false;
7500 specs->declspecs_seen_p = true;
7501 gcc_assert (TREE_CODE (scspec) == IDENTIFIER_NODE
7502 && C_IS_RESERVED_WORD (scspec));
7503 i = C_RID_CODE (scspec);
7504 if (extra_warnings && specs->non_sc_seen_p)
7505 warning (OPT_Wextra, "%qE is not at beginning of declaration", scspec);
7506 switch (i)
7508 case RID_INLINE:
7509 /* C99 permits duplicate inline. Although of doubtful utility,
7510 it seems simplest to permit it in gnu89 mode as well, as
7511 there is also little utility in maintaining this as a
7512 difference between gnu89 and C99 inline. */
7513 dupe = false;
7514 specs->inline_p = true;
7515 break;
7516 case RID_THREAD:
7517 dupe = specs->thread_p;
7518 if (specs->storage_class == csc_auto)
7519 error ("%<__thread%> used with %<auto%>");
7520 else if (specs->storage_class == csc_register)
7521 error ("%<__thread%> used with %<register%>");
7522 else if (specs->storage_class == csc_typedef)
7523 error ("%<__thread%> used with %<typedef%>");
7524 else
7525 specs->thread_p = true;
7526 break;
7527 case RID_AUTO:
7528 n = csc_auto;
7529 break;
7530 case RID_EXTERN:
7531 n = csc_extern;
7532 /* Diagnose "__thread extern". */
7533 if (specs->thread_p)
7534 error ("%<__thread%> before %<extern%>");
7535 break;
7536 case RID_REGISTER:
7537 n = csc_register;
7538 break;
7539 case RID_STATIC:
7540 n = csc_static;
7541 /* Diagnose "__thread static". */
7542 if (specs->thread_p)
7543 error ("%<__thread%> before %<static%>");
7544 break;
7545 case RID_TYPEDEF:
7546 n = csc_typedef;
7547 break;
7548 default:
7549 gcc_unreachable ();
7551 if (n != csc_none && n == specs->storage_class)
7552 dupe = true;
7553 if (dupe)
7554 error ("duplicate %qE", scspec);
7555 if (n != csc_none)
7557 if (specs->storage_class != csc_none && n != specs->storage_class)
7559 error ("multiple storage classes in declaration specifiers");
7561 else
7563 specs->storage_class = n;
7564 if (n != csc_extern && n != csc_static && specs->thread_p)
7566 error ("%<__thread%> used with %qE", scspec);
7567 specs->thread_p = false;
7571 return specs;
7574 /* Add the attributes ATTRS to the declaration specifiers SPECS,
7575 returning SPECS. */
7577 struct c_declspecs *
7578 declspecs_add_attrs (struct c_declspecs *specs, tree attrs)
7580 specs->attrs = chainon (attrs, specs->attrs);
7581 specs->declspecs_seen_p = true;
7582 return specs;
7585 /* Combine "long", "short", "signed", "unsigned" and "_Complex" type
7586 specifiers with any other type specifier to determine the resulting
7587 type. This is where ISO C checks on complex types are made, since
7588 "_Complex long" is a prefix of the valid ISO C type "_Complex long
7589 double". */
7591 struct c_declspecs *
7592 finish_declspecs (struct c_declspecs *specs)
7594 /* If a type was specified as a whole, we have no modifiers and are
7595 done. */
7596 if (specs->type != NULL_TREE)
7598 gcc_assert (!specs->long_p && !specs->long_long_p && !specs->short_p
7599 && !specs->signed_p && !specs->unsigned_p
7600 && !specs->complex_p);
7601 return specs;
7604 /* If none of "void", "_Bool", "char", "int", "float" or "double"
7605 has been specified, treat it as "int" unless "_Complex" is
7606 present and there are no other specifiers. If we just have
7607 "_Complex", it is equivalent to "_Complex double", but e.g.
7608 "_Complex short" is equivalent to "_Complex short int". */
7609 if (specs->typespec_word == cts_none)
7611 if (specs->long_p || specs->short_p
7612 || specs->signed_p || specs->unsigned_p)
7614 specs->typespec_word = cts_int;
7616 else if (specs->complex_p)
7618 specs->typespec_word = cts_double;
7619 if (pedantic)
7620 pedwarn ("ISO C does not support plain %<complex%> meaning "
7621 "%<double complex%>");
7623 else
7625 specs->typespec_word = cts_int;
7626 specs->default_int_p = true;
7627 /* We don't diagnose this here because grokdeclarator will
7628 give more specific diagnostics according to whether it is
7629 a function definition. */
7633 /* If "signed" was specified, record this to distinguish "int" and
7634 "signed int" in the case of a bit-field with
7635 -funsigned-bitfields. */
7636 specs->explicit_signed_p = specs->signed_p;
7638 /* Now compute the actual type. */
7639 switch (specs->typespec_word)
7641 case cts_void:
7642 gcc_assert (!specs->long_p && !specs->short_p
7643 && !specs->signed_p && !specs->unsigned_p
7644 && !specs->complex_p);
7645 specs->type = void_type_node;
7646 break;
7647 case cts_bool:
7648 gcc_assert (!specs->long_p && !specs->short_p
7649 && !specs->signed_p && !specs->unsigned_p
7650 && !specs->complex_p);
7651 specs->type = boolean_type_node;
7652 break;
7653 case cts_char:
7654 gcc_assert (!specs->long_p && !specs->short_p);
7655 gcc_assert (!(specs->signed_p && specs->unsigned_p));
7656 if (specs->signed_p)
7657 specs->type = signed_char_type_node;
7658 else if (specs->unsigned_p)
7659 specs->type = unsigned_char_type_node;
7660 else
7661 specs->type = char_type_node;
7662 if (specs->complex_p)
7664 if (pedantic)
7665 pedwarn ("ISO C does not support complex integer types");
7666 specs->type = build_complex_type (specs->type);
7668 break;
7669 case cts_int:
7670 gcc_assert (!(specs->long_p && specs->short_p));
7671 gcc_assert (!(specs->signed_p && specs->unsigned_p));
7672 if (specs->long_long_p)
7673 specs->type = (specs->unsigned_p
7674 ? long_long_unsigned_type_node
7675 : long_long_integer_type_node);
7676 else if (specs->long_p)
7677 specs->type = (specs->unsigned_p
7678 ? long_unsigned_type_node
7679 : long_integer_type_node);
7680 else if (specs->short_p)
7681 specs->type = (specs->unsigned_p
7682 ? short_unsigned_type_node
7683 : short_integer_type_node);
7684 else
7685 specs->type = (specs->unsigned_p
7686 ? unsigned_type_node
7687 : integer_type_node);
7688 if (specs->complex_p)
7690 if (pedantic)
7691 pedwarn ("ISO C does not support complex integer types");
7692 specs->type = build_complex_type (specs->type);
7694 break;
7695 case cts_float:
7696 gcc_assert (!specs->long_p && !specs->short_p
7697 && !specs->signed_p && !specs->unsigned_p);
7698 specs->type = (specs->complex_p
7699 ? complex_float_type_node
7700 : float_type_node);
7701 break;
7702 case cts_double:
7703 gcc_assert (!specs->long_long_p && !specs->short_p
7704 && !specs->signed_p && !specs->unsigned_p);
7705 if (specs->long_p)
7707 specs->type = (specs->complex_p
7708 ? complex_long_double_type_node
7709 : long_double_type_node);
7711 else
7713 specs->type = (specs->complex_p
7714 ? complex_double_type_node
7715 : double_type_node);
7717 break;
7718 case cts_dfloat32:
7719 case cts_dfloat64:
7720 case cts_dfloat128:
7721 gcc_assert (!specs->long_p && !specs->long_long_p && !specs->short_p
7722 && !specs->signed_p && !specs->unsigned_p && !specs->complex_p);
7723 if (specs->typespec_word == cts_dfloat32)
7724 specs->type = dfloat32_type_node;
7725 else if (specs->typespec_word == cts_dfloat64)
7726 specs->type = dfloat64_type_node;
7727 else
7728 specs->type = dfloat128_type_node;
7729 break;
7730 default:
7731 gcc_unreachable ();
7734 return specs;
7737 /* Synthesize a function which calls all the global ctors or global
7738 dtors in this file. This is only used for targets which do not
7739 support .ctors/.dtors sections. FIXME: Migrate into cgraph. */
7740 static void
7741 build_cdtor (int method_type, tree cdtors)
7743 tree body = 0;
7745 if (!cdtors)
7746 return;
7748 for (; cdtors; cdtors = TREE_CHAIN (cdtors))
7749 append_to_statement_list (build_function_call (TREE_VALUE (cdtors), 0),
7750 &body);
7752 cgraph_build_static_cdtor (method_type, body, DEFAULT_INIT_PRIORITY);
7755 /* A subroutine of c_write_global_declarations. Perform final processing
7756 on one file scope's declarations (or the external scope's declarations),
7757 GLOBALS. */
7759 static void
7760 c_write_global_declarations_1 (tree globals)
7762 tree decl;
7763 bool reconsider;
7765 /* Process the decls in the order they were written. */
7766 for (decl = globals; decl; decl = TREE_CHAIN (decl))
7768 /* Check for used but undefined static functions using the C
7769 standard's definition of "used", and set TREE_NO_WARNING so
7770 that check_global_declarations doesn't repeat the check. */
7771 if (TREE_CODE (decl) == FUNCTION_DECL
7772 && DECL_INITIAL (decl) == 0
7773 && DECL_EXTERNAL (decl)
7774 && !TREE_PUBLIC (decl)
7775 && C_DECL_USED (decl))
7777 pedwarn ("%q+F used but never defined", decl);
7778 TREE_NO_WARNING (decl) = 1;
7781 wrapup_global_declaration_1 (decl);
7786 reconsider = false;
7787 for (decl = globals; decl; decl = TREE_CHAIN (decl))
7788 reconsider |= wrapup_global_declaration_2 (decl);
7790 while (reconsider);
7792 for (decl = globals; decl; decl = TREE_CHAIN (decl))
7793 check_global_declaration_1 (decl);
7796 /* A subroutine of c_write_global_declarations Emit debug information for each
7797 of the declarations in GLOBALS. */
7799 static void
7800 c_write_global_declarations_2 (tree globals)
7802 tree decl;
7804 for (decl = globals; decl ; decl = TREE_CHAIN (decl))
7805 debug_hooks->global_decl (decl);
7808 /* Preserve the external declarations scope across a garbage collect. */
7809 static GTY(()) tree ext_block;
7811 void
7812 c_write_global_declarations (void)
7814 tree t;
7816 /* We don't want to do this if generating a PCH. */
7817 if (pch_file)
7818 return;
7820 /* Don't waste time on further processing if -fsyntax-only or we've
7821 encountered errors. */
7822 if (flag_syntax_only || errorcount || sorrycount || cpp_errors (parse_in))
7823 return;
7825 /* Close the external scope. */
7826 ext_block = pop_scope ();
7827 external_scope = 0;
7828 gcc_assert (!current_scope);
7830 if (ext_block)
7832 tree tmp = BLOCK_VARS (ext_block);
7833 int flags;
7834 FILE * stream = dump_begin (TDI_tu, &flags);
7835 if (stream && tmp)
7837 dump_node (tmp, flags & ~TDF_SLIM, stream);
7838 dump_end (TDI_tu, stream);
7842 /* Process all file scopes in this compilation, and the external_scope,
7843 through wrapup_global_declarations and check_global_declarations. */
7844 for (t = all_translation_units; t; t = TREE_CHAIN (t))
7845 c_write_global_declarations_1 (BLOCK_VARS (DECL_INITIAL (t)));
7846 c_write_global_declarations_1 (BLOCK_VARS (ext_block));
7848 /* Generate functions to call static constructors and destructors
7849 for targets that do not support .ctors/.dtors sections. These
7850 functions have magic names which are detected by collect2. */
7851 build_cdtor ('I', static_ctors); static_ctors = 0;
7852 build_cdtor ('D', static_dtors); static_dtors = 0;
7854 /* We're done parsing; proceed to optimize and emit assembly.
7855 FIXME: shouldn't be the front end's responsibility to call this. */
7856 cgraph_optimize ();
7858 /* After cgraph has had a chance to emit everything that's going to
7859 be emitted, output debug information for globals. */
7860 if (errorcount == 0 && sorrycount == 0)
7862 timevar_push (TV_SYMOUT);
7863 for (t = all_translation_units; t; t = TREE_CHAIN (t))
7864 c_write_global_declarations_2 (BLOCK_VARS (DECL_INITIAL (t)));
7865 c_write_global_declarations_2 (BLOCK_VARS (ext_block));
7866 timevar_pop (TV_SYMOUT);
7869 ext_block = NULL;
7872 #include "gt-c-decl.h"