1 /* YACC parser for Go expressions, for GDB.
3 Copyright (C) 2012-2018 Free Software Foundation, Inc.
5 This file is part of GDB.
7 This program 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 3 of the License, or
10 (at your option) any later version.
12 This program 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.
17 You should have received a copy of the GNU General Public License
18 along with this program. If not, see <http://www.gnu.org/licenses/>. */
20 /* This file is derived from c-exp.y, p-exp.y. */
22 /* Parse a Go expression from text in a string,
23 and return the result as a struct expression pointer.
24 That structure contains arithmetic operations in reverse polish,
25 with constants represented by operations that are followed by special data.
26 See expression.h for the details of the format.
27 What is important here is that it can be built up sequentially
28 during the process of parsing; the lower levels of the tree always
29 come first in the result.
31 Note that malloc's and realloc's in this file are transformed to
32 xmalloc and xrealloc respectively by the same sed command in the
33 makefile that remaps any other malloc/realloc inserted by the parser
34 generator. Doing this with #defines and trying to control the interaction
35 with include files (<malloc.h> and <stdlib.h> for example) just became
36 too messy, particularly when such includes can be inserted at random
37 times by the parser generator. */
39 /* Known bugs or limitations:
43 - '_' (blank identifier)
44 - automatic deref of pointers
46 - interfaces, channels, etc.
48 And lots of other things.
49 I'm sure there's some cleanup to do.
56 #include "expression.h"
58 #include "parser-defs.h"
62 #include "bfd.h" /* Required by objfiles.h. */
63 #include "symfile.h" /* Required by objfiles.h. */
64 #include "objfiles.h" /* For have_full_symbols and have_partial_symbols */
68 #define parse_type(ps) builtin_type (parse_gdbarch (ps))
70 /* Remap normal yacc parser interface names (yyparse, yylex, yyerror,
72 #define GDB_YY_REMAP_PREFIX go_
75 /* The state of the parser, used internally when we are parsing the
78 static struct parser_state *pstate = NULL;
82 static int yylex (void);
84 static void yyerror (const char *);
88 /* Although the yacc "value" of an expression is not used,
89 since the result is stored in the structure being created,
90 other node types do have values. */
104 struct symtoken ssym;
106 struct typed_stoken tsval;
109 enum exp_opcode opcode;
110 struct internalvar *ivar;
111 struct stoken_vector svec;
115 /* YYSTYPE gets defined by %union. */
116 static int parse_number (struct parser_state *,
117 const char *, int, int, YYSTYPE *);
120 %type <voidval> exp exp1 type_exp start variable lcurly
124 %token <typed_val_int> INT
125 %token <typed_val_float> FLOAT
127 /* Both NAME and TYPENAME tokens represent symbols in the input,
128 and both convey their data as strings.
129 But a TYPENAME is a string that happens to be defined as a type
130 or builtin type name (such as int or char)
131 and a NAME is any other symbol.
132 Contexts where this distinction is not important can use the
133 nonterminal "name", which matches either NAME or TYPENAME. */
135 %token <tsval> RAW_STRING
136 %token <tsval> STRING
139 %token <tsym> TYPENAME /* Not TYPE_NAME cus already taken. */
140 %token <voidval> COMPLETE
141 /*%type <sval> name*/
142 %type <svec> string_exp
143 %type <ssym> name_not_typename
145 /* A NAME_OR_INT is a symbol which is not known in the symbol table,
146 but which would parse as a valid number in the current input radix.
147 E.g. "c" when input_radix==16. Depending on the parse, it will be
148 turned into a name or into a number. */
149 %token <ssym> NAME_OR_INT
151 %token <lval> TRUE_KEYWORD FALSE_KEYWORD
152 %token STRUCT_KEYWORD INTERFACE_KEYWORD TYPE_KEYWORD CHAN_KEYWORD
153 %token SIZEOF_KEYWORD
154 %token LEN_KEYWORD CAP_KEYWORD
156 %token IOTA_KEYWORD NIL_KEYWORD
162 /* Special type cases. */
163 %token BYTE_KEYWORD /* An alias of uint8. */
165 %token <sval> DOLLAR_VARIABLE
167 %token <opcode> ASSIGN_MODIFY
171 %right '=' ASSIGN_MODIFY
180 %left '<' '>' LEQ GEQ
185 %right UNARY INCREMENT DECREMENT
186 %right LEFT_ARROW '.' '[' '('
196 { write_exp_elt_opcode (pstate, OP_TYPE);
197 write_exp_elt_type (pstate, $1);
198 write_exp_elt_opcode (pstate, OP_TYPE); }
201 /* Expressions, including the comma operator. */
204 { write_exp_elt_opcode (pstate, BINOP_COMMA); }
207 /* Expressions, not including the comma operator. */
208 exp : '*' exp %prec UNARY
209 { write_exp_elt_opcode (pstate, UNOP_IND); }
212 exp : '&' exp %prec UNARY
213 { write_exp_elt_opcode (pstate, UNOP_ADDR); }
216 exp : '-' exp %prec UNARY
217 { write_exp_elt_opcode (pstate, UNOP_NEG); }
220 exp : '+' exp %prec UNARY
221 { write_exp_elt_opcode (pstate, UNOP_PLUS); }
224 exp : '!' exp %prec UNARY
225 { write_exp_elt_opcode (pstate, UNOP_LOGICAL_NOT); }
228 exp : '^' exp %prec UNARY
229 { write_exp_elt_opcode (pstate, UNOP_COMPLEMENT); }
232 exp : exp INCREMENT %prec UNARY
233 { write_exp_elt_opcode (pstate, UNOP_POSTINCREMENT); }
236 exp : exp DECREMENT %prec UNARY
237 { write_exp_elt_opcode (pstate, UNOP_POSTDECREMENT); }
240 /* foo->bar is not in Go. May want as a gdb extension. Later. */
242 exp : exp '.' name_not_typename
243 { write_exp_elt_opcode (pstate, STRUCTOP_STRUCT);
244 write_exp_string (pstate, $3.stoken);
245 write_exp_elt_opcode (pstate, STRUCTOP_STRUCT); }
248 exp : exp '.' name_not_typename COMPLETE
249 { mark_struct_expression (pstate);
250 write_exp_elt_opcode (pstate, STRUCTOP_STRUCT);
251 write_exp_string (pstate, $3.stoken);
252 write_exp_elt_opcode (pstate, STRUCTOP_STRUCT); }
255 exp : exp '.' COMPLETE
257 mark_struct_expression (pstate);
258 write_exp_elt_opcode (pstate, STRUCTOP_STRUCT);
261 write_exp_string (pstate, s);
262 write_exp_elt_opcode (pstate, STRUCTOP_STRUCT); }
265 exp : exp '[' exp1 ']'
266 { write_exp_elt_opcode (pstate, BINOP_SUBSCRIPT); }
270 /* This is to save the value of arglist_len
271 being accumulated by an outer function call. */
272 { start_arglist (); }
273 arglist ')' %prec LEFT_ARROW
274 { write_exp_elt_opcode (pstate, OP_FUNCALL);
275 write_exp_elt_longcst (pstate,
276 (LONGEST) end_arglist ());
277 write_exp_elt_opcode (pstate, OP_FUNCALL); }
281 { start_arglist (); }
291 arglist : arglist ',' exp %prec ABOVE_COMMA
296 { $$ = end_arglist () - 1; }
299 exp : lcurly type rcurly exp %prec UNARY
300 { write_exp_elt_opcode (pstate, UNOP_MEMVAL);
301 write_exp_elt_type (pstate, $2);
302 write_exp_elt_opcode (pstate, UNOP_MEMVAL); }
305 exp : type '(' exp ')' %prec UNARY
306 { write_exp_elt_opcode (pstate, UNOP_CAST);
307 write_exp_elt_type (pstate, $1);
308 write_exp_elt_opcode (pstate, UNOP_CAST); }
315 /* Binary operators in order of decreasing precedence. */
318 { write_exp_elt_opcode (pstate, BINOP_REPEAT); }
322 { write_exp_elt_opcode (pstate, BINOP_MUL); }
326 { write_exp_elt_opcode (pstate, BINOP_DIV); }
330 { write_exp_elt_opcode (pstate, BINOP_REM); }
334 { write_exp_elt_opcode (pstate, BINOP_ADD); }
338 { write_exp_elt_opcode (pstate, BINOP_SUB); }
342 { write_exp_elt_opcode (pstate, BINOP_LSH); }
346 { write_exp_elt_opcode (pstate, BINOP_RSH); }
350 { write_exp_elt_opcode (pstate, BINOP_EQUAL); }
353 exp : exp NOTEQUAL exp
354 { write_exp_elt_opcode (pstate, BINOP_NOTEQUAL); }
358 { write_exp_elt_opcode (pstate, BINOP_LEQ); }
362 { write_exp_elt_opcode (pstate, BINOP_GEQ); }
366 { write_exp_elt_opcode (pstate, BINOP_LESS); }
370 { write_exp_elt_opcode (pstate, BINOP_GTR); }
374 { write_exp_elt_opcode (pstate, BINOP_BITWISE_AND); }
378 { write_exp_elt_opcode (pstate, BINOP_BITWISE_XOR); }
382 { write_exp_elt_opcode (pstate, BINOP_BITWISE_IOR); }
386 { write_exp_elt_opcode (pstate, BINOP_LOGICAL_AND); }
390 { write_exp_elt_opcode (pstate, BINOP_LOGICAL_OR); }
393 exp : exp '?' exp ':' exp %prec '?'
394 { write_exp_elt_opcode (pstate, TERNOP_COND); }
398 { write_exp_elt_opcode (pstate, BINOP_ASSIGN); }
401 exp : exp ASSIGN_MODIFY exp
402 { write_exp_elt_opcode (pstate, BINOP_ASSIGN_MODIFY);
403 write_exp_elt_opcode (pstate, $2);
404 write_exp_elt_opcode (pstate, BINOP_ASSIGN_MODIFY); }
408 { write_exp_elt_opcode (pstate, OP_LONG);
409 write_exp_elt_type (pstate, $1.type);
410 write_exp_elt_longcst (pstate, (LONGEST)($1.val));
411 write_exp_elt_opcode (pstate, OP_LONG); }
416 struct stoken_vector vec;
419 write_exp_string_vector (pstate, $1.type, &vec);
425 parse_number (pstate, $1.stoken.ptr,
426 $1.stoken.length, 0, &val);
427 write_exp_elt_opcode (pstate, OP_LONG);
428 write_exp_elt_type (pstate, val.typed_val_int.type);
429 write_exp_elt_longcst (pstate, (LONGEST)
430 val.typed_val_int.val);
431 write_exp_elt_opcode (pstate, OP_LONG);
437 { write_exp_elt_opcode (pstate, OP_FLOAT);
438 write_exp_elt_type (pstate, $1.type);
439 write_exp_elt_floatcst (pstate, $1.val);
440 write_exp_elt_opcode (pstate, OP_FLOAT); }
446 exp : DOLLAR_VARIABLE
448 write_dollar_variable (pstate, $1);
452 exp : SIZEOF_KEYWORD '(' type ')' %prec UNARY
454 /* TODO(dje): Go objects in structs. */
455 write_exp_elt_opcode (pstate, OP_LONG);
456 /* TODO(dje): What's the right type here? */
459 parse_type (pstate)->builtin_unsigned_int);
460 $3 = check_typedef ($3);
461 write_exp_elt_longcst (pstate,
462 (LONGEST) TYPE_LENGTH ($3));
463 write_exp_elt_opcode (pstate, OP_LONG);
467 exp : SIZEOF_KEYWORD '(' exp ')' %prec UNARY
469 /* TODO(dje): Go objects in structs. */
470 write_exp_elt_opcode (pstate, UNOP_SIZEOF);
476 /* We copy the string here, and not in the
477 lexer, to guarantee that we do not leak a
479 /* Note that we NUL-terminate here, but just
481 struct typed_stoken *vec = XNEW (struct typed_stoken);
486 vec->length = $1.length;
487 vec->ptr = (char *) malloc ($1.length + 1);
488 memcpy (vec->ptr, $1.ptr, $1.length + 1);
491 | string_exp '+' STRING
493 /* Note that we NUL-terminate here, but just
497 $$.tokens = XRESIZEVEC (struct typed_stoken,
500 p = (char *) malloc ($3.length + 1);
501 memcpy (p, $3.ptr, $3.length + 1);
503 $$.tokens[$$.len - 1].type = $3.type;
504 $$.tokens[$$.len - 1].length = $3.length;
505 $$.tokens[$$.len - 1].ptr = p;
509 exp : string_exp %prec ABOVE_COMMA
513 write_exp_string_vector (pstate, 0 /*always utf8*/,
515 for (i = 0; i < $1.len; ++i)
516 free ($1.tokens[i].ptr);
522 { write_exp_elt_opcode (pstate, OP_BOOL);
523 write_exp_elt_longcst (pstate, (LONGEST) $1);
524 write_exp_elt_opcode (pstate, OP_BOOL); }
528 { write_exp_elt_opcode (pstate, OP_BOOL);
529 write_exp_elt_longcst (pstate, (LONGEST) $1);
530 write_exp_elt_opcode (pstate, OP_BOOL); }
533 variable: name_not_typename ENTRY
534 { struct symbol *sym = $1.sym.symbol;
537 || !SYMBOL_IS_ARGUMENT (sym)
538 || !symbol_read_needs_frame (sym))
539 error (_("@entry can be used only for function "
540 "parameters, not for \"%s\""),
541 copy_name ($1.stoken));
543 write_exp_elt_opcode (pstate, OP_VAR_ENTRY_VALUE);
544 write_exp_elt_sym (pstate, sym);
545 write_exp_elt_opcode (pstate, OP_VAR_ENTRY_VALUE);
549 variable: name_not_typename
550 { struct block_symbol sym = $1.sym;
554 if (symbol_read_needs_frame (sym.symbol))
555 innermost_block.update (sym);
557 write_exp_elt_opcode (pstate, OP_VAR_VALUE);
558 write_exp_elt_block (pstate, sym.block);
559 write_exp_elt_sym (pstate, sym.symbol);
560 write_exp_elt_opcode (pstate, OP_VAR_VALUE);
562 else if ($1.is_a_field_of_this)
564 /* TODO(dje): Can we get here?
565 E.g., via a mix of c++ and go? */
566 gdb_assert_not_reached ("go with `this' field");
570 struct bound_minimal_symbol msymbol;
571 char *arg = copy_name ($1.stoken);
574 lookup_bound_minimal_symbol (arg);
575 if (msymbol.minsym != NULL)
576 write_exp_msymbol (pstate, msymbol);
577 else if (!have_full_symbols ()
578 && !have_partial_symbols ())
579 error (_("No symbol table is loaded. "
580 "Use the \"file\" command."));
582 error (_("No symbol \"%s\" in current context."),
583 copy_name ($1.stoken));
589 method_exp: PACKAGENAME '.' name '.' name
595 type /* Implements (approximately): [*] type-specifier */
597 { $$ = lookup_pointer_type ($2); }
601 | STRUCT_KEYWORD name
602 { $$ = lookup_struct (copy_name ($2),
603 expression_context_block); }
606 { $$ = builtin_go_type (parse_gdbarch (pstate))
611 name : NAME { $$ = $1.stoken; }
612 | TYPENAME { $$ = $1.stoken; }
613 | NAME_OR_INT { $$ = $1.stoken; }
619 /* These would be useful if name_not_typename was useful, but it is just
620 a fake for "variable", so these cause reduce/reduce conflicts because
621 the parser can't tell whether NAME_OR_INT is a name_not_typename (=variable,
622 =exp) or just an exp. If name_not_typename was ever used in an lvalue
623 context where only a name could occur, this might be useful.
630 /* Take care of parsing a number (anything that starts with a digit).
631 Set yylval and return the token type; update lexptr.
632 LEN is the number of characters in it. */
634 /* FIXME: Needs some error checking for the float case. */
635 /* FIXME(dje): IWBN to use c-exp.y's parse_number if we could.
636 That will require moving the guts into a function that we both call
637 as our YYSTYPE is different than c-exp.y's */
640 parse_number (struct parser_state *par_state,
641 const char *p, int len, int parsed_float, YYSTYPE *putithere)
643 /* FIXME: Shouldn't these be unsigned? We don't deal with negative values
644 here, and we do kind of silly things like cast to unsigned. */
651 int base = input_radix;
654 /* Number of "L" suffixes encountered. */
657 /* We have found a "L" or "U" suffix. */
658 int found_suffix = 0;
661 struct type *signed_type;
662 struct type *unsigned_type;
666 const struct builtin_go_type *builtin_go_types
667 = builtin_go_type (parse_gdbarch (par_state));
669 /* Handle suffixes: 'f' for float32, 'l' for long double.
670 FIXME: This appears to be an extension -- do we want this? */
671 if (len >= 1 && tolower (p[len - 1]) == 'f')
673 putithere->typed_val_float.type
674 = builtin_go_types->builtin_float32;
677 else if (len >= 1 && tolower (p[len - 1]) == 'l')
679 putithere->typed_val_float.type
680 = parse_type (par_state)->builtin_long_double;
683 /* Default type for floating-point literals is float64. */
686 putithere->typed_val_float.type
687 = builtin_go_types->builtin_float64;
690 if (!parse_float (p, len,
691 putithere->typed_val_float.type,
692 putithere->typed_val_float.val))
697 /* Handle base-switching prefixes 0x, 0t, 0d, 0. */
741 if (c >= 'A' && c <= 'Z')
743 if (c != 'l' && c != 'u')
745 if (c >= '0' && c <= '9')
753 if (base > 10 && c >= 'a' && c <= 'f')
757 n += i = c - 'a' + 10;
770 return ERROR; /* Char not a digit */
773 return ERROR; /* Invalid digit in this base. */
775 /* Portably test for overflow (only works for nonzero values, so make
776 a second check for zero). FIXME: Can't we just make n and prevn
777 unsigned and avoid this? */
778 if (c != 'l' && c != 'u' && (prevn >= n) && n != 0)
779 unsigned_p = 1; /* Try something unsigned. */
781 /* Portably test for unsigned overflow.
782 FIXME: This check is wrong; for example it doesn't find overflow
783 on 0x123456789 when LONGEST is 32 bits. */
784 if (c != 'l' && c != 'u' && n != 0)
786 if ((unsigned_p && (ULONGEST) prevn >= (ULONGEST) n))
787 error (_("Numeric constant too large."));
792 /* An integer constant is an int, a long, or a long long. An L
793 suffix forces it to be long; an LL suffix forces it to be long
794 long. If not forced to a larger size, it gets the first type of
795 the above that it fits in. To figure out whether it fits, we
796 shift it right and see whether anything remains. Note that we
797 can't shift sizeof (LONGEST) * HOST_CHAR_BIT bits or more in one
798 operation, because many compilers will warn about such a shift
799 (which always produces a zero result). Sometimes gdbarch_int_bit
800 or gdbarch_long_bit will be that big, sometimes not. To deal with
801 the case where it is we just always shift the value more than
802 once, with fewer bits each time. */
804 un = (ULONGEST)n >> 2;
806 && (un >> (gdbarch_int_bit (parse_gdbarch (par_state)) - 2)) == 0)
809 = ((ULONGEST)1) << (gdbarch_int_bit (parse_gdbarch (par_state)) - 1);
811 /* A large decimal (not hex or octal) constant (between INT_MAX
812 and UINT_MAX) is a long or unsigned long, according to ANSI,
813 never an unsigned int, but this code treats it as unsigned
814 int. This probably should be fixed. GCC gives a warning on
817 unsigned_type = parse_type (par_state)->builtin_unsigned_int;
818 signed_type = parse_type (par_state)->builtin_int;
821 && (un >> (gdbarch_long_bit (parse_gdbarch (par_state)) - 2)) == 0)
824 = ((ULONGEST)1) << (gdbarch_long_bit (parse_gdbarch (par_state)) - 1);
825 unsigned_type = parse_type (par_state)->builtin_unsigned_long;
826 signed_type = parse_type (par_state)->builtin_long;
831 if (sizeof (ULONGEST) * HOST_CHAR_BIT
832 < gdbarch_long_long_bit (parse_gdbarch (par_state)))
833 /* A long long does not fit in a LONGEST. */
834 shift = (sizeof (ULONGEST) * HOST_CHAR_BIT - 1);
836 shift = (gdbarch_long_long_bit (parse_gdbarch (par_state)) - 1);
837 high_bit = (ULONGEST) 1 << shift;
838 unsigned_type = parse_type (par_state)->builtin_unsigned_long_long;
839 signed_type = parse_type (par_state)->builtin_long_long;
842 putithere->typed_val_int.val = n;
844 /* If the high bit of the worked out type is set then this number
845 has to be unsigned. */
847 if (unsigned_p || (n & high_bit))
849 putithere->typed_val_int.type = unsigned_type;
853 putithere->typed_val_int.type = signed_type;
859 /* Temporary obstack used for holding strings. */
860 static struct obstack tempbuf;
861 static int tempbuf_init;
863 /* Parse a string or character literal from TOKPTR. The string or
864 character may be wide or unicode. *OUTPTR is set to just after the
865 end of the literal in the input string. The resulting token is
866 stored in VALUE. This returns a token value, either STRING or
867 CHAR, depending on what was parsed. *HOST_CHARS is set to the
868 number of host characters in the literal. */
871 parse_string_or_char (const char *tokptr, const char **outptr,
872 struct typed_stoken *value, int *host_chars)
876 /* Build the gdb internal form of the input string in tempbuf. Note
877 that the buffer is null byte terminated *only* for the
878 convenience of debugging gdb itself and printing the buffer
879 contents when the buffer contains no embedded nulls. Gdb does
880 not depend upon the buffer being null byte terminated, it uses
881 the length string instead. This allows gdb to handle C strings
882 (as well as strings in other languages) with embedded null
888 obstack_free (&tempbuf, NULL);
889 obstack_init (&tempbuf);
891 /* Skip the quote. */
903 *host_chars += c_parse_escape (&tokptr, &tempbuf);
909 obstack_1grow (&tempbuf, c);
911 /* FIXME: this does the wrong thing with multi-byte host
912 characters. We could use mbrlen here, but that would
913 make "set host-charset" a bit less useful. */
918 if (*tokptr != quote)
921 error (_("Unterminated string in expression."));
923 error (_("Unmatched single quote."));
927 value->type = C_STRING | (quote == '\'' ? C_CHAR : 0); /*FIXME*/
928 value->ptr = (char *) obstack_base (&tempbuf);
929 value->length = obstack_object_size (&tempbuf);
933 return quote == '\'' ? CHAR : STRING;
940 enum exp_opcode opcode;
943 static const struct token tokentab3[] =
945 {">>=", ASSIGN_MODIFY, BINOP_RSH},
946 {"<<=", ASSIGN_MODIFY, BINOP_LSH},
947 /*{"&^=", ASSIGN_MODIFY, BINOP_BITWISE_ANDNOT}, TODO */
948 {"...", DOTDOTDOT, OP_NULL},
951 static const struct token tokentab2[] =
953 {"+=", ASSIGN_MODIFY, BINOP_ADD},
954 {"-=", ASSIGN_MODIFY, BINOP_SUB},
955 {"*=", ASSIGN_MODIFY, BINOP_MUL},
956 {"/=", ASSIGN_MODIFY, BINOP_DIV},
957 {"%=", ASSIGN_MODIFY, BINOP_REM},
958 {"|=", ASSIGN_MODIFY, BINOP_BITWISE_IOR},
959 {"&=", ASSIGN_MODIFY, BINOP_BITWISE_AND},
960 {"^=", ASSIGN_MODIFY, BINOP_BITWISE_XOR},
961 {"++", INCREMENT, BINOP_END},
962 {"--", DECREMENT, BINOP_END},
963 /*{"->", RIGHT_ARROW, BINOP_END}, Doesn't exist in Go. */
964 {"<-", LEFT_ARROW, BINOP_END},
965 {"&&", ANDAND, BINOP_END},
966 {"||", OROR, BINOP_END},
967 {"<<", LSH, BINOP_END},
968 {">>", RSH, BINOP_END},
969 {"==", EQUAL, BINOP_END},
970 {"!=", NOTEQUAL, BINOP_END},
971 {"<=", LEQ, BINOP_END},
972 {">=", GEQ, BINOP_END},
973 /*{"&^", ANDNOT, BINOP_END}, TODO */
976 /* Identifier-like tokens. */
977 static const struct token ident_tokens[] =
979 {"true", TRUE_KEYWORD, OP_NULL},
980 {"false", FALSE_KEYWORD, OP_NULL},
981 {"nil", NIL_KEYWORD, OP_NULL},
982 {"const", CONST_KEYWORD, OP_NULL},
983 {"struct", STRUCT_KEYWORD, OP_NULL},
984 {"type", TYPE_KEYWORD, OP_NULL},
985 {"interface", INTERFACE_KEYWORD, OP_NULL},
986 {"chan", CHAN_KEYWORD, OP_NULL},
987 {"byte", BYTE_KEYWORD, OP_NULL}, /* An alias of uint8. */
988 {"len", LEN_KEYWORD, OP_NULL},
989 {"cap", CAP_KEYWORD, OP_NULL},
990 {"new", NEW_KEYWORD, OP_NULL},
991 {"iota", IOTA_KEYWORD, OP_NULL},
994 /* This is set if a NAME token appeared at the very end of the input
995 string, with no whitespace separating the name from the EOF. This
996 is used only when parsing to do field name completion. */
997 static int saw_name_at_eof;
999 /* This is set if the previously-returned token was a structure
1000 operator -- either '.' or ARROW. This is used only when parsing to
1001 do field name completion. */
1002 static int last_was_structop;
1004 /* Read one token, getting characters through lexptr. */
1007 lex_one_token (struct parser_state *par_state)
1012 const char *tokstart;
1013 int saw_structop = last_was_structop;
1016 last_was_structop = 0;
1020 prev_lexptr = lexptr;
1023 /* See if it is a special token of length 3. */
1024 for (i = 0; i < sizeof (tokentab3) / sizeof (tokentab3[0]); i++)
1025 if (strncmp (tokstart, tokentab3[i].oper, 3) == 0)
1028 yylval.opcode = tokentab3[i].opcode;
1029 return tokentab3[i].token;
1032 /* See if it is a special token of length 2. */
1033 for (i = 0; i < sizeof (tokentab2) / sizeof (tokentab2[0]); i++)
1034 if (strncmp (tokstart, tokentab2[i].oper, 2) == 0)
1037 yylval.opcode = tokentab2[i].opcode;
1038 /* NOTE: -> doesn't exist in Go, so we don't need to watch for
1039 setting last_was_structop here. */
1040 return tokentab2[i].token;
1043 switch (c = *tokstart)
1046 if (saw_name_at_eof)
1048 saw_name_at_eof = 0;
1051 else if (saw_structop)
1070 if (paren_depth == 0)
1077 if (comma_terminates
1078 && paren_depth == 0)
1084 /* Might be a floating point number. */
1085 if (lexptr[1] < '0' || lexptr[1] > '9')
1087 if (parse_completion)
1088 last_was_structop = 1;
1089 goto symbol; /* Nope, must be a symbol. */
1104 /* It's a number. */
1105 int got_dot = 0, got_e = 0, toktype;
1106 const char *p = tokstart;
1107 int hex = input_radix > 10;
1109 if (c == '0' && (p[1] == 'x' || p[1] == 'X'))
1117 /* This test includes !hex because 'e' is a valid hex digit
1118 and thus does not indicate a floating point number when
1119 the radix is hex. */
1120 if (!hex && !got_e && (*p == 'e' || *p == 'E'))
1121 got_dot = got_e = 1;
1122 /* This test does not include !hex, because a '.' always indicates
1123 a decimal floating point number regardless of the radix. */
1124 else if (!got_dot && *p == '.')
1126 else if (got_e && (p[-1] == 'e' || p[-1] == 'E')
1127 && (*p == '-' || *p == '+'))
1128 /* This is the sign of the exponent, not the end of the
1131 /* We will take any letters or digits. parse_number will
1132 complain if past the radix, or if L or U are not final. */
1133 else if ((*p < '0' || *p > '9')
1134 && ((*p < 'a' || *p > 'z')
1135 && (*p < 'A' || *p > 'Z')))
1138 toktype = parse_number (par_state, tokstart, p - tokstart,
1139 got_dot|got_e, &yylval);
1140 if (toktype == ERROR)
1142 char *err_copy = (char *) alloca (p - tokstart + 1);
1144 memcpy (err_copy, tokstart, p - tokstart);
1145 err_copy[p - tokstart] = 0;
1146 error (_("Invalid number \"%s\"."), err_copy);
1154 const char *p = &tokstart[1];
1155 size_t len = strlen ("entry");
1157 while (isspace (*p))
1159 if (strncmp (p, "entry", len) == 0 && !isalnum (p[len])
1193 int result = parse_string_or_char (tokstart, &lexptr, &yylval.tsval,
1198 error (_("Empty character constant."));
1199 else if (host_len > 2 && c == '\'')
1202 namelen = lexptr - tokstart - 1;
1205 else if (host_len > 1)
1206 error (_("Invalid character constant."));
1212 if (!(c == '_' || c == '$'
1213 || (c >= 'a' && c <= 'z') || (c >= 'A' && c <= 'Z')))
1214 /* We must have come across a bad character (e.g. ';'). */
1215 error (_("Invalid character '%c' in expression."), c);
1217 /* It's a name. See how long it is. */
1219 for (c = tokstart[namelen];
1220 (c == '_' || c == '$' || (c >= '0' && c <= '9')
1221 || (c >= 'a' && c <= 'z') || (c >= 'A' && c <= 'Z'));)
1223 c = tokstart[++namelen];
1226 /* The token "if" terminates the expression and is NOT removed from
1227 the input stream. It doesn't count if it appears in the
1228 expansion of a macro. */
1230 && tokstart[0] == 'i'
1231 && tokstart[1] == 'f')
1236 /* For the same reason (breakpoint conditions), "thread N"
1237 terminates the expression. "thread" could be an identifier, but
1238 an identifier is never followed by a number without intervening
1240 Handle abbreviations of these, similarly to
1241 breakpoint.c:find_condition_and_thread.
1242 TODO: Watch for "goroutine" here? */
1244 && strncmp (tokstart, "thread", namelen) == 0
1245 && (tokstart[namelen] == ' ' || tokstart[namelen] == '\t'))
1247 const char *p = tokstart + namelen + 1;
1249 while (*p == ' ' || *p == '\t')
1251 if (*p >= '0' && *p <= '9')
1259 yylval.sval.ptr = tokstart;
1260 yylval.sval.length = namelen;
1262 /* Catch specific keywords. */
1263 copy = copy_name (yylval.sval);
1264 for (i = 0; i < sizeof (ident_tokens) / sizeof (ident_tokens[0]); i++)
1265 if (strcmp (copy, ident_tokens[i].oper) == 0)
1267 /* It is ok to always set this, even though we don't always
1268 strictly need to. */
1269 yylval.opcode = ident_tokens[i].opcode;
1270 return ident_tokens[i].token;
1273 if (*tokstart == '$')
1274 return DOLLAR_VARIABLE;
1276 if (parse_completion && *lexptr == '\0')
1277 saw_name_at_eof = 1;
1281 /* An object of this type is pushed on a FIFO by the "outer" lexer. */
1288 DEF_VEC_O (token_and_value);
1290 /* A FIFO of tokens that have been read but not yet returned to the
1292 static VEC (token_and_value) *token_fifo;
1294 /* Non-zero if the lexer should return tokens from the FIFO. */
1297 /* Temporary storage for yylex; this holds symbol names as they are
1299 static auto_obstack name_obstack;
1301 /* Build "package.name" in name_obstack.
1302 For convenience of the caller, the name is NUL-terminated,
1303 but the NUL is not included in the recorded length. */
1305 static struct stoken
1306 build_packaged_name (const char *package, int package_len,
1307 const char *name, int name_len)
1309 struct stoken result;
1311 name_obstack.clear ();
1312 obstack_grow (&name_obstack, package, package_len);
1313 obstack_grow_str (&name_obstack, ".");
1314 obstack_grow (&name_obstack, name, name_len);
1315 obstack_grow (&name_obstack, "", 1);
1316 result.ptr = (char *) obstack_base (&name_obstack);
1317 result.length = obstack_object_size (&name_obstack) - 1;
1322 /* Return non-zero if NAME is a package name.
1323 BLOCK is the scope in which to interpret NAME; this can be NULL
1324 to mean the global scope. */
1327 package_name_p (const char *name, const struct block *block)
1330 struct field_of_this_result is_a_field_of_this;
1332 sym = lookup_symbol (name, block, STRUCT_DOMAIN, &is_a_field_of_this).symbol;
1335 && SYMBOL_CLASS (sym) == LOC_TYPEDEF
1336 && TYPE_CODE (SYMBOL_TYPE (sym)) == TYPE_CODE_MODULE)
1342 /* Classify a (potential) function in the "unsafe" package.
1343 We fold these into "keywords" to keep things simple, at least until
1344 something more complex is warranted. */
1347 classify_unsafe_function (struct stoken function_name)
1349 char *copy = copy_name (function_name);
1351 if (strcmp (copy, "Sizeof") == 0)
1353 yylval.sval = function_name;
1354 return SIZEOF_KEYWORD;
1357 error (_("Unknown function in `unsafe' package: %s"), copy);
1360 /* Classify token(s) "name1.name2" where name1 is known to be a package.
1361 The contents of the token are in `yylval'.
1362 Updates yylval and returns the new token type.
1364 The result is one of NAME, NAME_OR_INT, or TYPENAME. */
1367 classify_packaged_name (const struct block *block)
1370 struct block_symbol sym;
1371 struct field_of_this_result is_a_field_of_this;
1373 copy = copy_name (yylval.sval);
1375 sym = lookup_symbol (copy, block, VAR_DOMAIN, &is_a_field_of_this);
1379 yylval.ssym.sym = sym;
1380 yylval.ssym.is_a_field_of_this = is_a_field_of_this.type != NULL;
1386 /* Classify a NAME token.
1387 The contents of the token are in `yylval'.
1388 Updates yylval and returns the new token type.
1389 BLOCK is the block in which lookups start; this can be NULL
1390 to mean the global scope.
1392 The result is one of NAME, NAME_OR_INT, or TYPENAME. */
1395 classify_name (struct parser_state *par_state, const struct block *block)
1398 struct block_symbol sym;
1400 struct field_of_this_result is_a_field_of_this;
1402 copy = copy_name (yylval.sval);
1404 /* Try primitive types first so they win over bad/weird debug info. */
1405 type = language_lookup_primitive_type (parse_language (par_state),
1406 parse_gdbarch (par_state),
1410 /* NOTE: We take advantage of the fact that yylval coming in was a
1411 NAME, and that struct ttype is a compatible extension of struct
1412 stoken, so yylval.tsym.stoken is already filled in. */
1413 yylval.tsym.type = type;
1417 /* TODO: What about other types? */
1419 sym = lookup_symbol (copy, block, VAR_DOMAIN, &is_a_field_of_this);
1423 yylval.ssym.sym = sym;
1424 yylval.ssym.is_a_field_of_this = is_a_field_of_this.type != NULL;
1428 /* If we didn't find a symbol, look again in the current package.
1429 This is to, e.g., make "p global_var" work without having to specify
1430 the package name. We intentionally only looks for objects in the
1434 char *current_package_name = go_block_package_name (block);
1436 if (current_package_name != NULL)
1438 struct stoken sval =
1439 build_packaged_name (current_package_name,
1440 strlen (current_package_name),
1441 copy, strlen (copy));
1443 xfree (current_package_name);
1444 sym = lookup_symbol (sval.ptr, block, VAR_DOMAIN,
1445 &is_a_field_of_this);
1448 yylval.ssym.stoken = sval;
1449 yylval.ssym.sym = sym;
1450 yylval.ssym.is_a_field_of_this = is_a_field_of_this.type != NULL;
1456 /* Input names that aren't symbols but ARE valid hex numbers, when
1457 the input radix permits them, can be names or numbers depending
1458 on the parse. Note we support radixes > 16 here. */
1459 if ((copy[0] >= 'a' && copy[0] < 'a' + input_radix - 10)
1460 || (copy[0] >= 'A' && copy[0] < 'A' + input_radix - 10))
1462 YYSTYPE newlval; /* Its value is ignored. */
1463 int hextype = parse_number (par_state, copy, yylval.sval.length,
1467 yylval.ssym.sym.symbol = NULL;
1468 yylval.ssym.sym.block = NULL;
1469 yylval.ssym.is_a_field_of_this = 0;
1474 yylval.ssym.sym.symbol = NULL;
1475 yylval.ssym.sym.block = NULL;
1476 yylval.ssym.is_a_field_of_this = 0;
1480 /* This is taken from c-exp.y mostly to get something working.
1481 The basic structure has been kept because we may yet need some of it. */
1486 token_and_value current, next;
1488 if (popping && !VEC_empty (token_and_value, token_fifo))
1490 token_and_value tv = *VEC_index (token_and_value, token_fifo, 0);
1491 VEC_ordered_remove (token_and_value, token_fifo, 0);
1493 /* There's no need to fall through to handle package.name
1494 as that can never happen here. In theory. */
1499 current.token = lex_one_token (pstate);
1501 /* TODO: Need a way to force specifying name1 as a package.
1504 if (current.token != NAME)
1505 return current.token;
1507 /* See if we have "name1 . name2". */
1509 current.value = yylval;
1510 next.token = lex_one_token (pstate);
1511 next.value = yylval;
1513 if (next.token == '.')
1515 token_and_value name2;
1517 name2.token = lex_one_token (pstate);
1518 name2.value = yylval;
1520 if (name2.token == NAME)
1522 /* Ok, we have "name1 . name2". */
1525 copy = copy_name (current.value.sval);
1527 if (strcmp (copy, "unsafe") == 0)
1530 return classify_unsafe_function (name2.value.sval);
1533 if (package_name_p (copy, expression_context_block))
1536 yylval.sval = build_packaged_name (current.value.sval.ptr,
1537 current.value.sval.length,
1538 name2.value.sval.ptr,
1539 name2.value.sval.length);
1540 return classify_packaged_name (expression_context_block);
1544 VEC_safe_push (token_and_value, token_fifo, &next);
1545 VEC_safe_push (token_and_value, token_fifo, &name2);
1549 VEC_safe_push (token_and_value, token_fifo, &next);
1552 /* If we arrive here we don't have a package-qualified name. */
1555 yylval = current.value;
1556 return classify_name (pstate, expression_context_block);
1560 go_parse (struct parser_state *par_state)
1562 /* Setting up the parser state. */
1563 scoped_restore pstate_restore = make_scoped_restore (&pstate);
1564 gdb_assert (par_state != NULL);
1567 scoped_restore restore_yydebug = make_scoped_restore (&yydebug,
1570 /* Initialize some state used by the lexer. */
1571 last_was_structop = 0;
1572 saw_name_at_eof = 0;
1574 VEC_free (token_and_value, token_fifo);
1576 name_obstack.clear ();
1582 yyerror (const char *msg)
1585 lexptr = prev_lexptr;
1587 error (_("A %s in expression, near `%s'."), msg, lexptr);