Newer
Older
Copyright (C) 1986, 1987, 1989, 1992, 1993, 1994, 1995, 1996, 1998,
1999, 2000, 2001, 2002, 2003, 2004, 2005,
2006, 2007, 2008, 2009, 2010, 2011, 2012 Free Software Foundation, Inc.
Written by Per Bothner, 1994.
Based on CCCP program by Paul Rubin, June 1986
Adapted to ANSI C, Richard Stallman, Jan 1987
This program is free software; you can redistribute it and/or modify it
under the terms of the GNU General Public License as published by the
Free Software Foundation; either version 3, or (at your option) any
later version.
This program is distributed in the hope that it will be useful,
but WITHOUT ANY WARRANTY; without even the implied warranty of
MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
GNU General Public License for more details.
You should have received a copy of the GNU General Public License
along with this program; see the file COPYING3. If not see
<http://www.gnu.org/licenses/>.
In other words, you are welcome to use, share and improve this program.
You are forbidden to forbid anyone else to use, share and improve
what you give them. Help stamp out software-hoarding! */
#include "config.h"
#include "system.h"
#include "cpplib.h"
/* This structure represents the tokens of a macro argument. These
tokens can be macro themselves, in which case they can be either
expanded or unexpanded. When they are expanded, this data
structure keeps both the expanded and unexpanded forms. */
const cpp_token **first; /* First token in unexpanded argument. */
const cpp_token **expanded; /* Macro-expanded argument. */
const cpp_token *stringified; /* Stringified argument. */
unsigned int count; /* # of tokens in argument. */
unsigned int expanded_count; /* # of tokens in expanded argument. */
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
source_location *virt_locs; /* Where virtual locations for
unexpanded tokens are stored. */
source_location *expanded_virt_locs; /* Where virtual locations for
expanded tokens are
stored. */
};
/* The kind of macro tokens which the instance of
macro_arg_token_iter is supposed to iterate over. */
enum macro_arg_token_kind {
MACRO_ARG_TOKEN_NORMAL,
/* This is a macro argument token that got transformed into a string
litteral, e.g. #foo. */
MACRO_ARG_TOKEN_STRINGIFIED,
/* This is a token resulting from the expansion of a macro
argument that was itself a macro. */
MACRO_ARG_TOKEN_EXPANDED
};
/* An iterator over tokens coming from a function-like macro
argument. */
typedef struct macro_arg_token_iter macro_arg_token_iter;
struct macro_arg_token_iter
{
/* Whether or not -ftrack-macro-expansion is used. */
bool track_macro_exp_p;
/* The kind of token over which we are supposed to iterate. */
enum macro_arg_token_kind kind;
/* A pointer to the current token pointed to by the iterator. */
const cpp_token **token_ptr;
/* A pointer to the "full" location of the current token. If
-ftrack-macro-expansion is used this location tracks loci accross
macro expansion. */
const source_location *location_ptr;
#ifdef ENABLE_CHECKING
/* The number of times the iterator went forward. This useful only
when checking is enabled. */
size_t num_forwards;
#endif
static int enter_macro_context (cpp_reader *, cpp_hashnode *,
static int builtin_macro (cpp_reader *, cpp_hashnode *);
static void push_ptoken_context (cpp_reader *, cpp_hashnode *, _cpp_buff *,
const cpp_token **, unsigned int);
static void push_extended_tokens_context (cpp_reader *, cpp_hashnode *,
_cpp_buff *, source_location *,
const cpp_token **, unsigned int);
static _cpp_buff *collect_args (cpp_reader *, const cpp_hashnode *,
static cpp_context *next_context (cpp_reader *);
static const cpp_token *padding_token (cpp_reader *, const cpp_token *);
static void expand_arg (cpp_reader *, macro_arg *);
static const cpp_token *new_string_token (cpp_reader *, uchar *, unsigned int);
static const cpp_token *stringify_arg (cpp_reader *, macro_arg *);
static void paste_all_tokens (cpp_reader *, const cpp_token *);
static bool paste_tokens (cpp_reader *, const cpp_token **, const cpp_token *);
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
static void alloc_expanded_arg_mem (cpp_reader *, macro_arg *, size_t);
static void ensure_expanded_arg_room (cpp_reader *, macro_arg *, size_t, size_t *);
static void delete_macro_args (_cpp_buff*, unsigned num_args);
static void set_arg_token (macro_arg *, const cpp_token *,
source_location, size_t,
enum macro_arg_token_kind,
bool);
static const source_location *get_arg_token_location (const macro_arg *,
enum macro_arg_token_kind);
static const cpp_token **arg_token_ptr_at (const macro_arg *,
size_t,
enum macro_arg_token_kind,
source_location **virt_location);
static void macro_arg_token_iter_init (macro_arg_token_iter *, bool,
enum macro_arg_token_kind,
const macro_arg *,
const cpp_token **);
static const cpp_token *macro_arg_token_iter_get_token
(const macro_arg_token_iter *it);
static source_location macro_arg_token_iter_get_location
(const macro_arg_token_iter *);
static void macro_arg_token_iter_forward (macro_arg_token_iter *);
static _cpp_buff *tokens_buff_new (cpp_reader *, size_t,
source_location **);
static size_t tokens_buff_count (_cpp_buff *);
static const cpp_token **tokens_buff_last_token_ptr (_cpp_buff *);
static inline const cpp_token **tokens_buff_put_token_to (const cpp_token **,
source_location *,
const cpp_token *,
source_location,
source_location,
const struct line_map *,
unsigned int);
static const cpp_token **tokens_buff_add_token (_cpp_buff *,
source_location *,
const cpp_token *,
source_location,
source_location,
const struct line_map *,
unsigned int);
static inline void tokens_buff_remove_last_token (_cpp_buff *);
static void replace_args (cpp_reader *, cpp_hashnode *, cpp_macro *,
static _cpp_buff *funlike_invocation_p (cpp_reader *, cpp_hashnode *,
static bool create_iso_definition (cpp_reader *, cpp_macro *);
static cpp_token *alloc_expansion_token (cpp_reader *, cpp_macro *);
static cpp_token *lex_expansion_token (cpp_reader *, cpp_macro *);
static bool warn_of_redefinition (cpp_reader *, cpp_hashnode *,
const cpp_macro *);
static bool parse_params (cpp_reader *, cpp_macro *);
static void check_trad_stringification (cpp_reader *, const cpp_macro *,
const cpp_string *);
static bool reached_end_of_context (cpp_context *);
static void consume_next_token_from_context (cpp_reader *pfile,
const cpp_token **,
source_location *);
static const cpp_token* cpp_get_token_1 (cpp_reader *, source_location *);
static cpp_hashnode* macro_of_context (cpp_context *context);
/* Statistical counter tracking the number of macros that got
expanded. */
unsigned num_expanded_macros_counter = 0;
/* Statistical counter tracking the total number tokens resulting
from macro expansion. */
unsigned num_macro_tokens_counter = 0;
/* Emits a warning if NODE is a macro defined in the main file that
has not been used. */
int
_cpp_warn_if_unused_macro (cpp_reader *pfile, cpp_hashnode *node,
void *v ATTRIBUTE_UNUSED)
{
if (node->type == NT_MACRO && !(node->flags & NODE_BUILTIN))
{
cpp_macro *macro = node->value.macro;
if (!macro->used
&& MAIN_FILE_P (linemap_lookup (pfile->line_table, macro->line)))
Simon Baldwin
committed
cpp_warning_with_line (pfile, CPP_W_UNUSED_MACROS, macro->line, 0,
"macro \"%s\" is not used", NODE_NAME (node));
/* Allocates and returns a CPP_STRING token, containing TEXT of length
LEN, after null-terminating it. TEXT must be in permanent storage. */
static const cpp_token *
new_string_token (cpp_reader *pfile, unsigned char *text, unsigned int len)
cpp_token *token = _cpp_temp_token (pfile);
token->val.str.len = len;
token->val.str.text = text;
}
static const char * const monthnames[] =
{
"Jan", "Feb", "Mar", "Apr", "May", "Jun",
"Jul", "Aug", "Sep", "Oct", "Nov", "Dec"
};
/* Helper function for builtin_macro. Returns the text generated by
a builtin macro. */
_cpp_builtin_macro_text (cpp_reader *pfile, cpp_hashnode *node)
const uchar *result = NULL;
John David Anglin
committed
cpp_error (pfile, CPP_DL_ICE, "invalid built-in macro \"%s\"",
NODE_NAME (node));
232
233
234
235
236
237
238
239
240
241
242
243
244
245
246
247
248
249
250
251
252
253
254
255
256
257
258
259
260
261
262
case BT_TIMESTAMP:
{
cpp_buffer *pbuffer = cpp_get_buffer (pfile);
if (pbuffer->timestamp == NULL)
{
/* Initialize timestamp value of the assotiated file. */
struct _cpp_file *file = cpp_get_file (pbuffer);
if (file)
{
/* Generate __TIMESTAMP__ string, that represents
the date and time of the last modification
of the current source file. The string constant
looks like "Sun Sep 16 01:03:52 1973". */
struct tm *tb = NULL;
struct stat *st = _cpp_get_file_stat (file);
if (st)
tb = localtime (&st->st_mtime);
if (tb)
{
char *str = asctime (tb);
size_t len = strlen (str);
unsigned char *buf = _cpp_unaligned_alloc (pfile, len + 2);
buf[0] = '"';
strcpy ((char *) buf + 1, str);
buf[len] = '"';
pbuffer->timestamp = buf;
}
else
{
cpp_errno (pfile, CPP_DL_WARNING,
"could not determine file timestamp");
pbuffer->timestamp = UC"\"??? ??? ?? ??:??:?? ????\"";
}
}
}
result = pbuffer->timestamp;
}
break;
if (node->value.builtin == BT_FILE)
name = linemap_get_expansion_filename (pfile->line_table,
pfile->line_table->highest_line);
else
{
name = _cpp_get_file_name (pfile->main_file);
if (!name)
abort ();
buf = _cpp_unaligned_alloc (pfile, len * 2 + 3);
result = buf;
*buf = '"';
buf = cpp_quote_string (buf + 1, (const unsigned char *) name, len);
*buf++ = '"';
*buf = '\0';
/* The line map depth counts the primary source as level 1, but
historically __INCLUDE_DEPTH__ has called the primary source
level 0. */
number = pfile->line_table->depth - 1;
case BT_SPECLINE:
/* If __LINE__ is embedded in a macro, it must expand to the
line of the macro's invocation, not its definition.
Otherwise things like assert() will not work properly. */
number = linemap_get_expansion_line (pfile->line_table,
CPP_OPTION (pfile, traditional)
? pfile->line_table->highest_line
: pfile->cur_token[-1].src_loc);
/* __STDC__ has the value 1 under normal circumstances.
However, if (a) we are in a system header, (b) the option
Zack Weinberg
committed
stdc_0_in_system_headers is true (set by target config), and
(c) we are not in strictly conforming mode, then it has the
Jakub Jelinek
committed
value 0. (b) and (c) are already checked in cpp_init_builtins. */
Jakub Jelinek
committed
if (cpp_in_system_header (pfile))
number = 0;
else
number = 1;
if (pfile->date == NULL)
/* Allocate __DATE__ and __TIME__ strings from permanent
storage. We only do this once, and don't generate them
at init time, because time() and localtime() are very
slow on some systems. */
time_t tt;
struct tm *tb = NULL;
/* (time_t) -1 is a legitimate value for "number of seconds
since the Epoch", so we have to do a little dance to
distinguish that from a genuine error. */
errno = 0;
tt = time(NULL);
if (tt != (time_t)-1 || errno == 0)
tb = localtime (&tt);
if (tb)
{
pfile->date = _cpp_unaligned_alloc (pfile,
sizeof ("\"Oct 11 1347\""));
sprintf ((char *) pfile->date, "\"%s %2d %4d\"",
monthnames[tb->tm_mon], tb->tm_mday,
tb->tm_year + 1900);
pfile->time = _cpp_unaligned_alloc (pfile,
sizeof ("\"12:34:56\""));
sprintf ((char *) pfile->time, "\"%02d:%02d:%02d\"",
tb->tm_hour, tb->tm_min, tb->tm_sec);
}
else
{
John David Anglin
committed
cpp_errno (pfile, CPP_DL_WARNING,
"could not determine date and time");
pfile->date = UC"\"??? ?? ????\"";
pfile->time = UC"\"??:??:??\"";
result = pfile->date;
result = pfile->time;
if (CPP_OPTION (pfile, directives_only) && pfile->state.in_directive)
cpp_error (pfile, CPP_DL_ERROR,
"__COUNTER__ expanded inside directive with -fdirectives-only");
number = pfile->counter++;
break;
}
if (result == NULL)
{
/* 21 bytes holds all NUL-terminated unsigned 64-bit numbers. */
result = _cpp_unaligned_alloc (pfile, 21);
sprintf ((char *) result, "%u", number);
}
return result;
}
/* Convert builtin macros like __FILE__ to a token and push it on the
context stack. Also handles _Pragma, for which a new token may not
be created. Returns 1 if it generates a new token context, 0 to
return the token to the caller. */
static int
builtin_macro (cpp_reader *pfile, cpp_hashnode *node)
{
const uchar *buf;
size_t len;
char *nbuf;
if (node->value.builtin == BT_PRAGMA)
{
/* Don't interpret _Pragma within directives. The standard is
not clear on this, but to me this makes most sense. */
if (pfile->state.in_directive)
return 0;
return _cpp_do__Pragma (pfile);
buf = _cpp_builtin_macro_text (pfile, node);
nbuf = (char *) alloca (len + 1);
memcpy (nbuf, buf, len);
nbuf[len]='\n';
Per Bothner
committed
cpp_push_buffer (pfile, (uchar *) nbuf, len, /* from_stage3 */ true);
_cpp_clean_line (pfile);
/* Set pfile->cur_token as required by _cpp_lex_direct. */
pfile->cur_token = _cpp_temp_token (pfile);
_cpp_push_token_context (pfile, NULL, _cpp_lex_direct (pfile), 1);
if (pfile->buffer->cur != pfile->buffer->rlimit)
John David Anglin
committed
cpp_error (pfile, CPP_DL_ICE, "invalid built-in macro \"%s\"",
NODE_NAME (node));
_cpp_pop_buffer (pfile);
/* Copies SRC, of length LEN, to DEST, adding backslashes before all
backslashes and double quotes. DEST must be of sufficient size.
Returns a pointer to the end of the string. */
cpp_quote_string (uchar *dest, const uchar *src, unsigned int len)
if (c == '\\' || c == '"')
{
*dest++ = '\\';
*dest++ = c;
}
else
/* Convert a token sequence ARG to a single string token according to
the rules of the ISO C #-operator. */
stringify_arg (cpp_reader *pfile, macro_arg *arg)
unsigned int i, escape_it, backslash_count = 0;
if (BUFF_ROOM (pfile->u_buff) < 3)
_cpp_extend_buff (pfile, &pfile->u_buff, 3);
dest = BUFF_FRONT (pfile->u_buff);
*dest++ = '"';
/* Loop, reading in the argument's tokens. */
for (i = 0; i < arg->count; i++)
{
const cpp_token *token = arg->first[i];
if (token->type == CPP_PADDING)
{
if (source == NULL
|| (!(source->flags & PREV_WHITE)
&& token->val.source == NULL))
source = token->val.source;
continue;
}
escape_it = (token->type == CPP_STRING || token->type == CPP_CHAR
|| token->type == CPP_WSTRING || token->type == CPP_WCHAR
|| token->type == CPP_STRING32 || token->type == CPP_CHAR32
|| token->type == CPP_STRING16 || token->type == CPP_CHAR16
|| token->type == CPP_UTF8STRING);
/* Room for each char being written in octal, initial space and
if ((size_t) (BUFF_LIMIT (pfile->u_buff) - dest) < len)
size_t len_so_far = dest - BUFF_FRONT (pfile->u_buff);
_cpp_extend_buff (pfile, &pfile->u_buff, len);
dest = BUFF_FRONT (pfile->u_buff) + len_so_far;
if (dest - 1 != BUFF_FRONT (pfile->u_buff))
{
if (source == NULL)
source = token;
if (source->flags & PREV_WHITE)
*dest++ = ' ';
}
source = NULL;
_cpp_buff *buff = _cpp_get_buff (pfile, len);
unsigned char *buf = BUFF_FRONT (buff);
len = cpp_spell_token (pfile, token, buf, true) - buf;
dest = cpp_quote_string (dest, buf, len);
_cpp_release_buff (pfile, buff);
dest = cpp_spell_token (pfile, token, dest, true);
if (token->type == CPP_OTHER && token->val.str.text[0] == '\\')
backslash_count++;
else
backslash_count = 0;
}
/* Ignore the final \ of invalid string literals. */
if (backslash_count & 1)
{
John David Anglin
committed
cpp_error (pfile, CPP_DL_WARNING,
"invalid string literal, ignoring final '\\'");
/* Commit the memory, including NUL, and return the token. */
len = dest - BUFF_FRONT (pfile->u_buff);
BUFF_FRONT (pfile->u_buff) = dest + 1;
return new_string_token (pfile, dest - len, len);
/* Try to paste two tokens. On success, return nonzero. In any
case, PLHS is updated to point to the pasted token, which is
guaranteed to not have the PASTE_LEFT flag set. */
static bool
paste_tokens (cpp_reader *pfile, const cpp_token **plhs, const cpp_token *rhs)
unsigned char *buf, *end, *lhsend;
cpp_token *lhs;
len = cpp_token_len (*plhs) + cpp_token_len (rhs) + 1;
buf = (unsigned char *) alloca (len);
end = lhsend = cpp_spell_token (pfile, *plhs, buf, false);
/* Avoid comment headers, since they are still processed in stage 3.
It is simpler to insert a space here, rather than modifying the
lexer to ignore comments in some circumstances. Simply returning
false doesn't work, since we want to clear the PASTE_LEFT flag. */
if ((*plhs)->type == CPP_DIV && rhs->type != CPP_EQ)
Tom Tromey
committed
/* In one obscure case we might see padding here. */
if (rhs->type != CPP_PADDING)
end = cpp_spell_token (pfile, rhs, end, false);
Per Bothner
committed
cpp_push_buffer (pfile, buf, end - buf, /* from_stage3 */ true);
_cpp_clean_line (pfile);
/* Set pfile->cur_token as required by _cpp_lex_direct. */
pfile->cur_token = _cpp_temp_token (pfile);
lhs = _cpp_lex_direct (pfile);
if (pfile->buffer->cur != pfile->buffer->rlimit)
{
source_location saved_loc = lhs->src_loc;
_cpp_pop_buffer (pfile);
_cpp_backup_tokens (pfile, 1);
*lhsend = '\0';
/* We have to remove the PASTE_LEFT flag from the old lhs, but
we want to keep the new location. */
*lhs = **plhs;
*plhs = lhs;
lhs->src_loc = saved_loc;
lhs->flags &= ~PASTE_LEFT;
/* Mandatory error for all apart from assembler. */
if (CPP_OPTION (pfile, lang) != CLK_ASM)
cpp_error (pfile, CPP_DL_ERROR,
"pasting \"%s\" and \"%s\" does not give a valid preprocessing token",
buf, cpp_token_as_text (pfile, rhs));
return false;
}
*plhs = lhs;
_cpp_pop_buffer (pfile);
return true;
/* Handles an arbitrarily long sequence of ## operators, with initial
operand LHS. This implementation is left-associative,
non-recursive, and finishes a paste before handling succeeding
ones. If a paste fails, we back up to the RHS of the failing ##
operator before pushing the context containing the result of prior
successful pastes, with the effect that the RHS appears in the
output stream after the pasted LHS normally. */
paste_all_tokens (cpp_reader *pfile, const cpp_token *lhs)
source_location virt_loc = 0;
/* We must have been called on a token that appears at the left
hand side of a ## operator. */
if (!(lhs->flags & PASTE_LEFT))
abort ();
if (context->tokens_kind == TOKENS_KIND_EXTENDED)
/* The caller must have called consume_next_token_from_context
right before calling us. That has incremented the pointer to
the current virtual location. So it now points to the location
of the token that comes right after *LHS. We want the
resulting pasted token to have the location of the current
*LHS, though. */
virt_loc = context->c.mc->cur_virt_loc[-1];
do
{
/* Take the token directly from the current context. We can do
this, because we are in the replacement list of either an
object-like macro, or a function-like macro with arguments
inserted. In either case, the constraints to #define
guarantee we have at least one more token. */
if (context->tokens_kind == TOKENS_KIND_DIRECT)
else if (context->tokens_kind == TOKENS_KIND_INDIRECT)
else if (context->tokens_kind == TOKENS_KIND_EXTENDED)
{
/* So we are in presence of an extended token context, which
means that each token in this context has a virtual
location attached to it. So let's not forget to update
the pointer to the current virtual location of the
current token when we update the pointer to the current
token */
rhs = *FIRST (context).ptoken++;
/* context->c.mc must be non-null, as if we were not in a
macro context, context->tokens_kind could not be equal to
TOKENS_KIND_EXTENDED. */
context->c.mc->cur_virt_loc++;
}
Tom Tromey
committed
{
if (rhs->flags & PASTE_LEFT)
abort ();
}
/* Put the resulting token in its own context. */
if (context->tokens_kind == TOKENS_KIND_EXTENDED)
{
source_location *virt_locs = NULL;
_cpp_buff *token_buf = tokens_buff_new (pfile, 1, &virt_locs);
tokens_buff_add_token (token_buf, virt_locs, lhs,
virt_loc, 0, NULL, 0);
push_extended_tokens_context (pfile, context->c.mc->macro_node,
token_buf, virt_locs,
(const cpp_token **)token_buf->base, 1);
}
else
_cpp_push_token_context (pfile, NULL, lhs, 1);
/* Returns TRUE if the number of arguments ARGC supplied in an
invocation of the MACRO referenced by NODE is valid. An empty
invocation to a macro with no parameters should pass ARGC as zero.
Note that MACRO cannot necessarily be deduced from NODE, in case
NODE was redefined whilst collecting arguments. */
bool
_cpp_arguments_ok (cpp_reader *pfile, cpp_macro *macro, const cpp_hashnode *node, unsigned int argc)
{
if (argc == macro->paramc)
return true;
if (argc < macro->paramc)
{
/* As an extension, a rest argument is allowed to not appear in
the invocation at all.
e.g. #define debug(format, args...) something
debug("string");
This is exactly the same as if there had been an empty rest
argument - debug("string", ). */
if (argc + 1 == macro->paramc && macro->variadic)
{
if (CPP_PEDANTIC (pfile) && ! macro->syshdr)
John David Anglin
committed
cpp_error (pfile, CPP_DL_PEDWARN,
"ISO C99 requires rest arguments to be used");
return true;
}
John David Anglin
committed
cpp_error (pfile, CPP_DL_ERROR,
"macro \"%s\" requires %u arguments, but only %u given",
NODE_NAME (node), macro->paramc, argc);
}
else
John David Anglin
committed
cpp_error (pfile, CPP_DL_ERROR,
"macro \"%s\" passed %u arguments, but takes just %u",
NODE_NAME (node), argc, macro->paramc);
return false;
}
/* Reads and returns the arguments to a function-like macro
invocation. Assumes the opening parenthesis has been processed.
If there is an error, emits an appropriate diagnostic and returns
NULL. Each argument is terminated by a CPP_EOF token, for the
future benefit of expand_arg(). If there are any deferred
#pragma directives among macro arguments, store pointers to the
CPP_PRAGMA ... CPP_PRAGMA_EOL tokens into *PRAGMA_BUFF buffer.
What is returned is the buffer that contains the memory allocated
to hold the macro arguments. NODE is the name of the macro this
function is dealing with. If NUM_ARGS is non-NULL, *NUM_ARGS is
set to the actual number of macro arguments allocated in the
returned buffer. */
collect_args (cpp_reader *pfile, const cpp_hashnode *node,
_cpp_buff **pragma_buff, unsigned *num_args)
_cpp_buff *buff, *base_buff;
cpp_macro *macro;
macro_arg *args, *arg;
const cpp_token *token;
unsigned int argc;
source_location virt_loc;
bool track_macro_expansion_p = CPP_OPTION (pfile, track_macro_expansion);
unsigned num_args_alloced = 0;
macro = node->value.macro;
if (macro->paramc)
argc = macro->paramc;
else
argc = 1;
#define DEFAULT_NUM_TOKENS_PER_MACRO_ARG 50
#define ARG_TOKENS_EXTENT 1000
buff = _cpp_get_buff (pfile, argc * (DEFAULT_NUM_TOKENS_PER_MACRO_ARG
* sizeof (cpp_token *)
+ sizeof (macro_arg)));
base_buff = buff;
args = (macro_arg *) buff->base;
memset (args, 0, argc * sizeof (macro_arg));
buff->cur = (unsigned char *) &args[argc];
arg = args, argc = 0;
/* Collect the tokens making up each argument. We don't yet know
how many arguments have been supplied, whether too many or too
few. Hence the slightly bizarre usage of "argc" and "arg". */
do
unsigned int paren_depth = 0;
unsigned int ntokens = 0;
unsigned virt_locs_capacity = DEFAULT_NUM_TOKENS_PER_MACRO_ARG;
num_args_alloced++;
argc++;
arg->first = (const cpp_token **) buff->cur;
if (track_macro_expansion_p)
{
virt_locs_capacity = DEFAULT_NUM_TOKENS_PER_MACRO_ARG;
arg->virt_locs = XNEWVEC (source_location,
virt_locs_capacity);
}
for (;;)
{
/* Require space for 2 new tokens (including a CPP_EOF). */
if ((unsigned char *) &arg->first[ntokens + 2] > buff->limit)
buff = _cpp_append_extend_buff (pfile, buff,
ARG_TOKENS_EXTENT
* sizeof (cpp_token *));
arg->first = (const cpp_token **) buff->cur;
}
if (track_macro_expansion_p
&& (ntokens + 2 > virt_locs_capacity))
{
virt_locs_capacity += ARG_TOKENS_EXTENT;
arg->virt_locs = XRESIZEVEC (source_location,
arg->virt_locs,
virt_locs_capacity);
}
token = cpp_get_token_1 (pfile, &virt_loc);
if (token->type == CPP_PADDING)
{
/* Drop leading padding. */
if (ntokens == 0)
continue;
}
else if (token->type == CPP_OPEN_PAREN)
paren_depth++;
else if (token->type == CPP_CLOSE_PAREN)
{
if (paren_depth-- == 0)
break;
}
else if (token->type == CPP_COMMA)
{
/* A comma does not terminate an argument within
parentheses or as part of a variable argument. */
if (paren_depth == 0
&& ! (macro->variadic && argc == macro->paramc))
break;
}
else if (token->type == CPP_EOF
|| (token->type == CPP_HASH && token->flags & BOL))
break;
834
835
836
837
838
839
840
841
842
843
844
845
846
847
848
849
850
851
852
853
854
855
856
857
858
859
860
861
862
863
864
else if (token->type == CPP_PRAGMA)
{
cpp_token *newtok = _cpp_temp_token (pfile);
/* CPP_PRAGMA token lives in directive_result, which will
be overwritten on the next directive. */
*newtok = *token;
token = newtok;
do
{
if (*pragma_buff == NULL
|| BUFF_ROOM (*pragma_buff) < sizeof (cpp_token *))
{
_cpp_buff *next;
if (*pragma_buff == NULL)
*pragma_buff
= _cpp_get_buff (pfile, 32 * sizeof (cpp_token *));
else
{
next = *pragma_buff;
*pragma_buff
= _cpp_get_buff (pfile,
(BUFF_FRONT (*pragma_buff)
- (*pragma_buff)->base) * 2);
(*pragma_buff)->next = next;
}
}
*(const cpp_token **) BUFF_FRONT (*pragma_buff) = token;
BUFF_FRONT (*pragma_buff) += sizeof (cpp_token *);
if (token->type == CPP_PRAGMA_EOL)
break;
token = cpp_get_token_1 (pfile, &virt_loc);
}
while (token->type != CPP_EOF);
/* In deferred pragmas parsing_args and prevent_expansion
had been changed, reset it. */
pfile->state.parsing_args = 2;
pfile->state.prevent_expansion = 1;
if (token->type == CPP_EOF)
break;
else
continue;
}
set_arg_token (arg, token, virt_loc,
ntokens, MACRO_ARG_TOKEN_NORMAL,
CPP_OPTION (pfile, track_macro_expansion));
ntokens++;
/* Drop trailing padding. */
while (ntokens > 0 && arg->first[ntokens - 1]->type == CPP_PADDING)
ntokens--;
set_arg_token (arg, &pfile->eof, pfile->eof.src_loc,
ntokens, MACRO_ARG_TOKEN_NORMAL,
CPP_OPTION (pfile, track_macro_expansion));
/* Terminate the argument. Excess arguments loop back and
overwrite the final legitimate argument, before failing. */
if (argc <= macro->paramc)
{
buff->cur = (unsigned char *) &arg->first[ntokens + 1];
if (argc != macro->paramc)
arg++;
}
while (token->type != CPP_CLOSE_PAREN && token->type != CPP_EOF);
if (token->type == CPP_EOF)
/* We still need the CPP_EOF to end directives, and to end
pre-expansion of a macro argument. Step back is not
unconditional, since we don't want to return a CPP_EOF to our
callers at the end of an -include-d file. */
if (pfile->context->prev || pfile->state.in_directive)
John David Anglin
committed
cpp_error (pfile, CPP_DL_ERROR,
"unterminated argument list invoking macro \"%s\"",
/* A single empty argument is counted as no argument. */
if (argc == 1 && macro->paramc == 0 && args[0].count == 0)
argc = 0;
if (_cpp_arguments_ok (pfile, macro, node, argc))
{
/* GCC has special semantics for , ## b where b is a varargs
parameter: we remove the comma if b was omitted entirely.
If b was merely an empty argument, the comma is retained.
If the macro takes just one (varargs) parameter, then we
retain the comma only if we are standards conforming.
If FIRST is NULL replace_args () swallows the comma. */
if (macro->variadic && (argc < macro->paramc
|| (argc == 1 && args[0].count == 0
&& !CPP_OPTION (pfile, std))))
args[macro->paramc - 1].first = NULL;
if (num_args)
*num_args = num_args_alloced;
return base_buff;
}
_cpp_release_buff (pfile, base_buff);
return NULL;
Neil Booth
committed
/* Search for an opening parenthesis to the macro of NODE, in such a
way that, if none is found, we don't lose the information in any
intervening padding tokens. If we find the parenthesis, collect
the arguments and return the buffer containing them. PRAGMA_BUFF
argument is the same as in collect_args. If NUM_ARGS is non-NULL,
*NUM_ARGS is set to the number of arguments contained in the
returned buffer. */
Neil Booth
committed
static _cpp_buff *
funlike_invocation_p (cpp_reader *pfile, cpp_hashnode *node,
_cpp_buff **pragma_buff, unsigned *num_args)
Neil Booth
committed
const cpp_token *token, *padding = NULL;
Neil Booth
committed
for (;;)
Neil Booth
committed
token = cpp_get_token (pfile);
if (token->type != CPP_PADDING)
break;
if (padding == NULL
|| (!(padding->flags & PREV_WHITE) && token->val.source == NULL))
padding = token;
Neil Booth
committed
if (token->type == CPP_OPEN_PAREN)
Neil Booth
committed
pfile->state.parsing_args = 2;
return collect_args (pfile, node, pragma_buff, num_args);
/* CPP_EOF can be the end of macro arguments, or the end of the
file. We mustn't back up over the latter. Ugh. */
if (token->type != CPP_EOF || token == &pfile->eof)
{
/* Back up. We may have skipped padding, in which case backing
up more than one token when expanding macros is in general
too difficult. We re-insert it in its own context. */
_cpp_backup_tokens (pfile, 1);
if (padding)
_cpp_push_token_context (pfile, NULL, padding, 1);
Neil Booth
committed
return NULL;
Joseph Myers
committed
/* Return the real number of tokens in the expansion of MACRO. */
static inline unsigned int
macro_real_token_count (const cpp_macro *macro)
{
unsigned int i;
if (__builtin_expect (!macro->extra_tokens, true))
return macro->count;
for (i = 0; i < macro->count; i++)
if (macro->exp.tokens[i].type == CPP_PASTE)
return i;
abort ();