Skip to content
Snippets Groups Projects
cppmacro.c 43.8 KiB
Newer Older
Neil Booth's avatar
Neil Booth committed
/* Part of CPP library.  (Macro and #define handling.)
Zack Weinberg's avatar
Zack Weinberg committed
   Copyright (C) 1986, 1987, 1989, 1992, 1993, 1994, 1995, 1996, 1998,
   1999, 2000, 2001 Free Software Foundation, Inc.
Zack Weinberg's avatar
Zack Weinberg committed
   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 2, 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; if not, write to the Free Software
Foundation, 59 Temple Place - Suite 330, Boston, MA 02111-1307, USA.

 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"
Neil Booth's avatar
Neil Booth committed
#include "intl.h"		/* for _("<command line>") below.  */
Zack Weinberg's avatar
Zack Weinberg committed
#include "cpplib.h"
#include "cpphash.h"

Neil Booth's avatar
Neil Booth committed
struct cpp_macro
Zack Weinberg's avatar
Zack Weinberg committed
{
Neil Booth's avatar
Neil Booth committed
  cpp_hashnode **params;	/* Parameters, if any.  */
Kazu Hirata's avatar
Kazu Hirata committed
  cpp_token *expansion;		/* First token of replacement list.  */
Neil Booth's avatar
Neil Booth committed
  unsigned int line;		/* Starting line number.  */
  unsigned int count;		/* Number of tokens in expansion.  */
  unsigned short paramc;	/* Number of parameters.  */
  unsigned int fun_like : 1;	/* If a function-like macro.  */
  unsigned int variadic : 1;	/* If a variadic macro.  */
  unsigned int syshdr   : 1;	/* If macro defined in system header.  */
Neil Booth's avatar
Neil Booth committed
};

typedef struct macro_arg macro_arg;
struct macro_arg
{
  const cpp_token **first;	/* First token in unexpanded argument.  */
Kazu Hirata's avatar
Kazu Hirata committed
  const cpp_token **expanded;	/* Macro-expanded argument.  */
  const cpp_token *stringified;	/* Stringified argument.  */
Neil Booth's avatar
Neil Booth committed
  unsigned int count;		/* # of tokens in argument.  */
  unsigned int expanded_count;	/* # of tokens in expanded argument.  */
Zack Weinberg's avatar
Zack Weinberg committed
};

Neil Booth's avatar
Neil Booth committed
/* Macro expansion.  */

static int enter_macro_context PARAMS ((cpp_reader *, cpp_hashnode *));
Neil Booth's avatar
Neil Booth committed
static int builtin_macro PARAMS ((cpp_reader *, cpp_hashnode *));
static void push_token_context
Neil Booth's avatar
Neil Booth committed
  PARAMS ((cpp_reader *, cpp_hashnode *, const cpp_token *, unsigned int));
static void push_ptoken_context
Neil Booth's avatar
Neil Booth committed
  PARAMS ((cpp_reader *, cpp_hashnode *, _cpp_buff *,
	   const cpp_token **, unsigned int));
static _cpp_buff *collect_args PARAMS ((cpp_reader *, const cpp_hashnode *));
Neil Booth's avatar
Neil Booth committed
static cpp_context *next_context PARAMS ((cpp_reader *));
static const cpp_token *padding_token
  PARAMS ((cpp_reader *, const cpp_token *));
Neil Booth's avatar
Neil Booth committed
static void expand_arg PARAMS ((cpp_reader *, macro_arg *));
static unsigned char *quote_string PARAMS ((unsigned char *,
					    const unsigned char *,
					    unsigned int));
static const cpp_token *new_string_token PARAMS ((cpp_reader *, U_CHAR *,
						  unsigned int));
static const cpp_token *new_number_token PARAMS ((cpp_reader *, int));
static const cpp_token *stringify_arg PARAMS ((cpp_reader *, macro_arg *));
static void paste_all_tokens PARAMS ((cpp_reader *, const cpp_token *));
Neil Booth's avatar
Neil Booth committed
static bool paste_tokens PARAMS ((cpp_reader *, const cpp_token **,
				  const cpp_token *));
Neil Booth's avatar
Neil Booth committed
static void replace_args PARAMS ((cpp_reader *, cpp_hashnode *, macro_arg *));
static _cpp_buff *funlike_invocation_p PARAMS ((cpp_reader *, cpp_hashnode *));
Neil Booth's avatar
Neil Booth committed

/* #define directive parsing and handling.  */

static cpp_token *alloc_expansion_token PARAMS ((cpp_reader *, cpp_macro *));
Neil Booth's avatar
Neil Booth committed
static cpp_token *lex_expansion_token PARAMS ((cpp_reader *, cpp_macro *));
static int warn_of_redefinition PARAMS ((const cpp_hashnode *,
					 const cpp_macro *));
Neil Booth's avatar
Neil Booth committed
static int save_parameter PARAMS ((cpp_reader *, cpp_macro *, cpp_hashnode *));
static int parse_params PARAMS ((cpp_reader *, cpp_macro *));
static void check_trad_stringification PARAMS ((cpp_reader *,
Neil Booth's avatar
Neil Booth committed
						const cpp_macro *,
Zack Weinberg's avatar
Zack Weinberg committed

/* 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 (pfile, text, len)
     cpp_reader *pfile;
     unsigned char *text;
Neil Booth's avatar
Neil Booth committed
     unsigned int len;
{
  cpp_token *token = _cpp_temp_token (pfile);
Neil Booth's avatar
Neil Booth committed

  text[len] = '\0';
Neil Booth's avatar
Neil Booth committed
  token->type = CPP_STRING;
  token->val.str.len = len;
  token->val.str.text = text;
Neil Booth's avatar
Neil Booth committed
  token->flags = 0;
  return token;
/* Allocates and returns a CPP_NUMBER token evaluating to NUMBER.  */
static const cpp_token *
new_number_token (pfile, number)
Neil Booth's avatar
Neil Booth committed
     cpp_reader *pfile;
     int number;
{
  cpp_token *token = _cpp_temp_token (pfile);
  unsigned char *buf = _cpp_unaligned_alloc (pfile, 20);
Neil Booth's avatar
Neil Booth committed

  sprintf ((char *) buf, "%d", number);
  token->type = CPP_NUMBER;
  token->val.str.text = buf;
  token->val.str.len = ustrlen (buf);
  token->flags = 0;
  return token;
Neil Booth's avatar
Neil Booth committed
}

static const char * const monthnames[] =
{
  "Jan", "Feb", "Mar", "Apr", "May", "Jun",
  "Jul", "Aug", "Sep", "Oct", "Nov", "Dec"
};

Neil Booth's avatar
Neil Booth committed
/* Handle builtin macros like __FILE__, and push the resulting token
   on the context stack.  Also handles _Pragma, for which no new token
   is created.  Returns 1 on success, 0 to return the token to the
   caller.  */
static int
builtin_macro (pfile, node)
Neil Booth's avatar
Neil Booth committed
     cpp_reader *pfile;
     cpp_hashnode *node;
Neil Booth's avatar
Neil Booth committed
{
Neil Booth's avatar
Neil Booth committed
  const cpp_token *result;

Neil Booth's avatar
Neil Booth committed
  switch (node->value.builtin)
    {
    default:
      cpp_ice (pfile, "invalid built-in macro \"%s\"", NODE_NAME (node));
Neil Booth's avatar
Neil Booth committed
      return 0;
Neil Booth's avatar
Neil Booth committed
    case BT_FILE:
    case BT_BASE_FILE:
Zack Weinberg's avatar
Zack Weinberg committed
      {
	unsigned int len;
	const char *name;
	U_CHAR *buf;
	const struct line_map *map = pfile->map;

	if (node->value.builtin == BT_BASE_FILE)
	  while (! MAIN_FILE_P (map))
	    map = INCLUDED_FROM (&pfile->line_maps, map);
	len = strlen (name);
	buf = _cpp_unaligned_alloc (pfile, len * 4 + 1);
	len = quote_string (buf, (const unsigned char *) name, len) - buf;

Neil Booth's avatar
Neil Booth committed
	result = new_string_token (pfile, buf, len);
Zack Weinberg's avatar
Zack Weinberg committed
      }
Neil Booth's avatar
Neil Booth committed
    case BT_INCLUDE_LEVEL:
      /* The line map depth counts the primary source as level 1, but
	 historically __INCLUDE_DEPTH__ has called the primary source
	 level 0.  */
Neil Booth's avatar
Neil Booth committed
      result = new_number_token (pfile, pfile->line_maps.depth - 1);
      break;
Neil Booth's avatar
Neil Booth committed

    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.  */
Neil Booth's avatar
Neil Booth committed
      result = new_number_token (pfile,
				 SOURCE_LINE (pfile->map,
					      pfile->cur_token[-1].line));
      break;
Neil Booth's avatar
Neil Booth committed

    case BT_STDC:
      {
	int stdc = (!CPP_IN_SYSTEM_HEADER (pfile)
		    || pfile->spec_nodes.n__STRICT_ANSI__->type != NT_VOID);
Neil Booth's avatar
Neil Booth committed
	result = new_number_token (pfile, stdc);
Neil Booth's avatar
Neil Booth committed
      }
Neil Booth's avatar
Neil Booth committed
      break;
Zack Weinberg's avatar
Zack Weinberg committed

Neil Booth's avatar
Neil Booth committed
    case BT_DATE:
    case BT_TIME:
      if (pfile->date.type == CPP_EOF)
	{
	  /* 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.  */
Neil Booth's avatar
Neil Booth committed
	  time_t tt = time (NULL);
	  struct tm *tb = localtime (&tt);

	  pfile->date.val.str.text =
	    _cpp_unaligned_alloc (pfile, sizeof ("Oct 11 1347"));
	  pfile->date.val.str.len = sizeof ("Oct 11 1347") - 1;
	  pfile->date.type = CPP_STRING;
	  pfile->date.flags = 0;
Neil Booth's avatar
Neil Booth committed
	  sprintf ((char *) pfile->date.val.str.text, "%s %2d %4d",
		   monthnames[tb->tm_mon], tb->tm_mday, tb->tm_year + 1900);

	  pfile->time.val.str.text =
	    _cpp_unaligned_alloc (pfile, sizeof ("12:34:56"));
	  pfile->time.val.str.len = sizeof ("12:34:56") - 1;
	  pfile->time.type = CPP_STRING;
	  pfile->time.flags = 0;
Neil Booth's avatar
Neil Booth committed
	  sprintf ((char *) pfile->time.val.str.text, "%02d:%02d:%02d",
		   tb->tm_hour, tb->tm_min, tb->tm_sec);
	}

Neil Booth's avatar
Neil Booth committed
      if (node->value.builtin == BT_DATE)
	result = &pfile->date;
      else
	result = &pfile->time;
      break;

    case 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;

      _cpp_do__Pragma (pfile);
      return 1;
Neil Booth's avatar
Neil Booth committed
    }
Neil Booth's avatar
Neil Booth committed

  push_token_context (pfile, NULL, result, 1);
  return 1;
Neil Booth's avatar
Neil Booth committed
/* Adds backslashes before all backslashes and double quotes appearing
   in strings.  Non-printable characters are converted to octal.  */
static U_CHAR *
quote_string (dest, src, len)
     U_CHAR *dest;
     const U_CHAR *src;
     unsigned int len;
{
  while (len--)
    {
      U_CHAR c = *src++;
Zack Weinberg's avatar
Zack Weinberg committed

Neil Booth's avatar
Neil Booth committed
      if (c == '\\' || c == '"')
	{
	  *dest++ = '\\';
	  *dest++ = c;
	}
      else
	{
	  if (ISPRINT (c))
	    *dest++ = c;
	  else
Zack Weinberg's avatar
Zack Weinberg committed
	    {
Neil Booth's avatar
Neil Booth committed
	      sprintf ((char *) dest, "\\%03o", c);
	      dest += 4;
Zack Weinberg's avatar
Zack Weinberg committed
	    }
Neil Booth's avatar
Neil Booth committed
	}
    }
Zack Weinberg's avatar
Zack Weinberg committed

Neil Booth's avatar
Neil Booth committed
  return dest;
}
Zack Weinberg's avatar
Zack Weinberg committed

Neil Booth's avatar
Neil Booth committed
/* Convert a token sequence to a single string token according to the
   rules of the ISO C #-operator.  */
static const cpp_token *
Neil Booth's avatar
Neil Booth committed
stringify_arg (pfile, arg)
     cpp_reader *pfile;
     macro_arg *arg;
{
  unsigned char *dest = BUFF_FRONT (pfile->u_buff);
  unsigned int i, escape_it, backslash_count = 0;
  const cpp_token *source = NULL;
Zack Weinberg's avatar
Zack Weinberg committed

Neil Booth's avatar
Neil Booth committed
  /* 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 = token->val.source;
	  continue;
	}
Zack Weinberg's avatar
Zack Weinberg committed

Neil Booth's avatar
Neil Booth committed
      escape_it = (token->type == CPP_STRING || token->type == CPP_WSTRING
		   || token->type == CPP_CHAR || token->type == CPP_WCHAR);
Zack Weinberg's avatar
Zack Weinberg committed

      /* Room for each char being written in octal, initial space and
	 final NUL.  */
      len = cpp_token_len (token);
Neil Booth's avatar
Neil Booth committed
      if (escape_it)
	len *= 4;
Zack Weinberg's avatar
Zack Weinberg committed

      if ((size_t) (BUFF_LIMIT (pfile->u_buff) - dest) < len)
Neil Booth's avatar
Neil Booth committed
	{
	  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;
Neil Booth's avatar
Neil Booth committed
	}
Zack Weinberg's avatar
Zack Weinberg committed

      /* Leading white space?  */
      if (dest != BUFF_FRONT (pfile->u_buff))
	{
	  if (source == NULL)
	    source = token;
	  if (source->flags & PREV_WHITE)
	    *dest++ = ' ';
	}
      source = NULL;
Zack Weinberg's avatar
Zack Weinberg committed

Neil Booth's avatar
Neil Booth committed
      if (escape_it)
	{
	  _cpp_buff *buff = _cpp_get_buff (pfile, len);
	  unsigned char *buf = BUFF_FRONT (buff);
Neil Booth's avatar
Neil Booth committed
	  len = cpp_spell_token (pfile, token, buf) - buf;
	  dest = quote_string (dest, buf, len);
	  _cpp_release_buff (pfile, buff);
Neil Booth's avatar
Neil Booth committed
	}
      else
	dest = cpp_spell_token (pfile, token, dest);

      if (token->type == CPP_OTHER && token->val.c == '\\')
Neil Booth's avatar
Neil Booth committed
	backslash_count++;
      else
	backslash_count = 0;
    }

  /* Ignore the final \ of invalid string literals.  */
  if (backslash_count & 1)
    {
      cpp_warning (pfile, "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);
Neil Booth's avatar
Neil Booth committed
/* Try to paste two tokens.  On success, return non-zero.  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 (pfile, plhs, rhs)
Neil Booth's avatar
Neil Booth committed
     const cpp_token **plhs, *rhs;
Neil Booth's avatar
Neil Booth committed
  unsigned char *buf, *end;
  const cpp_token *lhs;
  unsigned int len;
  bool valid;

  lhs = *plhs;
  len = cpp_token_len (lhs) + cpp_token_len (rhs) + 1;
  buf = (unsigned char *) alloca (len);
  end = cpp_spell_token (pfile, lhs, buf);

  /* 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 (lhs->type == CPP_DIV
      && (rhs->type == CPP_MULT || rhs->type == CPP_DIV))
    *end++ = ' ';
  end = cpp_spell_token (pfile, rhs, end);
Neil Booth's avatar
Neil Booth committed

  cpp_push_buffer (pfile, buf, end - buf, /* from_stage3 */ true, 1);

  /* Tweak the column number the lexer will report.  */
  pfile->buffer->col_adjust = pfile->cur_token[-1].col - 1;

  /* We don't want a leading # to be interpreted as a directive.  */
  pfile->buffer->saved_flags = 0;

  /* Set pfile->cur_token as required by _cpp_lex_direct.  */
  pfile->cur_token = _cpp_temp_token (pfile);
  *plhs = _cpp_lex_direct (pfile);
  valid = pfile->buffer->cur == pfile->buffer->rlimit;
Neil Booth's avatar
Neil Booth committed
  _cpp_pop_buffer (pfile);

  return valid;
Neil Booth's avatar
Neil Booth committed
/* Handles an arbitrarily long sequence of ## operators.  This
   implementation is left-associative, non-recursive, and finishes a
   paste before handling succeeding ones.  If the paste fails, we back
   up a token to just after the ## operator, with the effect that it
   appears in the output stream normally.  */
Neil Booth's avatar
Neil Booth committed
static void
paste_all_tokens (pfile, lhs)
     cpp_reader *pfile;
     const cpp_token *lhs;
Neil Booth's avatar
Neil Booth committed
{
  const cpp_token *rhs;
  cpp_context *context = pfile->context;

Neil Booth's avatar
Neil Booth committed
  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->direct_p)
	rhs = context->first.token++;
      else
	rhs = *context->first.ptoken++;

      if (rhs->type == CPP_PADDING)
	abort ();

Neil Booth's avatar
Neil Booth committed
      if (!paste_tokens (pfile, &lhs, rhs))
Neil Booth's avatar
Neil Booth committed
	{
	  _cpp_backup_tokens (pfile, 1);
Neil Booth's avatar
Neil Booth committed

	  /* Mandatory warning for all apart from assembler.  */
	  if (CPP_OPTION (pfile, lang) != CLK_ASM)
	    cpp_warning (pfile,
	 "pasting \"%s\" and \"%s\" does not give a valid preprocessing token",
			 cpp_token_as_text (pfile, lhs),
			 cpp_token_as_text (pfile, rhs));
Neil Booth's avatar
Neil Booth committed
	  break;
Neil Booth's avatar
Neil Booth committed
	}
    }
  while (rhs->flags & PASTE_LEFT);

Neil Booth's avatar
Neil Booth committed
  /* Put the resulting token in its own context.  */
  push_token_context (pfile, NULL, lhs, 1);
/* 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.  */
static _cpp_buff *
collect_args (pfile, node)
Neil Booth's avatar
Neil Booth committed
     cpp_reader *pfile;
     const cpp_hashnode *node;
Neil Booth's avatar
Neil Booth committed
{
  _cpp_buff *buff, *base_buff;
  cpp_macro *macro;
  macro_arg *args, *arg;
  const cpp_token *token;
  unsigned int argc;
  bool error = false;

  macro = node->value.macro;
  if (macro->paramc)
    argc = macro->paramc;
  else
    argc = 1;
  buff = _cpp_get_buff (pfile, argc * (50 * 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
Neil Booth's avatar
Neil Booth committed
    {
      unsigned int paren_depth = 0;
      unsigned int ntokens = 0;
Neil Booth's avatar
Neil Booth committed

      argc++;
      arg->first = (const cpp_token **) buff->cur;
Zack Weinberg's avatar
Zack Weinberg committed

      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,
					      1000 * sizeof (cpp_token *));
	      arg->first = (const cpp_token **) buff->cur;
	    }
	  token = cpp_get_token (pfile);
Zack Weinberg's avatar
Zack Weinberg committed

	  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;
Neil Booth's avatar
Neil Booth committed

	  arg->first[ntokens++] = token;
	}
Neil Booth's avatar
Neil Booth committed

      /* Drop trailing padding.  */
      while (ntokens > 0 && arg->first[ntokens - 1]->type == CPP_PADDING)
	ntokens--;
Neil Booth's avatar
Neil Booth committed

      arg->count = ntokens;
      arg->first[ntokens] = &pfile->eof;
Neil Booth's avatar
Neil Booth committed

      /* 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++;
	}
Neil Booth's avatar
Neil Booth committed
    }
  while (token->type != CPP_CLOSE_PAREN
	 && token->type != CPP_EOF
	 && token->type != CPP_HASH);
Neil Booth's avatar
Neil Booth committed

  if (token->type == CPP_EOF || token->type == CPP_HASH)
Neil Booth's avatar
Neil Booth committed
    {
      bool step_back = false;

      /* 6.10.3 paragraph 11: If there are sequences of preprocessing
	 tokens within the list of arguments that would otherwise act
	 as preprocessing directives, the behavior is undefined.

	 This implementation will report a hard error, terminate the
	 macro invocation, and proceed to process the directive.  */
      if (token->type == CPP_HASH)
	{
	  cpp_error (pfile,
		     "directives may not be used inside a macro argument");
	  step_back = true;
	}
      else
	step_back = (pfile->context->prev || pfile->state.in_directive);

      /* 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 (step_back)
	_cpp_backup_tokens (pfile, 1);
Neil Booth's avatar
Neil Booth committed
      cpp_error (pfile, "unterminated argument list invoking macro \"%s\"",
		 NODE_NAME (node));
      error = true;
Neil Booth's avatar
Neil Booth committed
    }
  else 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)
Neil Booth's avatar
Neil Booth committed
	{
	  if (CPP_PEDANTIC (pfile) && ! macro->syshdr)
Neil Booth's avatar
Neil Booth committed
	    cpp_pedwarn (pfile, "ISO C99 requires rest arguments to be used");
	}
      else
	{
	  cpp_error (pfile,
		     "macro \"%s\" requires %u arguments, but only %u given",
		     NODE_NAME (node), macro->paramc, argc);
	  error = true;
Neil Booth's avatar
Neil Booth committed
	}
    }
  else if (argc > macro->paramc)
    {
Neil Booth's avatar
Neil Booth committed
      /* Empty argument to a macro taking no arguments is OK.  */
      if (argc != 1 || arg->count)
Neil Booth's avatar
Neil Booth committed
	{
	  cpp_error (pfile,
		     "macro \"%s\" passed %u arguments, but takes just %u",
		     NODE_NAME (node), argc, macro->paramc);
	  error = true;
  if (!error)
    return base_buff;
Neil Booth's avatar
Neil Booth committed

  _cpp_release_buff (pfile, base_buff);
  return NULL;
/* 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.  */
static _cpp_buff *
funlike_invocation_p (pfile, node)
Neil Booth's avatar
Neil Booth committed
     cpp_reader *pfile;
Neil Booth's avatar
Neil Booth committed
     cpp_hashnode *node;
Neil Booth's avatar
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's avatar
Neil Booth committed

Neil Booth's avatar
Neil Booth committed
    {
      pfile->state.parsing_args = 2;
      return collect_args (pfile, node);
  /* 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)
    push_token_context (pfile, NULL, padding, 1);

  return NULL;
Neil Booth's avatar
Neil Booth committed
}

/* Push the context of a macro onto the context stack.  TOKEN is the
   macro name.  If we can successfully start expanding the macro,
   TOKEN is replaced with the first token of the expansion, and we
   return non-zero.  */
Zack Weinberg's avatar
Zack Weinberg committed
static int
Zack Weinberg's avatar
Zack Weinberg committed
     cpp_reader *pfile;
Zack Weinberg's avatar
Zack Weinberg committed
{
Neil Booth's avatar
Neil Booth committed
  /* Macros invalidate controlling macros.  */
  pfile->mi_valid = false;

  /* Handle macros and the _Pragma operator.  */
  if (! (node->flags & NODE_BUILTIN))
Zack Weinberg's avatar
Zack Weinberg committed
    {
      cpp_macro *macro = node->value.macro;
      if (macro->fun_like)
	{
	  _cpp_buff *buff;

	  pfile->state.prevent_expansion++;
	  pfile->keep_tokens++;
	  pfile->state.parsing_args = 1;
	  buff = funlike_invocation_p (pfile, node);
	  pfile->state.parsing_args = 0;
	  pfile->keep_tokens--;
	  pfile->state.prevent_expansion--;

	  if (buff == NULL)
	    {
	      if (CPP_WTRADITIONAL (pfile) && ! node->value.macro->syshdr)
		cpp_warning (pfile,
 "function-like macro \"%s\" must be used with arguments in traditional C",
			     NODE_NAME (node));

	      return 0;
	    }

	  if (node->value.macro->paramc > 0)
	    replace_args (pfile, node, (macro_arg *) buff->base);
	  _cpp_release_buff (pfile, buff);
	}
Neil Booth's avatar
Neil Booth committed

      /* Disable the macro within its expansion.  */
Neil Booth's avatar
Neil Booth committed
      node->flags |= NODE_DISABLED;
Neil Booth's avatar
Neil Booth committed

      if (macro->paramc == 0)
Neil Booth's avatar
Neil Booth committed
	push_token_context (pfile, node, macro->expansion, macro->count);

      return 1;
Zack Weinberg's avatar
Zack Weinberg committed
    }
Neil Booth's avatar
Neil Booth committed

  return builtin_macro (pfile, node);
/* Take the expansion of a function-like MACRO, replacing parameters
   with the actual arguments.  Each argument is macro-expanded before
   replacement, unless operated upon by the # or ## operators.  */
Neil Booth's avatar
Neil Booth committed
static void
Neil Booth's avatar
Neil Booth committed
replace_args (pfile, node, args)
Neil Booth's avatar
Neil Booth committed
     cpp_reader *pfile;
Neil Booth's avatar
Neil Booth committed
     cpp_hashnode *node;
Neil Booth's avatar
Neil Booth committed
     macro_arg *args;
{
  unsigned int i, total;
  const cpp_token *src, *limit;
  const cpp_token **dest, **first;
Neil Booth's avatar
Neil Booth committed
  macro_arg *arg;
Neil Booth's avatar
Neil Booth committed
  cpp_macro *macro;
Neil Booth's avatar
Neil Booth committed

  /* First, fully macro-expand arguments, calculating the number of
     tokens in the final expansion as we go.  The ordering of the if
     statements below is subtle; we must handle stringification before
     pasting.  */
Neil Booth's avatar
Neil Booth committed
  macro = node->value.macro;
  total = macro->count;
  limit = macro->expansion + macro->count;

  for (src = macro->expansion; src < limit; src++)
Neil Booth's avatar
Neil Booth committed
    if (src->type == CPP_MACRO_ARG)
      {
	/* Leading and trailing padding tokens.  */
	total += 2;

Neil Booth's avatar
Neil Booth committed
	/* We have an argument.  If it is not being stringified or
	   pasted it is macro-replaced before insertion.  */
Neil Booth's avatar
Neil Booth committed
	if (src->flags & STRINGIFY_ARG)
	  {
	    if (!arg->stringified)
	      arg->stringified = stringify_arg (pfile, arg);
Neil Booth's avatar
Neil Booth committed
	  }
	else if ((src->flags & PASTE_LEFT)
		 || (src > macro->expansion && (src[-1].flags & PASTE_LEFT)))
	  total += arg->count - 1;
	else
	  {
	    if (!arg->expanded)
	      expand_arg (pfile, arg);
Neil Booth's avatar
Neil Booth committed
	    total += arg->expanded_count - 1;
	  }
      }

  /* Now allocate space for the expansion, copy the tokens and replace
     the arguments.  */
  buff = _cpp_get_buff (pfile, total * sizeof (cpp_token *));
  first = (const cpp_token **) buff->base;
  dest = first;
Neil Booth's avatar
Neil Booth committed

  for (src = macro->expansion; src < limit; src++)
    {
      unsigned int count;
      const cpp_token **from, **paste_flag;
Neil Booth's avatar
Neil Booth committed

      if (src->type != CPP_MACRO_ARG)
	{
	  *dest++ = src;
	  continue;
	}
Neil Booth's avatar
Neil Booth committed

      paste_flag = 0;
      arg = &args[src->val.arg_no - 1];
      if (src->flags & STRINGIFY_ARG)
	count = 1, from = &arg->stringified;
      else if (src->flags & PASTE_LEFT)
	count = arg->count, from = arg->first;
      else if (src != macro->expansion && (src[-1].flags & PASTE_LEFT))
	{
	  count = arg->count, from = arg->first;
	  if (dest != first)
	    {
	      /* GCC has special semantics for , ## b where b is a
		 varargs parameter: the comma disappears if b was
		 given no actual arguments (not merely if b is an
		 empty argument); otherwise the paste flag is removed.  */
	      if (dest[-1]->type == CPP_COMMA
		  && macro->variadic
		  && src->val.arg_no == macro->paramc)
		{
		  if (count == 0)
		    dest--;
		  else
		    paste_flag = dest - 1;
		}
	      /* Remove the paste flag if the RHS is a placemarker.  */
	      else if (count == 0)
		paste_flag = dest - 1;
	    }
	}
      else
	count = arg->expanded_count, from = arg->expanded;
      /* Padding on the left of an argument (unless RHS of ##).  */
      if (!pfile->state.in_directive
	  && src != macro->expansion && !(src[-1].flags & PASTE_LEFT))
	*dest++ = padding_token (pfile, src);
Neil Booth's avatar
Neil Booth committed

      if (count)
	{
	  memcpy (dest, from, count * sizeof (cpp_token *));
	  dest += count;
Neil Booth's avatar
Neil Booth committed

	  /* With a non-empty argument on the LHS of ##, the last
	     token should be flagged PASTE_LEFT.  */
	  if (src->flags & PASTE_LEFT)
	    paste_flag = dest - 1;
	}
      /* Avoid paste on RHS (even case count == 0).  */
      if (!pfile->state.in_directive && !(src->flags & PASTE_LEFT))
	*dest++ = &pfile->avoid_paste;
Neil Booth's avatar
Neil Booth committed

      /* Add a new paste flag, or remove an unwanted one.  */
      if (paste_flag)
	{
	  cpp_token *token = _cpp_temp_token (pfile);
	  token->type = (*paste_flag)->type;
	  token->val.str = (*paste_flag)->val.str;
	  if (src->flags & PASTE_LEFT)
	    token->flags = (*paste_flag)->flags | PASTE_LEFT;
	  else
	    token->flags = (*paste_flag)->flags & ~PASTE_LEFT;
	  *paste_flag = token;
	}
    }
Neil Booth's avatar
Neil Booth committed
  /* Free the expanded arguments.  */
  for (i = 0; i < macro->paramc; i++)
    if (args[i].expanded)
      free (args[i].expanded);

Neil Booth's avatar
Neil Booth committed
  push_ptoken_context (pfile, node, buff, first, dest - first);
}

/* Return a special padding token, with padding inherited from SOURCE.  */
static const cpp_token *
padding_token (pfile, source)
     cpp_reader *pfile;
     const cpp_token *source;
{
  cpp_token *result = _cpp_temp_token (pfile);

  result->type = CPP_PADDING;
  result->val.source = source;
  result->flags = 0;
  return result;
}

/* Move to the next context.  Create one if there is none.  */
static cpp_context *
next_context (pfile)
     cpp_reader *pfile;
{
  cpp_context *result = pfile->context->next;

  if (result == 0)
Zack Weinberg's avatar
Zack Weinberg committed
    {
      result = xnew (cpp_context);
      result->prev = pfile->context;
      result->next = 0;
      pfile->context->next = result;
Neil Booth's avatar
Neil Booth committed
    }

  pfile->context = result;
  return result;
/* Push a list of pointers to tokens.  */
static void
push_ptoken_context (pfile, macro, buff, first, count)
Neil Booth's avatar
Neil Booth committed
     cpp_reader *pfile;
Neil Booth's avatar
Neil Booth committed
     cpp_hashnode *macro;
     const cpp_token **first;
     unsigned int count;
Neil Booth's avatar
Neil Booth committed
{
  cpp_context *context = next_context (pfile);

  context->direct_p = false;
  context->macro = macro;
  context->buff = buff;
  context->first.ptoken = first;
  context->last.ptoken = first + count;
}

/* Push a list of tokens.  */
static void
push_token_context (pfile, macro, first, count)
     cpp_reader *pfile;
Neil Booth's avatar
Neil Booth committed
     cpp_hashnode *macro;
     const cpp_token *first;
     unsigned int count;
{
  cpp_context *context = next_context (pfile);

  context->direct_p = true;
  context->macro = macro;
  context->buff = NULL;
  context->first.token = first;
  context->last.token = first + count;
Neil Booth's avatar
Neil Booth committed
}

static void
expand_arg (pfile, arg)
     cpp_reader *pfile;
     macro_arg *arg;
{
  unsigned int capacity;

  if (arg->count == 0)
    return;
Neil Booth's avatar
Neil Booth committed

  /* Loop, reading in the arguments.  */
  capacity = 256;
  arg->expanded = (const cpp_token **)
    xmalloc (capacity * sizeof (cpp_token *));
Neil Booth's avatar
Neil Booth committed

  push_ptoken_context (pfile, NULL, NULL, arg->first, arg->count + 1);
  for (;;)
Neil Booth's avatar
Neil Booth committed
    {
      const cpp_token *token;

      if (arg->expanded_count + 1 >= capacity)
Zack Weinberg's avatar
Zack Weinberg committed
	{
Neil Booth's avatar
Neil Booth committed
	  capacity *= 2;
	  arg->expanded = (const cpp_token **)
	    xrealloc (arg->expanded, capacity * sizeof (cpp_token *));
      token = cpp_get_token (pfile);
Neil Booth's avatar
Neil Booth committed

      if (token->type == CPP_EOF)
	break;

      arg->expanded[arg->expanded_count++] = token;
    }

  _cpp_pop_context (pfile);
Neil Booth's avatar
Neil Booth committed
}

void
_cpp_pop_context (pfile)
     cpp_reader *pfile;
{
  cpp_context *context = pfile->context;

  /* Re-enable a macro when leaving its expansion.  */
Neil Booth's avatar
Neil Booth committed
    context->macro->flags &= ~NODE_DISABLED;

  if (context->buff)
    _cpp_release_buff (pfile, context->buff);
Neil Booth's avatar
Neil Booth committed

  pfile->context = context->prev;
/* Eternal routine to get a token.  Also used nearly everywhere
   internally, except for places where we know we can safely call
   the lexer directly, such as lexing a directive name.

   Macro expansions and directives are transparently handled,
   including entering included files.  Thus tokens are post-macro
   expansion, and after any intervening directives.  External callers
   see CPP_EOF only at EOF.  Internal callers also see it when meeting
   a directive inside a macro call, when at the end of a directive and
   state.in_directive is still 1, and at the end of argument
   pre-expansion.  */
const cpp_token *
cpp_get_token (pfile)
Neil Booth's avatar
Neil Booth committed
     cpp_reader *pfile;
{
  const cpp_token *result;

Neil Booth's avatar
Neil Booth committed
    {
      cpp_hashnode *node;
Neil Booth's avatar
Neil Booth committed
      cpp_context *context = pfile->context;

      /* Context->prev == 0 <=> base context.  */
      if (!context->prev)
	result = _cpp_lex_token (pfile);
      else if (context->first.token != context->last.token)