Skip to content
Snippets Groups Projects
cppmacro.c 48.7 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,
Neil Booth's avatar
Neil Booth committed
   1999, 2000, 2001, 2002, 2003 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"
#include "cpplib.h"
#include "cpphash.h"

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 (cpp_reader *, cpp_hashnode *);
static int builtin_macro (cpp_reader *, cpp_hashnode *);
static void push_token_context (cpp_reader *, cpp_hashnode *,
				const cpp_token *, unsigned int);
static void push_ptoken_context (cpp_reader *, cpp_hashnode *, _cpp_buff *,
				 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 *);
static void replace_args (cpp_reader *, cpp_hashnode *, cpp_macro *,
			  macro_arg *);
static _cpp_buff *funlike_invocation_p (cpp_reader *, cpp_hashnode *);
static bool create_iso_definition (cpp_reader *, cpp_macro *);
Neil Booth's avatar
Neil Booth committed

/* #define directive parsing and handling.  */

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 *, const 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 *);
Zack Weinberg's avatar
Zack Weinberg committed

/* 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_maps, macro->line)))
	cpp_error_with_line (pfile, CPP_DL_WARNING, macro->line, 0,
			     "macro \"%s\" is not used", NODE_NAME (node));
    }

  return 1;
}

/* 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)
Neil Booth's avatar
Neil Booth committed
{
  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;
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 if it generates a new token context, 0 to
   return the token to the caller.  */
_cpp_builtin_macro_text (cpp_reader *pfile, cpp_hashnode *node)
Neil Booth's avatar
Neil Booth committed
{
  const uchar *result = NULL;
  unsigned int number = 1;
Neil Booth's avatar
Neil Booth committed
  switch (node->value.builtin)
    {
    default:
      cpp_error (pfile, CPP_DL_ICE, "invalid built-in macro \"%s\"",
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;
	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 + 3);
	result = buf;
	*buf = '"';
	buf = cpp_quote_string (buf + 1, (const unsigned char *) name, len);
	*buf++ = '"';
	*buf = '\0';
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.  */
      number = pfile->line_maps.depth - 1;
Neil Booth's avatar
Neil Booth committed
      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.  */
      if (CPP_OPTION (pfile, traditional))
	number = pfile->line;
      else
	number = pfile->cur_token[-1].line;
      number = SOURCE_LINE (pfile->map, number);
Neil Booth's avatar
Neil Booth committed
      break;
Neil Booth's avatar
Neil Booth committed

      /* __STDC__ has the value 1 under normal circumstances.
	 However, if (a) we are in a system header, (b) the option
	 stdc_0_in_system_headers is true (set by target config), and
	 (c) we are not in strictly conforming mode, then it has the
	 value 0.  */
Neil Booth's avatar
Neil Booth committed
    case BT_STDC:
      {
	if (CPP_IN_SYSTEM_HEADER (pfile)
	    && CPP_OPTION (pfile, stdc_0_in_system_headers)
	    && !CPP_OPTION (pfile,std))
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 == NULL)
Neil Booth's avatar
Neil Booth committed
	{
	  /* 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
	    {
			 "could not determine date and time");
		
	      pfile->date = U"\"??? ?? ????\"";
	      pfile->time = U"\"??:??:??\"";
	    }
Neil Booth's avatar
Neil Booth committed
      if (node->value.builtin == BT_DATE)
Neil Booth's avatar
Neil Booth committed
      else
Neil Booth's avatar
Neil Booth committed
      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 no new token is
   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)
  if (node->value.builtin == BT_PRAGMA)
    {
Neil Booth's avatar
Neil Booth committed
      /* 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
    }
  buf = _cpp_builtin_macro_text (pfile, node);
  len = ustrlen (buf);
  nbuf = alloca (len + 1);
  memcpy (nbuf, buf, len);
  nbuf[len]='\n';
  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);
  push_token_context (pfile, NULL, _cpp_lex_direct (pfile), 1);
  if (pfile->buffer->cur != pfile->buffer->rlimit)
    cpp_error (pfile, CPP_DL_ICE, "invalid built-in macro \"%s\"",
	       NODE_NAME (node));
  _cpp_pop_buffer (pfile);

Neil Booth's avatar
Neil Booth committed
  return 1;
/* Copies SRC, of length LEN, to DEST, adding backslashes before all
   backslashes and double quotes.  Non-printable characters are
   converted to octal.  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)
Neil Booth's avatar
Neil Booth committed
{
  while (len--)
    {
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

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

  if (BUFF_ROOM (pfile->u_buff) < 3)
    _cpp_extend_buff (pfile, &pfile->u_buff, 3);
  dest = BUFF_FRONT (pfile->u_buff);
  *dest++ = '"';

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 quote and NUL.  */
      len = cpp_token_len (token);
Neil Booth's avatar
Neil Booth committed
      if (escape_it)
	len *= 4;
      len += 3;
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 - 1 != 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 = cpp_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.str.text[0] == '\\')
Neil Booth's avatar
Neil Booth committed
	backslash_count++;
      else
	backslash_count = 0;
    }

  /* Ignore the final \ of invalid string literals.  */
  if (backslash_count & 1)
    {
		 "invalid string literal, ignoring final '\\'");
  /* Commit the memory, including NUL, and return the token.  */
  *dest++ = '"';
  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
Neil Booth's avatar
Neil Booth committed
   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)
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 = alloca (len);
Neil Booth's avatar
Neil Booth committed
  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_EQ)
Neil Booth's avatar
Neil Booth committed
    *end++ = ' ';
  end = cpp_spell_token (pfile, rhs, end);
  cpp_push_buffer (pfile, buf, end - buf, /* from_stage3 */ true);
  _cpp_clean_line (pfile);
Neil Booth's avatar
Neil Booth committed

  /* 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;
/* 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.  */
Neil Booth's avatar
Neil Booth committed
static void
paste_all_tokens (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 = FIRST (context).token++;
	rhs = *FIRST (context).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);
	  /* Mandatory error for all apart from assembler.  */
Neil Booth's avatar
Neil Booth committed
	  if (CPP_OPTION (pfile, lang) != CLK_ASM)
Neil Booth's avatar
Neil Booth committed
	 "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);
/* 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)
		       "ISO C99 requires rest arguments to be used");
	  return true;
	}

		 "macro \"%s\" requires %u arguments, but only %u given",
		 NODE_NAME (node), macro->paramc, argc);
    }
  else
	       "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().  */
static _cpp_buff *
collect_args (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;

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

  if (token->type == CPP_EOF)
Neil Booth's avatar
Neil Booth committed
    {
      /* 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)
	_cpp_backup_tokens (pfile, 1);
		 "unterminated argument list invoking macro \"%s\"",
		 NODE_NAME (node));
Neil Booth's avatar
Neil Booth committed
    }
Neil Booth's avatar
Neil Booth committed
    {
      /* 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;
	  return base_buff;
	}
  /* An error occurred.  */
  _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 (cpp_reader *pfile, 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);
  /* 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)
	push_token_context (pfile, NULL, padding, 1);
    }
/* Push the context of a macro with hash entry NODE onto the context
   stack.  If we can successfully expand the macro, we push a context
   containing its yet-to-be-rescanned replacement list and return one.
   Otherwise, we don't push a context and return zero.  */
Zack Weinberg's avatar
Zack Weinberg committed
static int
enter_macro_context (cpp_reader *pfile, cpp_hashnode *node)
Zack Weinberg's avatar
Zack Weinberg committed
{
  /* The presence of a macro invalidates a file's controlling macro.  */
Neil Booth's avatar
Neil Booth committed
  pfile->mi_valid = false;

  pfile->state.angled_headers = false;

  /* Handle standard macros.  */
Neil Booth's avatar
Neil Booth committed
  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)
 "function-like macro \"%s\" must be used with arguments in traditional C",
	  if (macro->paramc > 0)
	    replace_args (pfile, node, macro, (macro_arg *) buff->base);
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)
	push_token_context (pfile, node, macro->exp.tokens, macro->count);
Neil Booth's avatar
Neil Booth committed

      return 1;
Zack Weinberg's avatar
Zack Weinberg committed
    }
  /* Handle built-in macros and the _Pragma operator.  */
Neil Booth's avatar
Neil Booth committed
  return builtin_macro (pfile, node);
/* Replace the parameters in a function-like macro of NODE with the
   actual ARGS, and place the result in a newly pushed token context.
   Expand each argument before replacing, unless it is operated upon
   by the # or ## operators.  */
Neil Booth's avatar
Neil Booth committed
static void
replace_args (cpp_reader *pfile, cpp_hashnode *node, cpp_macro *macro, macro_arg *args)
Neil Booth's avatar
Neil Booth committed
{
  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

  /* 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.  */
  total = macro->count;
  limit = macro->exp.tokens + macro->count;
  for (src = macro->exp.tokens; 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->exp.tokens && (src[-1].flags & PASTE_LEFT)))
Neil Booth's avatar
Neil Booth committed
	  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->exp.tokens; 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->exp.tokens && (src[-1].flags & PASTE_LEFT))
	{
	  count = arg->count, from = arg->first;
	  if (dest != first)
	    {
	      if (dest[-1]->type == CPP_COMMA
		  && macro->variadic
		  && src->val.arg_no == macro->paramc)
		{
		  /* Swallow a pasted comma if from == NULL, otherwise
		     drop the paste flag.  */
		  if (from == NULL)
		    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 || pfile->state.directive_wants_padding)
	  && src != macro->exp.tokens && !(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 (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;
}

/* Get a new uninitialized context.  Create a new one if we cannot
   re-use an old one.  */
static cpp_context *
next_context (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 (cpp_reader *pfile, cpp_hashnode *macro, _cpp_buff *buff,
		     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;
  FIRST (context).ptoken = first;
  LAST (context).ptoken = first + count;
}

/* Push a list of tokens.  */
static void
push_token_context (cpp_reader *pfile, 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;
  FIRST (context).token = first;
  LAST (context).token = first + count;
/* Push a traditional macro's replacement text.  */
void
_cpp_push_text_context (cpp_reader *pfile, cpp_hashnode *macro,
			const uchar *start, size_t len)
{
  cpp_context *context = next_context (pfile);

  context->direct_p = true;
  context->macro = macro;
  context->buff = NULL;
  CUR (context) = start;
  RLIMIT (context) = start + len;
  macro->flags |= NODE_DISABLED;
/* Expand an argument ARG before replacing parameters in a
   function-like macro.  This works by pushing a context with the
   argument's tokens, and then expanding that into a temporary buffer
   as if it were a normal part of the token stream.  collect_args()
   has terminated the argument's tokens with a CPP_EOF so that we know
   when we have fully expanded the argument.  */
Neil Booth's avatar
Neil Booth committed
static void
expand_arg (cpp_reader *pfile, macro_arg *arg)
Neil Booth's avatar
Neil Booth committed
{
  unsigned int capacity;

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

  /* Don't warn about funlike macros when pre-expanding.  */
  saved_warn_trad = CPP_WTRADITIONAL (pfile);
  CPP_WTRADITIONAL (pfile) = 0;

Neil Booth's avatar
Neil Booth committed
  /* Loop, reading in the arguments.  */
  capacity = 256;
  arg->expanded = 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;