OSDN Git Service

* ChangeLog, Make-lang.in, class.c, expr.c, gcj.texi, java-tree.h,
[pf3gnuchains/gcc-fork.git] / gcc / java / parse.h
1 /* Language parser definitions for the GNU compiler for the Java(TM) language.
2    Copyright (C) 1997, 1998, 1999, 2000, 2001 Free Software Foundation, Inc.
3    Contributed by Alexandre Petit-Bianco (apbianco@cygnus.com)
4
5 This file is part of GNU CC.
6
7 GNU CC is free software; you can redistribute it and/or modify
8 it under the terms of the GNU General Public License as published by
9 the Free Software Foundation; either version 2, or (at your option)
10 any later version.
11
12 GNU CC is distributed in the hope that it will be useful,
13 but WITHOUT ANY WARRANTY; without even the implied warranty of
14 MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
15 GNU General Public License for more details.
16
17 You should have received a copy of the GNU General Public License
18 along with GNU CC; see the file COPYING.  If not, write to
19 the Free Software Foundation, 59 Temple Place - Suite 330,
20 Boston, MA 02111-1307, USA.
21
22 Java and all Java-based marks are trademarks or registered trademarks
23 of Sun Microsystems, Inc. in the United States and other countries.
24 The Free Software Foundation is independent of Sun Microsystems, Inc.  */
25
26 #ifndef GCC_JAVA_PARSE_H
27 #define GCC_JAVA_PARSE_H
28
29 #include "lex.h"
30
31 /* Extern global variable declarations */
32 extern int java_error_count;
33 extern struct obstack temporary_obstack;
34 extern struct obstack permanent_obstack;
35 extern int quiet_flag;
36
37 #ifndef JC1_LITE
38 /* Function extern to java/ */
39 extern int int_fits_type_p PARAMS ((tree, tree));
40 extern tree stabilize_reference PARAMS ((tree));
41 #endif
42
43 /* Macros for verbose debug info  */
44 #ifdef  VERBOSE_SKELETON
45 #define RULE( rule ) printf ( "jv_yacc:%d: rule %s\n", lineno, rule )
46 #else
47 #define RULE( rule )
48 #endif
49
50 #ifdef VERBOSE_SKELETON
51 #undef SOURCE_FRONTEND_DEBUG
52 #define SOURCE_FRONTEND_DEBUG(X)                                \
53   {if (!quiet_flag) {printf ("* "); printf X; putchar ('\n');} }
54 #else
55 #define SOURCE_FRONTEND_DEBUG(X)
56 #endif
57
58 /* Macro for error recovering  */
59 #ifdef YYDEBUG
60 #define RECOVERED                                       \
61   { if (!quiet_flag) {printf ("** Recovered\n");} }
62 #define DRECOVERED(s)                                           \
63   { if (!quiet_flag) {printf ("** Recovered (%s)\n", #s);}}
64 #else
65 #define RECOVERED
66 #define DRECOVERED(s)
67 #endif
68
69 #define DRECOVER(s) {yyerrok; DRECOVERED(s);}
70 #define RECOVER     {yyerrok; RECOVERED;}
71
72 #define YYERROR_NOW ctxp->java_error_flag = 1
73 #define YYNOT_TWICE if (ctxp->prevent_ese != lineno)
74
75 /* Accepted modifiers */
76 #define CLASS_MODIFIERS ACC_PUBLIC|ACC_ABSTRACT|ACC_FINAL
77 #define FIELD_MODIFIERS ACC_PUBLIC|ACC_PROTECTED|ACC_PRIVATE|ACC_FINAL| \
78                         ACC_STATIC|ACC_TRANSIENT|ACC_VOLATILE
79 #define METHOD_MODIFIERS ACC_PUBLIC|ACC_PROTECTED|ACC_PRIVATE|ACC_ABSTRACT| \
80                          ACC_STATIC|ACC_FINAL|ACC_SYNCHRONIZED|ACC_NATIVE
81 #define INTERFACE_MODIFIERS ACC_PUBLIC|ACC_ABSTRACT
82 #define INTERFACE_INNER_MODIFIERS ACC_PUBLIC|ACC_PROTECTED|ACC_ABSTRACT|ACC_STATIC
83 #define INTERFACE_METHOD_MODIFIERS ACC_PUBLIC|ACC_ABSTRACT
84 #define INTERFACE_FIELD_MODIFIERS ACC_PUBLIC|ACC_STATIC|ACC_FINAL
85
86 /* Getting a modifier WFL */
87 #define MODIFIER_WFL(M)   (ctxp->modifier_ctx [(M) - PUBLIC_TK])
88
89 /* Check on modifiers */
90 #define THIS_MODIFIER_ONLY(f, m, v, count, l)                           \
91   if ((f) & (m))                                                        \
92     {                                                                   \
93       tree node = MODIFIER_WFL (v);                                     \
94       if ((l)                                                           \
95           && ((EXPR_WFL_COLNO (node) > EXPR_WFL_COLNO (l))              \
96               || (EXPR_WFL_LINENO (node) > EXPR_WFL_LINENO (l))))       \
97         l = node;                                                       \
98       else if (!(l))                                                    \
99         l = node;                                                       \
100       count++;                                                          \
101     }
102
103 #define ABSTRACT_CHECK(FLAG, V, CL, S)                          \
104   if ((FLAG) & (V))                                             \
105     parse_error_context ((CL), "%s method can't be abstract", (S));
106
107 #define JCONSTRUCTOR_CHECK(FLAG, V, CL, S)                      \
108   if ((FLAG) & (V))                                             \
109     parse_error_context ((CL), "Constructor can't be %s", (S)); \
110       
111 /* Misc. */
112 #define exit_java_complete_class()              \
113   {                                             \
114     return;                                     \
115   }
116
117 #define CLASS_OR_INTERFACE(decl, s1, s2)                        \
118    (decl ?                                                      \
119     ((get_access_flags_from_decl (TYPE_NAME (TREE_TYPE (decl))) \
120       & ACC_INTERFACE) ?                                        \
121      s2 : s1) : ((s1 [0]=='S'|| s1 [0]=='s') ?                  \
122                  (s1 [0]=='S' ? "Supertype" : "supertype") :    \
123                  (s1 [0] > 'A' ? "Type" : "type")))
124
125 #define GET_REAL_TYPE(TYPE)                                     \
126   (TREE_CODE (TYPE) == TREE_LIST ? TREE_PURPOSE (TYPE) : TYPE)
127
128 /* Get TYPE name string, regardless whether TYPE is a class or an
129    array. */
130 #define GET_TYPE_NAME(TYPE)                             \
131   (TREE_CODE (TYPE_NAME (TYPE)) == IDENTIFIER_NODE ?    \
132    IDENTIFIER_POINTER (TYPE_NAME (TYPE)) :              \
133    IDENTIFIER_POINTER (DECL_NAME (TYPE_NAME (TYPE))))
134
135 /* Pedantic warning on obsolete modifiers. Note: when cl is NULL,
136    flags was set artificially, such as for a interface method */
137 #define OBSOLETE_MODIFIER_WARNING(cl, flags, __modifier, arg)                \
138   {                                                                          \
139     if (flag_redundant && (cl) && ((flags) & (__modifier)))                  \
140       parse_warning_context (cl,                                             \
141      "Discouraged redundant use of `%s' modifier in declaration of %s",      \
142                              java_accstring_lookup (__modifier), arg);       \
143   }
144 #define OBSOLETE_MODIFIER_WARNING2(cl, flags, __modifier, arg1, arg2)        \
145   {                                                                          \
146     if (flag_redundant && (cl) && ((flags) & (__modifier)))                  \
147       parse_warning_context (cl,                                             \
148      "Discouraged redundant use of `%s' modifier in declaration of %s `%s'", \
149                              java_accstring_lookup (__modifier), arg1, arg2);\
150   }
151
152 /* Quickly build a temporary pointer on hypothetical type NAME. */
153 #define BUILD_PTR_FROM_NAME(ptr, name)          \
154   do {                                          \
155     ptr = build (POINTER_TYPE, NULL_TREE);      \
156     TYPE_NAME (ptr) = name;                     \
157   } while (0)
158
159 #define INCOMPLETE_TYPE_P(NODE)                         \
160   ((TREE_CODE (NODE) == POINTER_TYPE)                   \
161    && !TREE_TYPE (NODE)                                 \
162    && TREE_CODE (TYPE_NAME (NODE)) == IDENTIFIER_NODE)
163
164 /* Set the EMIT_LINE_NOTE flag of a EXPR_WLF to 1 if debug information
165    are requested. Works in the context of a parser rule. */
166 #define JAVA_MAYBE_GENERATE_DEBUG_INFO(node)            \
167   (debug_info_level != DINFO_LEVEL_NONE ?               \
168     EXPR_WFL_EMIT_LINE_NOTE (node) = 1, node : node)
169
170 /* Types classification, according to the JLS, section 4.2 */
171 #define JFLOAT_TYPE_P(TYPE)      (TYPE && TREE_CODE ((TYPE)) == REAL_TYPE)
172 #define JINTEGRAL_TYPE_P(TYPE)   ((TYPE)                                   \
173                                   && (TREE_CODE ((TYPE)) == INTEGER_TYPE   \
174                                       || TREE_CODE ((TYPE)) == CHAR_TYPE))
175 #define JNUMERIC_TYPE_P(TYPE)    ((TYPE)                                \
176                                   && (JFLOAT_TYPE_P ((TYPE))            \
177                                       || JINTEGRAL_TYPE_P ((TYPE))))
178 #define JPRIMITIVE_TYPE_P(TYPE)  ((TYPE)                                  \
179                                   && (JNUMERIC_TYPE_P ((TYPE))            \
180                                   || TREE_CODE ((TYPE)) == BOOLEAN_TYPE))
181
182 #define JBSC_TYPE_P(TYPE) ((TYPE) && (((TYPE) == byte_type_node)        \
183                                       || ((TYPE) == short_type_node)    \
184                                       || ((TYPE) == char_type_node)))
185
186 /* Not defined in the LRM */
187 #define JSTRING_TYPE_P(TYPE) ((TYPE)                                       \
188                               && ((TYPE) == string_type_node ||            \
189                                   (TREE_CODE (TYPE) == POINTER_TYPE &&     \
190                                    TREE_TYPE (TYPE) == string_type_node)))
191 #define JSTRING_P(NODE) ((NODE)                                         \
192                          && (TREE_CODE (NODE) == STRING_CST             \
193                              || IS_CRAFTED_STRING_BUFFER_P (NODE)       \
194                              || JSTRING_TYPE_P (TREE_TYPE (NODE))))
195
196 #define JREFERENCE_TYPE_P(TYPE) ((TYPE)                                       \
197                                  && (TREE_CODE (TYPE) == RECORD_TYPE          \
198                                      || (TREE_CODE (TYPE) == POINTER_TYPE     \
199                                          &&  TREE_CODE (TREE_TYPE (TYPE)) ==  \
200                                          RECORD_TYPE)))
201 #define JNULLP_TYPE_P(TYPE) ((TYPE) && (TREE_CODE (TYPE) == POINTER_TYPE) \
202                              && (TYPE) == TREE_TYPE (null_pointer_node))
203
204 /* Other predicates */
205 #define JDECL_P(NODE) (NODE && (TREE_CODE (NODE) == PARM_DECL           \
206                                 || TREE_CODE (NODE) == VAR_DECL         \
207                                 || TREE_CODE (NODE) == FIELD_DECL))
208
209 #define TYPE_INTERFACE_P(TYPE)                                  \
210   (CLASS_P (TYPE) && CLASS_INTERFACE (TYPE_NAME (TYPE)))
211
212 #define TYPE_CLASS_P(TYPE) (CLASS_P (TYPE)                              \
213                             && !CLASS_INTERFACE (TYPE_NAME (TYPE)))
214
215 /* Identifier business related to 1.1 language extensions.  */
216
217 #define IDENTIFIER_INNER_CLASS_OUTER_FIELD_ACCESS(NODE) \
218   (TREE_CODE (NODE) == IDENTIFIER_NODE &&               \
219    IDENTIFIER_LENGTH (NODE) >= 8 &&                     \
220    IDENTIFIER_POINTER (NODE)[7] != '0')
221
222 /* Build the string val$<O> and store it into N. The is used to
223    construct the name of inner class hidden fields used to alias outer
224    scope local variables.  */
225 #define MANGLE_OUTER_LOCAL_VARIABLE_NAME(N, O)                          \
226   {                                                                     \
227     char *mangled_name;                                                 \
228     obstack_grow (&temporary_obstack, "val$", 4);                       \
229     obstack_grow (&temporary_obstack,                                   \
230                   IDENTIFIER_POINTER ((O)), IDENTIFIER_LENGTH ((O)));   \
231     obstack_1grow (&temporary_obstack, '\0');                           \
232     mangled_name = obstack_finish (&temporary_obstack);                 \
233     (N) = get_identifier (mangled_name);                                \
234     obstack_free (&temporary_obstack, mangled_name);                    \
235   }
236
237 /* Build the string parm$<O> and store in into the identifier N. This
238    is used to construct the name of hidden parameters used to
239    initialize outer scope aliases.  */
240 #define MANGLE_ALIAS_INITIALIZER_PARAMETER_NAME_ID(N, O)                \
241   {                                                                     \
242     char *mangled_name;                                                 \
243     obstack_grow (&temporary_obstack, "parm$", 5);                      \
244     obstack_grow (&temporary_obstack,                                   \
245                   IDENTIFIER_POINTER ((O)), IDENTIFIER_LENGTH ((O)));   \
246     obstack_1grow (&temporary_obstack, '\0');                           \
247     mangled_name = obstack_finish (&temporary_obstack);                 \
248     (N) = get_identifier (mangled_name);                                \
249     obstack_free (&temporary_obstack, mangled_name);                    \
250   }
251
252 #define MANGLE_ALIAS_INITIALIZER_PARAMETER_NAME_STR(N, S)       \
253   {                                                             \
254     char *mangled_name;                                                 \
255     obstack_grow (&temporary_obstack, "parm$", 5);              \
256     obstack_grow (&temporary_obstack, (S), strlen ((S)));       \
257     obstack_1grow (&temporary_obstack, '\0');                   \
258     mangled_name = obstack_finish (&temporary_obstack);                 \
259     (N) = get_identifier (mangled_name);                                \
260     obstack_free (&temporary_obstack, mangled_name);                    \
261   }
262
263 /* Skip THIS and artificial parameters found in function decl M and
264    assign the result to C. We don't do that for $finit$, since it's
265    knowingly called with artificial parms.  */
266 #define SKIP_THIS_AND_ARTIFICIAL_PARMS(C,M)                     \
267   {                                                             \
268     int i;                                                      \
269     (C) = TYPE_ARG_TYPES (TREE_TYPE ((M)));                     \
270     if (!METHOD_STATIC ((M)))                                   \
271       (C) = TREE_CHAIN (C);                                     \
272     if (DECL_CONSTRUCTOR_P ((M))                                \
273         && PURE_INNER_CLASS_TYPE_P (DECL_CONTEXT ((M))))        \
274       (C) = TREE_CHAIN (C);                                     \
275     if (!DECL_FINIT_P ((M)))                                    \
276       for (i = DECL_FUNCTION_NAP ((M)); i; i--)                 \
277        (C) = TREE_CHAIN (C);                                    \
278   }
279
280 /* Mark final parameters in method M, by comparison of the argument
281    list L. This macro is used to set the flag once the method has been
282    build.  */
283 #define MARK_FINAL_PARMS(M, L)                                          \
284   {                                                                     \
285     tree current = TYPE_ARG_TYPES (TREE_TYPE ((M)));                    \
286     tree list = (L);                                                    \
287     if (!METHOD_STATIC ((M)))                                           \
288       current = TREE_CHAIN (current);                                   \
289     for (; current !=  end_params_node;                                 \
290          current = TREE_CHAIN (current), list = TREE_CHAIN (list))      \
291       ARG_FINAL_P (current) = ARG_FINAL_P (list);                       \
292     if (current != list)                                                \
293       abort ();                                                         \
294   }
295
296 /* Reset the ARG_FINAL_P that might have been set in method M args.  */
297 #define UNMARK_FINAL_PARMS(M)                                           \
298   {                                                                     \
299     tree current;                                                       \
300     for (current = TYPE_ARG_TYPES (TREE_TYPE ((M)));                    \
301          current != end_params_node; current = TREE_CHAIN (current))    \
302       ARG_FINAL_P (current) = 0;                                        \
303   }
304
305 /* Reverse a crafted parameter list as required.  */
306 #define CRAFTED_PARAM_LIST_FIXUP(P)             \
307   {                                             \
308     if ((P))                                    \
309       {                                         \
310         tree last = (P);                        \
311         (P) = nreverse (P);                     \
312         TREE_CHAIN (last) = end_params_node;    \
313       }                                         \
314     else                                        \
315       (P) = end_params_node;                    \
316   }
317
318 /* Modes governing the creation of a alias initializer parameter
319    lists. AIPL stands for Alias Initializer Parameter List.  */
320 enum {
321   AIPL_FUNCTION_CREATION,         /* Suitable for artificial method creation */
322   AIPL_FUNCTION_DECLARATION,      /* Suitable for declared methods */
323   AIPL_FUNCTION_CTOR_INVOCATION,  /* Invocation of constructors */
324   AIPL_FUNCTION_FINIT_INVOCATION  /* Invocation of $finit$ */
325 };
326
327 /* Standard error messages */
328 #define ERROR_CANT_CONVERT_TO_BOOLEAN(OPERATOR, NODE, TYPE)             \
329   parse_error_context ((OPERATOR),                                      \
330     "Incompatible type for `%s'. Can't convert `%s' to boolean",        \
331     operator_string ((NODE)), lang_printable_name ((TYPE),0))
332
333 #define ERROR_CANT_CONVERT_TO_NUMERIC(OPERATOR, NODE, TYPE)             \
334   parse_error_context ((OPERATOR),                                      \
335       "Incompatible type for `%s'. Can't convert `%s' to numeric type", \
336       operator_string ((NODE)), lang_printable_name ((TYPE), 0))
337
338 #define ERROR_CAST_NEEDED_TO_INTEGRAL(OPERATOR, NODE, TYPE)             \
339 do {                                                                    \
340   tree _operator = (OPERATOR), _node = (NODE), _type = (TYPE);          \
341   if (JPRIMITIVE_TYPE_P (_type))                                        \
342     parse_error_context (_operator,                                     \
343 "Incompatible type for `%s'. Explicit cast needed to convert `%s' to integral",\
344                          operator_string(_node),                        \
345                          lang_printable_name (_type, 0));               \
346   else                                                                  \
347     parse_error_context (_operator,                                     \
348       "Incompatible type for `%s'. Can't convert `%s' to integral",     \
349                          operator_string(_node),                        \
350                          lang_printable_name (_type, 0));               \
351 } while (0)
352
353 #define ERROR_VARIABLE_NOT_INITIALIZED(WFL, V)                  \
354   parse_error_context                                           \
355     ((WFL), "Variable `%s' may not have been initialized",      \
356      IDENTIFIER_POINTER (V))
357
358 /* Definition for loop handling. This is Java's own definition of a
359    loop body. See parse.y for documentation. It's valid once you hold
360    a loop's body (LOOP_EXPR_BODY) */
361
362 /* The loop main block is the one hold the condition and the loop body */
363 #define LOOP_EXPR_BODY_MAIN_BLOCK(NODE) TREE_OPERAND (NODE, 0)
364 /* And then there is the loop update block */
365 #define LOOP_EXPR_BODY_UPDATE_BLOCK(NODE) TREE_OPERAND (NODE, 1)
366
367 /* Inside the loop main block, there is the loop condition and the
368    loop body. They may be reversed if the loop being described is a
369    do-while loop. NOTE: if you use a WFL around the EXIT_EXPR so you
370    can issue debug info for it, the EXIT_EXPR will be one operand
371    further. */
372 #define LOOP_EXPR_BODY_CONDITION_EXPR(NODE, R)                  \
373   TREE_OPERAND (LOOP_EXPR_BODY_MAIN_BLOCK (NODE), (R ? 1 : 0))
374
375 /* Here is the labeled block the loop real body is encapsulated in */
376 #define LOOP_EXPR_BODY_LABELED_BODY(NODE, R)                    \
377   TREE_OPERAND (LOOP_EXPR_BODY_MAIN_BLOCK (NODE), (R ? 0 : 1))
378 /* And here is the loop's real body */
379 #define LOOP_EXPR_BODY_BODY_EXPR(NODE, R)                       \
380   LABELED_BLOCK_BODY (LOOP_EXPR_BODY_LABELED_BODY(NODE, R))
381
382 #define PUSH_LABELED_BLOCK(B)                           \
383   {                                                     \
384     TREE_CHAIN (B) = ctxp->current_labeled_block;       \
385     ctxp->current_labeled_block = (B);                  \
386   }
387 #define POP_LABELED_BLOCK()                                             \
388   ctxp->current_labeled_block = TREE_CHAIN (ctxp->current_labeled_block)
389
390 #define PUSH_LOOP(L)                            \
391   {                                             \
392     TREE_CHAIN (L) = ctxp->current_loop;        \
393     ctxp->current_loop = (L);                   \
394   }
395 #define POP_LOOP() ctxp->current_loop = TREE_CHAIN (ctxp->current_loop)
396
397 #define PUSH_EXCEPTIONS(E)                                      \
398   currently_caught_type_list =                                  \
399     tree_cons (NULL_TREE, (E), currently_caught_type_list);
400
401 #define POP_EXCEPTIONS()                                                \
402   currently_caught_type_list = TREE_CHAIN (currently_caught_type_list)
403
404 /* Check that we're inside a try block.  */
405 #define IN_TRY_BLOCK_P()                                \
406   (currently_caught_type_list                           \
407    && ((TREE_VALUE (currently_caught_type_list) !=      \
408         DECL_FUNCTION_THROWS (current_function_decl))   \
409        || TREE_CHAIN (currently_caught_type_list)))
410
411 /* Check that we have exceptions in E.  */
412 #define EXCEPTIONS_P(E) ((E) ? TREE_VALUE (E) : NULL_TREE)
413
414 /* Anonymous array access */
415 #define ANONYMOUS_ARRAY_BASE_TYPE(N)   TREE_OPERAND ((N), 0)
416 #define ANONYMOUS_ARRAY_DIMS_SIG(N)    TREE_OPERAND ((N), 1)
417 #define ANONYMOUS_ARRAY_INITIALIZER(N) TREE_OPERAND ((N), 2)
418
419 /* Invocation modes, as returned by invocation_mode (). */
420 enum {
421   INVOKE_STATIC,
422   INVOKE_NONVIRTUAL,
423   INVOKE_SUPER,
424   INVOKE_INTERFACE,
425   INVOKE_VIRTUAL
426 };
427
428 /* We need the resolution stuff only if we compile jc1 */
429 #ifndef JC1_LITE
430
431 /* Unresolved type identifiers handling. When we process the source
432    code, we blindly accept an unknown type identifier and try to
433    resolve it later. When an unknown type identifier is encountered
434    and used, we record in a struct jdep element what the incomplete
435    type is and what it should patch. Later, java_complete_class will
436    process all classes known to have unresolved type
437    dependencies. Within each of these classes, this routine will
438    process unresolved type dependencies (JDEP_TO_RESOLVE), patch what
439    needs to be patched in the dependent tree node (JDEP_GET_PATCH,
440    JDEP_APPLY_PATCH) and perform other actions dictated by the context
441    of the patch (JDEP_KIND). The ideas are: we patch only what needs
442    to be patched, and with java_complete_class called at the right
443    time, we will start processing incomplete function bodies tree
444    nodes with everything external to function's bodies already
445    completed, it makes things much simpler. */
446
447 enum jdep_code {
448   JDEP_NO_PATCH,                /* Must be first */
449   JDEP_SUPER,                   /* Patch the type of one type
450                                    supertype. Requires some check
451                                    before it's done */
452   JDEP_FIELD,                   /* Patch the type of a class field */
453
454   /* JDEP_{METHOD,METHOD_RETURN,METHOD_END} to be kept in order */
455   JDEP_METHOD,                  /* Mark the beginning of the patching
456                                    of a method declaration, including
457                                    it's arguments */
458   JDEP_METHOD_RETURN,           /* Mark the beginning of the patching
459                                    of a method declaration. Arguments
460                                    aren't patched, only the returned
461                                    type is */
462   JDEP_METHOD_END,              /* Mark the end of the patching of a
463                                    method declaration. It indicates
464                                    that it's time to compute and
465                                    install a new signature */
466
467   JDEP_INTERFACE,               /* Patch the type of a Class/interface
468                                    extension */
469   JDEP_VARIABLE,                /* Patch the type of a variable declaration */
470   JDEP_PARM,                    /* Patch the type of a parm declaration */
471   JDEP_TYPE,                    /* Patch a random tree node type,
472                                    without the need for any specific
473                                    actions */
474   JDEP_EXCEPTION,               /* Patch exceptions specified by `throws' */
475   JDEP_ANONYMOUS                /* Patch anonymous classes
476                                    (implementation or extension.) */
477
478 };
479
480 typedef struct _jdep {
481   ENUM_BITFIELD(jdep_code) kind : 8; /* Type of patch */
482
483   int  flag0 : 1;               /* Some flags */
484   tree decl;                    /* Tied decl/or WFL */
485   tree solv;                    /* What to solve */
486   tree wfl;                     /* Where thing to resolve where found */
487   tree misc;                    /* Miscellaneous info (optional). */
488   tree enclosing;               /* The enclosing (current) class */
489   tree *patch;                  /* Address of a location to patch */
490   struct _jdep *next;           /* Linked list */
491 } jdep;
492
493
494 #define JDEP_DECL(J)          ((J)->decl)
495 #define JDEP_DECL_WFL(J)      ((J)->decl)
496 #define JDEP_KIND(J)          ((J)->kind)
497 #define JDEP_WFL(J)           ((J)->wfl)
498 #define JDEP_MISC(J)          ((J)->misc)
499 #define JDEP_ENCLOSING(J)     ((J)->enclosing)
500 #define JDEP_CLASS(J)         ((J)->class)
501 #define JDEP_APPLY_PATCH(J,P) (*(J)->patch = (P))
502 #define JDEP_GET_PATCH(J)     ((J)->patch)
503 #define JDEP_CHAIN(J)         ((J)->next)
504 #define JDEP_TO_RESOLVE(J)    ((J)->solv)
505 #define JDEP_RESOLVED_DECL(J) ((J)->solv)
506 #define JDEP_RESOLVED(J, D)   ((J)->solv = D)
507 #define JDEP_RESOLVED_P(J)    \
508         (!(J)->solv || TREE_CODE ((J)->solv) != POINTER_TYPE)
509
510 typedef struct _jdeplist {
511   jdep *first;
512   jdep *last;
513   struct _jdeplist *next;
514 } jdeplist;
515
516 #endif /* JC1_LITE */
517
518 #define CLASSD_FIRST(CD) ((CD)->first)
519 #define CLASSD_LAST(CD)  ((CD)->last)
520 #define CLASSD_CHAIN(CD) ((CD)->next)
521
522 #define JDEP_INSERT(L,J)                        \
523   {                                             \
524     if (!(L)->first)                            \
525       (L)->last = (L)->first = (J);             \
526     else                                        \
527       {                                         \
528         JDEP_CHAIN ((L)->last) = (J);           \
529         (L)->last = (J);                        \
530       }                                         \
531   }
532
533 /* if TYPE can't be resolved, obtain something suitable for its
534    resolution (TYPE is saved in SAVE before being changed). and set
535    CHAIN to 1. Otherwise, type is set to something usable. CHAIN is
536    usually used to determine that a new DEP must be installed on TYPE.
537    Note that when compiling java.lang.Object, references to Object are
538    java.lang.Object.  */
539 #define SET_TYPE_FOR_RESOLUTION(TYPE, SAVE, CHAIN)                      \
540   {                                                                     \
541     tree _returned_type;                                                \
542     (CHAIN) = 0;                                                        \
543     if (TREE_TYPE (GET_CPC ()) == object_type_node                      \
544         && TREE_CODE (TYPE) == EXPR_WITH_FILE_LOCATION                  \
545         && EXPR_WFL_NODE (TYPE) == unqualified_object_id_node)          \
546       (TYPE) = object_type_node;                                        \
547     else                                                                \
548       {                                                                 \
549         if (unresolved_type_p (type, &_returned_type))                  \
550           {                                                             \
551             if (_returned_type)                                         \
552               (TYPE) = _returned_type;                                  \
553             else                                                        \
554               {                                                         \
555                 tree _type;                                             \
556                 WFL_STRIP_BRACKET (_type, TYPE);                        \
557                 (SAVE) = (_type);                                       \
558                 (TYPE) = obtain_incomplete_type (TYPE);                 \
559                 CHAIN = 1;                                              \
560               }                                                         \
561           }                                                             \
562       }                                                                 \
563   }
564
565 #define WFL_STRIP_BRACKET(TARGET, TYPE)                                   \
566 {                                                                         \
567   tree __type = (TYPE);                                                   \
568   if (TYPE && TREE_CODE (TYPE) == EXPR_WITH_FILE_LOCATION)                \
569     {                                                                     \
570       tree _node;                                                         \
571       if (build_type_name_from_array_name (EXPR_WFL_NODE (TYPE), &_node)) \
572         {                                                                 \
573           tree _new = copy_node (TYPE);                                   \
574           EXPR_WFL_NODE (_new) = _node;                                   \
575           __type = _new;                                                  \
576         }                                                                 \
577     }                                                                     \
578   (TARGET) = __type;                                                      \
579 }
580
581 /* If NAME contains one or more trailing []s, NAMELEN will be the
582    adjusted to be the index of the last non bracket character in
583    NAME. ARRAY_DIMS will contain the number of []s found.  */
584
585 #define STRING_STRIP_BRACKETS(NAME, NAMELEN, ARRAY_DIMS)                  \
586 {                                                                         \
587   ARRAY_DIMS = 0;                                                         \
588   while (NAMELEN >= 2 && (NAME)[NAMELEN - 1] == ']')                      \
589     {                                                                     \
590       NAMELEN -= 2;                                                       \
591       (ARRAY_DIMS)++;                                                     \
592     }                                                                     \
593 }
594
595 /* Promote a type if it won't be registered as a patch */
596 #define PROMOTE_RECORD_IF_COMPLETE(TYPE, IS_INCOMPLETE)         \
597   {                                                             \
598     if (!(IS_INCOMPLETE) && TREE_CODE (TYPE) == RECORD_TYPE)    \
599       (TYPE) = promote_type (TYPE);                             \
600   }
601
602 /* Insert a DECL in the current block */
603 #define BLOCK_CHAIN_DECL(NODE)                                              \
604   {                                                                         \
605     TREE_CHAIN ((NODE)) =                                                   \
606       BLOCK_EXPR_DECLS (GET_CURRENT_BLOCK (current_function_decl));         \
607     BLOCK_EXPR_DECLS (GET_CURRENT_BLOCK (current_function_decl)) = (NODE);  \
608   }
609
610 /* Return the current block, either found in the body of the currently
611    declared function or in the current static block being defined. */
612 #define GET_CURRENT_BLOCK(F) ((F) ? DECL_FUNCTION_BODY ((F)) :  \
613                              current_static_block)
614
615 /* Merge an other line to the source line number of a decl. Used to
616    remember function's end. */
617 #define DECL_SOURCE_LINE_MERGE(DECL,NO) DECL_SOURCE_LINE(DECL) |= (NO << 16)
618
619 /* Retrieve those two info separately. */
620 #define DECL_SOURCE_LINE_FIRST(DECL)    (DECL_SOURCE_LINE(DECL) & 0x0000ffff)
621 #define DECL_SOURCE_LINE_LAST(DECL)     (DECL_SOURCE_LINE(DECL) >> 16)
622
623 /* Retrieve line/column from a WFL. */
624 #define EXPR_WFL_GET_LINECOL(V,LINE,COL)        \
625   {                                             \
626      (LINE) = (V) >> 12;                        \
627      (COL) = (V) & 0xfff;                       \
628    }
629 /* Add X to the column number information */
630 #define EXPR_WFL_ADD_COL(V, X)                                  \
631   (V) = (((V) & 0xfffff000) | ((((V) & 0xfff) + (X)) & 0xfff))
632
633 /* Build a WFL for expression nodes */
634 #define BUILD_EXPR_WFL(NODE, WFL)                                       \
635   build_expr_wfl ((NODE), input_filename, EXPR_WFL_LINENO ((WFL)),      \
636                   EXPR_WFL_COLNO ((WFL)))
637
638 #define EXPR_WFL_QUALIFICATION(WFL) TREE_OPERAND ((WFL), 2)
639 #define QUAL_WFL(NODE) TREE_PURPOSE (NODE)
640 #define QUAL_RESOLUTION(NODE) TREE_VALUE (NODE)
641 #define QUAL_DECL_TYPE(NODE) GET_SKIP_TYPE (NODE)
642
643 #define GET_SKIP_TYPE(NODE)                             \
644   (TREE_CODE (TREE_TYPE (NODE)) == POINTER_TYPE ?       \
645    TREE_TYPE (TREE_TYPE (NODE)): TREE_TYPE (NODE))
646
647 /* Handy macros for the walk operation */
648 #define COMPLETE_CHECK_OP(NODE, N)                      \
649 {                                                       \
650   TREE_OPERAND ((NODE), (N)) =                          \
651     java_complete_tree (TREE_OPERAND ((NODE), (N)));    \
652   if (TREE_OPERAND ((NODE), (N)) == error_mark_node)    \
653     return error_mark_node;                             \
654 }
655 #define COMPLETE_CHECK_OP_0(NODE) COMPLETE_CHECK_OP(NODE, 0)
656 #define COMPLETE_CHECK_OP_1(NODE) COMPLETE_CHECK_OP(NODE, 1)
657 #define COMPLETE_CHECK_OP_2(NODE) COMPLETE_CHECK_OP(NODE, 2)
658
659 /* Building invocations: append(ARG) and StringBuffer(ARG) */
660 #define BUILD_APPEND(ARG)                                                     \
661   ((JSTRING_TYPE_P (TREE_TYPE (ARG)) || JPRIMITIVE_TYPE_P (TREE_TYPE (ARG)))  \
662    ? build_method_invocation (wfl_append,                                     \
663                               ARG ? build_tree_list (NULL, (ARG)) : NULL_TREE)\
664    : build_method_invocation (wfl_append,                                     \
665                               ARG ? build_tree_list (NULL,                    \
666                                                      build1 (CONVERT_EXPR,    \
667                                                              object_type_node,\
668                                                              (ARG)))          \
669                               : NULL_TREE))
670 #define BUILD_STRING_BUFFER(ARG)                                              \
671   build_new_invocation (wfl_string_buffer,                                    \
672                         (ARG ? build_tree_list (NULL, (ARG)) : NULL_TREE))
673
674 #define BUILD_THROW(WHERE, WHAT)                                \
675   {                                                             \
676     (WHERE) =                                                   \
677       build (CALL_EXPR, void_type_node,                         \
678              build_address_of (throw_node),                     \
679              build_tree_list (NULL_TREE, (WHAT)), NULL_TREE);   \
680     TREE_SIDE_EFFECTS ((WHERE)) = 1;                            \
681   }
682
683 /* Set wfl_operator for the most accurate error location */
684 #define SET_WFL_OPERATOR(WHICH, NODE, WFL)              \
685   EXPR_WFL_LINECOL (WHICH) =                            \
686     (TREE_CODE (WFL) == EXPR_WITH_FILE_LOCATION ?       \
687      EXPR_WFL_LINECOL (WFL) : EXPR_WFL_LINECOL (NODE))
688
689 #define PATCH_METHOD_RETURN_ERROR()             \
690   {                                             \
691     if (ret_decl)                               \
692       *ret_decl = NULL_TREE;                    \
693     return error_mark_node;                     \
694   }
695
696 /* Convenient macro to check. Assumes that CLASS is a CLASS_DECL.  */
697 #define CHECK_METHODS(CLASS)                    \
698   {                                             \
699     if (CLASS_INTERFACE ((CLASS)))              \
700       java_check_abstract_methods ((CLASS));    \
701     else                                        \
702       java_check_regular_methods ((CLASS));     \
703   }
704
705 /* Using and reseting the @deprecated tag flag */
706 #define CHECK_DEPRECATED(DECL)                  \
707   {                                             \
708     if (ctxp->deprecated)                       \
709       DECL_DEPRECATED (DECL) = 1;               \
710     ctxp->deprecated = 0;                       \
711   }
712
713 /* Register an import */
714 #define REGISTER_IMPORT(WHOLE, NAME)                                    \
715 {                                                                       \
716   IS_A_SINGLE_IMPORT_CLASSFILE_NAME_P ((NAME)) = 1;                     \
717   ctxp->import_list = tree_cons ((WHOLE), (NAME), ctxp->import_list);   \
718 }
719
720 /* Macro to access the osb (opening square bracket) count */
721 #define CURRENT_OSB(C) (C)->osb_number [(C)->osb_depth]
722
723 /* Macro for the xreferencer */
724 #define DECL_END_SOURCE_LINE(DECL)       (DECL_CHECK (DECL)->decl.u1.i)
725 #define DECL_INHERITED_SOURCE_LINE(DECL) (DECL_CHECK (DECL)->decl.u2.i)
726      
727 /* Parser context data structure. */
728 struct parser_ctxt {
729
730   const char *filename;             /* Current filename */
731   struct parser_ctxt *next;
732
733   java_lexer *lexer;                 /* Current lexer state */
734   char marker_begining;              /* Marker. Should be a sub-struct */
735   struct java_line *p_line, *c_line; /* Previous and current line */
736   java_lc elc;                       /* Error's line column info */
737   int ccb_indent;                    /* Keep track of {} indent, lexer */
738   int first_ccb_indent1;             /* First { at ident level 1 */
739   int last_ccb_indent1;              /* Last } at ident level 1 */
740   int parser_ccb_indent;             /* Keep track of {} indent, parser */
741   int osb_depth;                     /* Current depth of [ in an expression */
742   int osb_limit;                     /* Limit of this depth */
743   int *osb_number;                   /* Keep track of ['s */
744   int lineno;                        /* Current lineno */
745   char marker_end;                   /* End marker. Should be a sub-struct */
746
747   /* The flags section */
748
749   /* Indicates a context used for saving the parser status. The
750      context must be popped when the status is restored. */
751   unsigned saved_data_ctx:1;    
752   /* Indicates that a context already contains saved data and that the
753      next save operation will require a new context to be created. */
754   unsigned saved_data:1;
755   /* Report error when true */
756   unsigned java_error_flag:1;
757   /* @deprecated tag seen */
758   unsigned deprecated:1;
759   /* Flag to report certain errors (fix this documentation. FIXME) */
760   unsigned class_err:1;
761
762   /* This section is defined only if we compile jc1 */
763 #ifndef JC1_LITE
764   tree modifier_ctx [11];           /* WFL of modifiers */
765   tree class_type;                  /* Current class */
766   tree function_decl;               /* Current function decl, save/restore */
767
768   struct JCF *current_jcf;          /* CU jcf */
769
770   int prevent_ese;                  /* Prevent expression statement error */
771
772   int formal_parameter_number;      /* Number of parameters found */
773   int interface_number;             /* # itfs declared to extend an itf def */
774
775   tree package;                     /* Defined package ID */
776
777   /* These two lists won't survive file traversal */
778   tree  class_list;                 /* List of classes in a CU */
779   jdeplist *classd_list;            /* Classe dependencies in a CU */
780   
781   tree  current_parsed_class;       /* Class currently parsed */
782   tree  current_parsed_class_un;    /* Curr. parsed class unqualified name */
783
784   tree non_static_initialized;      /* List of non static initialized fields */
785   tree static_initialized;          /* List of static non final initialized */
786   tree instance_initializers;       /* List of instance initializers stmts */
787
788   tree import_list;                 /* List of import */
789   tree import_demand_list;          /* List of import on demand */
790
791   tree current_loop;                /* List of the currently nested 
792                                        loops/switches */
793   tree current_labeled_block;       /* List of currently nested
794                                        labeled blocks. */
795
796   int pending_block;                /* Pending block to close */
797
798   int explicit_constructor_p;       /* >0 when processing an explicit
799                                        constructor. This flag is used to trap
800                                        illegal argument usage during an
801                                        explicit constructor invocation. */
802 #endif /* JC1_LITE */
803 };
804
805 /* A set of macros to push/pop/access the currently parsed class.  */
806 #define GET_CPC_LIST()     ctxp->current_parsed_class
807
808 /* Currently class being parsed is an inner class if an enclosing
809    class has been already pushed. This truth value is only valid prior
810    an inner class is pushed. After, use FIXME. */
811 #define CPC_INNER_P() GET_CPC_LIST ()
812
813 /* Get the currently parsed class DECL_TYPE node.  */
814 #define GET_CPC() TREE_VALUE (GET_CPC_LIST ())
815
816 /* Get the currently parsed class unqualified IDENTIFIER_NODE.  */
817 #define GET_CPC_UN() TREE_PURPOSE (GET_CPC_LIST ())
818
819 /* Get a parsed class unqualified IDENTIFIER_NODE from its CPC node.  */
820 #define GET_CPC_UN_NODE(N) TREE_PURPOSE (N)
821
822 /* Get the currently parsed class DECL_TYPE from its CPC node.  */
823 #define GET_CPC_DECL_NODE(N) TREE_VALUE (N)
824
825 /* The currently parsed enclosing currently parsed TREE_LIST node.  */
826 #define GET_ENCLOSING_CPC() TREE_CHAIN (GET_CPC_LIST ())
827
828 /* Get the next enclosing context.  */
829 #define GET_NEXT_ENCLOSING_CPC(C) TREE_CHAIN (C)
830
831 /* The DECL_TYPE node of the enclosing currently parsed
832    class. NULL_TREE if the currently parsed class isn't an inner
833    class.  */
834 #define GET_ENCLOSING_CPC_CONTEXT() (GET_ENCLOSING_CPC () ?                   \
835                                      TREE_VALUE (GET_ENCLOSING_CPC ()) :      \
836                                      NULL_TREE)
837
838 /* Make sure that innerclass T sits in an appropriate enclosing
839    context.  */
840 #define INNER_ENCLOSING_SCOPE_CHECK(T)                                        \
841   (INNER_CLASS_TYPE_P ((T)) && !ANONYMOUS_CLASS_P ((T))                       \
842    && ((current_this                                                          \
843         /* We have a this and it's not the right one */                       \
844         && (DECL_CONTEXT (TYPE_NAME ((T)))                                    \
845             != TYPE_NAME (TREE_TYPE (TREE_TYPE (current_this))))              \
846         && !inherits_from_p (TREE_TYPE (TREE_TYPE (current_this)),            \
847                              TREE_TYPE (DECL_CONTEXT (TYPE_NAME (T))))        \
848         && !common_enclosing_context_p (TREE_TYPE (TREE_TYPE (current_this)), \
849                                         (T))                                  \
850         && INNER_CLASS_TYPE_P (TREE_TYPE (TREE_TYPE (current_this)))          \
851         && !inherits_from_p                                                   \
852               (TREE_TYPE (DECL_CONTEXT                                        \
853                           (TYPE_NAME (TREE_TYPE (TREE_TYPE (current_this))))),\
854                TREE_TYPE (DECL_CONTEXT (TYPE_NAME (T)))))                     \
855        /* We don't have a this, which is OK if the current function is        \
856           static. */                                                          \
857        || (!current_this                                                      \
858            && current_function_decl                                           \
859            && ! METHOD_STATIC (current_function_decl))))
860
861 /* Push macro. First argument to PUSH_CPC is a DECL_TYPE, second
862    argument is the unqualified currently parsed class name.  */
863 #define PUSH_CPC(C,R) {                                         \
864                         ctxp->current_parsed_class =            \
865                         tree_cons ((R), (C), GET_CPC_LIST ());  \
866                       }
867
868 /* In case of an error, push an error.  */
869 #define PUSH_ERROR() PUSH_CPC (error_mark_node, error_mark_node)
870
871 /* Pop macro. Before we pop, we link the current inner class decl (if any)
872    to its enclosing class.  */
873 #define POP_CPC() {                                     \
874                     link_nested_class_to_enclosing ();  \
875                     ctxp->current_parsed_class =        \
876                       TREE_CHAIN (GET_CPC_LIST ());     \
877                   }
878
879 #define DEBUG_CPC()                                             \
880   do                                                            \
881     {                                                           \
882       tree tmp =  ctxp->current_parsed_class;                   \
883       while (tmp)                                               \
884         {                                                       \
885           fprintf (stderr, "%s ",                               \
886                    IDENTIFIER_POINTER (TREE_PURPOSE (tmp)));    \
887           tmp = TREE_CHAIN (tmp);                               \
888         }                                                       \
889     }                                                           \
890   while (0);
891
892 /* Access to the various initializer statement lists */
893 #define CPC_INITIALIZER_LIST(C)          ((C)->non_static_initialized)
894 #define CPC_STATIC_INITIALIZER_LIST(C)   ((C)->static_initialized)
895 #define CPC_INSTANCE_INITIALIZER_LIST(C) ((C)->instance_initializers)
896
897 /* Access to the various initializer statements */
898 #define CPC_INITIALIZER_STMT(C) (TREE_PURPOSE (CPC_INITIALIZER_LIST (C)))
899 #define CPC_STATIC_INITIALIZER_STMT(C) \
900   (TREE_PURPOSE (CPC_STATIC_INITIALIZER_LIST (C)))
901 #define CPC_INSTANCE_INITIALIZER_STMT(C) \
902   (TREE_PURPOSE (CPC_INSTANCE_INITIALIZER_LIST (C)))
903
904 /* Set various initializer statements */
905 #define SET_CPC_INITIALIZER_STMT(C,S)                   \
906   if (CPC_INITIALIZER_LIST (C))                         \
907     TREE_PURPOSE (CPC_INITIALIZER_LIST (C)) = (S);
908 #define SET_CPC_STATIC_INITIALIZER_STMT(C,S)                    \
909   if (CPC_STATIC_INITIALIZER_LIST (C))                          \
910     TREE_PURPOSE (CPC_STATIC_INITIALIZER_LIST (C)) = (S);
911 #define SET_CPC_INSTANCE_INITIALIZER_STMT(C,S)                  \
912   if (CPC_INSTANCE_INITIALIZER_LIST(C))                         \
913     TREE_PURPOSE (CPC_INSTANCE_INITIALIZER_LIST (C)) = (S);
914
915 /* This is used by the lexer to communicate with the parser.  It is
916    set on an integer constant if the radix is 10, so that the parser
917    can correctly diagnose a numeric overflow.  */
918 #define JAVA_RADIX10_FLAG(NODE) TREE_LANG_FLAG_0(NODE)
919
920 #ifndef JC1_LITE
921 void java_complete_class PARAMS ((void));
922 void java_check_circular_reference PARAMS ((void));
923 void java_fix_constructors PARAMS ((void));
924 void java_layout_classes PARAMS ((void));
925 void java_reorder_fields PARAMS ((void));
926 tree java_method_add_stmt PARAMS ((tree, tree));
927 int java_report_errors PARAMS ((void));
928 extern tree do_resolve_class PARAMS ((tree, tree, tree, tree));
929 #endif
930 char *java_get_line_col PARAMS ((const char *, int, int));
931 extern void reset_report PARAMS ((void));
932
933 /* Always in use, no matter what you compile */
934 void java_push_parser_context PARAMS ((void));
935 void java_pop_parser_context PARAMS ((int));
936 void java_init_lex PARAMS ((FILE *, const char *));
937 extern void java_parser_context_save_global PARAMS ((void));
938 extern void java_parser_context_restore_global PARAMS ((void));
939 int yyparse PARAMS ((void));
940 extern int java_parse PARAMS ((void));
941 extern void yyerror PARAMS ((const char *))
942 #ifdef JC1_LITE
943 ATTRIBUTE_NORETURN
944 #endif
945 ;
946 extern void java_expand_classes PARAMS ((void));
947
948 extern struct parser_ctxt *ctxp;
949 extern struct parser_ctxt *ctxp_for_generation;
950
951 #endif /* ! GCC_JAVA_PARSE_H */