Skip to content
Snippets Groups Projects
  1. Jan 03, 2002
  2. Nov 26, 2001
    • Neil Booth's avatar
      cppfiles.c (stack_include_file): Don't optimize zero-length files. · 4d6baafa
      Neil Booth authored
      	* cppfiles.c (stack_include_file): Don't optimize zero-length
      	files.
      	(read_include_file): NUL-terminate read files.
      	* cpplex.c (handle_newline, skip_escaped_newlines,
      	get_effective_char, skip_whitespace, parse_identifier,
      	parse_identifier_slow, parse_number, parse_string,
      	_cpp_lex_direct): Optimize for the fact that buffers are guaranteed
      	NUL-terminated.
      	* cpplib.c (destringize_and_run, cpp_define, handle_assertion):
      	Be sure buffers are NUL terminated.
      	* cppmacro.c (warn_of_redefinition): Kill compile warning.
      
      	* c-common.c: Include tree-inline.h.
      	(c_language): Move separate definitions here.
      	(c_common_init_options, c_common_post_options): New.
      	(c_common_lang_init): Rename c_common_init.
      	* c-common.h (c_common_lang_init): Similarly.
      	(c_common_init_options, c_common_post_options): New.
      	* c-lang.c (c_post_options): Move body to c_common_post_options.
      	(c_init_options): Use c_common_init_options.
      	(c_init): Update.
      	* langhooks.def: Rearrange.
      	* langhooks.h: Rearrange, and improve comments.
      	* toplev.c (do_compile): New function.
      	(toplev_main): Use it.
      	(lang_independent_f_options, parse_options_and_default_flags,
      	process_options): Remove trailing periods.
      	* Makefile.in: Update.
      cp:	* decl2.c (c_language): Move to c-common.c.
      	* lex.c (cxx_post_options, cxx_init_options): Use c-common.c
      	functions.
      	(cxx_init): Update.
      objc:	* objc-act.c (objc_post_options, objc_init_options): Use c-common.c
      	functions.
      	(ojbc_init): Update.
      
      From-SVN: r47362
      4d6baafa
  3. Nov 23, 2001
    • Joseph Myers's avatar
      ChangeLog.0, [...]: Fix spelling errors. · a1f300c0
      Joseph Myers authored
      	* ChangeLog.0, ChangeLog.2, ChangeLog.3, ChangeLog.4, ChangeLog,
      	FSFChangeLog.10, c-decl.c, cppfiles.c, cppinit.c, cpplex.c,
      	cpplib.c, cppmain.c, cse.c, df.c, diagnostic.c, dominance.c,
      	dwarf2out.c, dwarfout.c, emit-rtl.c, errors.c, except.c, except.h,
      	explow.c, function.c, gcse.c, genrecog.c, predict.c, regmove.c,
      	sched-rgn.c, ssa-ccp.c, stmt.c, toplev.c: Fix spelling errors.
      
      From-SVN: r47279
      a1f300c0
  4. Oct 21, 2001
    • Neil Booth's avatar
      cpphash.h (struct cpp_buffer): Delete read_ahead and extra_char. · 480709cc
      Neil Booth authored
      	* cpphash.h (struct cpp_buffer): Delete read_ahead and extra_char.
      	* cpplex.c (lex_percent, lex_dot): Remove.
      	(get_effective_char, skip_block_comment, skip_line_comment,
      	parse_identifier_slow, parse_number, parse_string, save_comment,
      	_cpp_lex_direct): Update to do lookback freely.
      	(IF_NEXT_IS, BACKUP): New macros.
      	* cpplib.c (cpp_push_buffer): Don't set read_ahead and extra_char.
      	* cppmacro.c (paste_tokens): Update.
      
      From-SVN: r46392
      480709cc
  5. Oct 20, 2001
    • Neil Booth's avatar
      cpplex.c (handle_newline, [...]): Update to do more stepping back. · 87062813
      Neil Booth authored
      	* cpplex.c (handle_newline, skip_escaped_newlines,
      	get_effective_char, skip_block_comment, skip_line_comment,
      	parse_identifier_slow, parse_number, parse_string,
      	_cpp_lex_direct): Update to do more stepping back.
      	(trigraph_ok): Similarly.  Rename trigraph_p.
      	(SAVE_STATE, RESTORE_STATE): Remove.
      	(BUFF_SIZE_UPPER_BOUND): Tweak.  Add sanity check.
      
      	* cpplib.c (destringize): Rename destringize_and_run, and
      	call run_directive directly.
      	(_cpp_do__Pragma): Simplify.
      
      From-SVN: r46373
      87062813
  6. Oct 14, 2001
    • Neil Booth's avatar
      cpplib.c (struct pragma_entry): Store the name as a hashnode. · 4b115ff0
      Neil Booth authored
      	* cpplib.c (struct pragma_entry): Store the name as a hashnode.
      	(lookup_pragma_entry, insert_pragma_entry, do_pragma,
      	cpp_register_pragma): Update accordingly.
      
      From-SVN: r46255
      4b115ff0
    • Neil Booth's avatar
      c-pragma.h (cpp_register_pragma_space): Remove. · a5da89c6
      Neil Booth authored
      	* c-pragma.h (cpp_register_pragma_space): Remove.
      	* cpplib.h (cpp_register_pragma_space): Remove.
      	* cpplib.c (lookup_pragma_entry, insert_pragma_entry): New.
      	(cpp_register_pragma_space): Remove.
      	(cpp_register_pragma): Simplify using lookup_pragma_entry,
      	add sanity checks.
      	(do_pragma): Similarly.
      	(_cpp_init_internal_pragmas): Don't register namespaces.
      
      	* config/v850/v850.h (REGISTER_TARGET_PRAGMAS):
      	Don't register namespaces.
      	* cp/lex.c (init_cp_pragma): Similarly.
      	* doc/tm.texi: Update.
      
      From-SVN: r46254
      a5da89c6
  7. Oct 10, 2001
    • Kazu Hirata's avatar
      calls.c: Fix formatting. · 6d2f8887
      Kazu Hirata authored
      	* calls.c: Fix formatting.
      	* c-decl.c: Likewise.
      	* cfgcleanup.c: Likewise.
      	* combine.c: Likewise.
      	* cppfiles.c: Likewise.
      	* cpplib.c: Likewise.
      	* cppmacro.c: Likewise.
      	* crtstuff.c: Likewise.
      	* cse.c: Likewise.
      	* dwarf2out.c: Likewise.
      	* expmed.c: Likewise.
      	* expr.c: Likewise.
      	* fold-const.c: Likewise.
      	* function.c: Likewise.
      	* gcse.c: Likewise.
      	* genattrtab.c: Likewise.
      	* ggc-page.c: Likewise.
      	* integrate.c: Likewise.
      	* libgcc2.c: Likewise.
      	* loop.c: Likewise.
      	* optabs.c: Likewise.
      	* profile.c: Likewise.
      	* protoize.c: Likewise.
      	* real.c: Likewise.
      	* recog.c: Likewise.
      	* reload1.c: Likewise.
      	* reload.c: Likewise.
      	* reorg.c: Likewise.
      	* resource.c: Likewise.
      	* sched-rgn.c: Likewise.
      	* sdbout.c: Likewise.
      	* stmt.c: Likewise.
      	* toplev.c: Likewise.
      	* varasm.c: Likewise.
      
      From-SVN: r46145
      6d2f8887
  8. Sep 30, 2001
    • Neil Booth's avatar
      cpphash.h (POOL_ALIGN, [...]): Remove. · 8c3b2693
      Neil Booth authored
      	* cpphash.h (POOL_ALIGN, POOL_FRONT, POOL_LIMIT, POOL_BASE,
      	POOL_SIZE, POOL_ROOM, POOL_COMMIT, struct cpp_chunk,
      	struct cpp_pool, _cpp_init_pool, _cpp_free_pool, _cpp_pool_reserve,
      	_cpp_pool_alloc, _cpp_next_chunk): Remove.
      	(_cpp_extend_buff, BUFF_ROOM): Update.
      	(_cpp_append_extend_buff): New.
      	(struct cpp_reader): Remove macro_pool, add a_buff.
      	* cppinit.c (cpp_create_reader): Initialize a_buff, instead of
      	macro_pool.
      	(cpp_destroy): Free a_buff instead of macro_pool.
      	* cpplex.c (new_chunk, chunk_suitable, _cpp_next_chunk,
      	new_chunk, _cpp_init_pool, _cpp_free_pool, _cpp_pool_reserve,
      	_cpp_pool_alloc, ): Remove.
      	(parse_number, parse_string): Update use of _cpp_extend_buff.
      	(_cpp_extend_buff): Update.
      	(_cpp_append_extend_buff, cpp_aligned_alloc): New.
      	* cpplib.c (glue_header_name, parse_answer):
      	Update use of _cpp_extend_buff.
      	(cpp_register_pragma, cpp_register_pragma_space): Use
      	_cpp_aligned_alloc.
      	(do_assert, do_unassert): Check for EOL, update.
      	* cppmacro.c (stringify_arg, collect_args): Update to use
      	_cpp_extend_buff and _cpp_append_extend_buff.
      	(save_parameter, parse_params, alloc_expansion_token,
      	_cpp_create_definition): Rework memory management.
      
      	* gcc.dg/cpp/redef2.c: Add test.
      
      From-SVN: r45899
      8c3b2693
  9. Sep 28, 2001
    • Neil Booth's avatar
      cpphash.h (struct cpp_buff): Make unsigned. · ece54d54
      Neil Booth authored
      	* cpphash.h (struct cpp_buff): Make unsigned.
      	(_cpp_get_buff): Take length of size_t.
      	(_cpp_unaligned_alloc): New.
      	(BUFF_ROOM, BUFF_FRONT, BUFF_LIMIT): New.
      	(struct cpp_reader): Remove ident_pool.  Add u_buff.
      	* cppinit.c (cpp_create_reader): Initialize u_buff, not ident_pool.
      	(cpp_destroy): Destroy u_buff, not ident_pool.
      	* cpplex.c (parse_number, parse_string, save_comment,
      	cpp_token_as_text): Update to use the unaligned buffer.
      	(new_buff): Make unsigned.
      	(_cpp_unaligned_alloc): New.
      	* cpplib.c (glue_header_name): Update to use the unaligned buffer.
      	* cppmacro.c (new_number_token, builtin_macro, stringify_arg):
      	Similarly.
      	(collect_args): Make unsigned.
      
      From-SVN: r45858
      ece54d54
  10. Sep 24, 2001
    • Neil Booth's avatar
      c-lex.c (cb_def_pragma): Update. · 4ed5bcfb
      Neil Booth authored
      	* c-lex.c (cb_def_pragma): Update.
      	(c_lex): Update, and skip padding.
      	* cppexp.c (lex, parse_defined): Update, remove unused variable.
      	* cpphash.h (struct toklist): Delete.
      	(union utoken): New.
      	(struct cpp_context): Update.
      	(struct cpp_reader): New members eof, avoid_paste.
      	(_cpp_temp_token): New.
      	* cppinit.c (cpp_create_reader): Update.
      	* cpplex.c (_cpp_temp_token): New.
      	(_cpp_lex_direct): Add PREV_WHITE when parsing args.
      	(cpp_output_token): Don't print leading whitespace.
      	(cpp_output_line): Update.
      	* cpplib.c (glue_header_name, parse_include, get__Pragma_string,
      	do_include_common, do_line, do_ident, do_pragma,
      	do_pragma_dependency, _cpp_do__Pragma, parse_answer,
      	parse_assertion): Update.
      	(get_token_no_padding): New.
      	* cpplib.h (CPP_PADDING): New.
      	(AVOID_LPASTE): Delete.
      	(struct cpp_token): New union member source.
      	(cpp_get_token): Update.
      	* cppmacro.c (macro_arg): Convert to use pointers to const tokens.
      	(builtin_macro, paste_all_tokens, paste_tokens, funlike_invocation_p,
      	replace_args, quote_string, stringify_arg, parse_arg, next_context,
      	enter_macro_context, expand_arg, _cpp_pop_context, cpp_scan_nooutput,
      	_cpp_backup_tokens, _cpp_create_definition): Update.
      	(push_arg_context): Delete.
      	(padding_token, push_token_context, push_ptoken_context): New.
      	(make_string_token, make_number_token): Update, rename.
      	(cpp_get_token): Update to handle tokens as pointers to const,
      	and insert padding appropriately.
      	* cppmain.c (struct printer): New member prev.
      	(check_multiline_token): Constify.
      	(do_preprocessing, cb_line_change): Update.
      	(scan_translation_unit): Update to handle spacing.
      	* scan-decls.c (get_a_token): New.
      	(skip_to_closing_brace, scan_decls): Update.
      	* fix-header.c (read_scan_file): Update.
      
      	* doc/cpp.texi: Update.
      
      	* gcc.dg/cpp/macro10.c: New test.
      	* gcc.dg/cpp/strify3.c: New test.
      	* gcc.dg/cpp/spacing1.c: Add tests.
      	* gcc.dg/cpp/19990703-1.c: Remove bogus test.
      	* gcc.dg/cpp/20000625-2.c: Fudge to pass.
      
      From-SVN: r45793
      4ed5bcfb
  11. Sep 16, 2001
    • Neil Booth's avatar
      cpphash.h (_cpp_lex_token): Update prototype. · 345894b4
      Neil Booth authored
      	* cpphash.h (_cpp_lex_token): Update prototype.
      	* cpplex.c (_cpp_lex_token): New prototype.
      	* cpplib.c (skip_rest_of_line, check_eol, _cpp_handle_directive,
      	lex_macro_node, read_flag, do_pragma_poison): Update.
      	* cppmacro.c (cpp_get_token, parse_params,
      	lex_expansion_token): Update.
      
      From-SVN: r45646
      345894b4
    • Neil Booth's avatar
      cppmain.c (scan_translation_unit): Don't worry about putting a space after hashes. · 18a9d8ff
      Neil Booth authored
      	* cppmain.c (scan_translation_unit): Don't worry about
      	putting a space after hashes.
      	* cpplib.c (directive_diagnostics): New.
      	(_cpp_handle_directive): Update to use directive_diagnostics.
      	(run_directive): Don't toggle prevent_expansion.
      	(do_line): Backup in case of the line extension.
      	* cpplib.h (cpp_lexer_pos): Remove.
      	* cppmacro.c (_cpp_create_definition): Precede a leading #
      	with whitespace.
      
      	* gcc.dg/cpp/line5.c: New testcase.
      
      From-SVN: r45645
      18a9d8ff
  12. Sep 15, 2001
    • Neil Booth's avatar
      cpphash.h (struct cpp_reader): Remove lexer_pos, directive_pos. · 50410426
      Neil Booth authored
      	* cpphash.h (struct cpp_reader): Remove lexer_pos, directive_pos.
      	Split mlstring_pos into mls_line and mls_col.
      	* cppinit.c (cpp_create_reader): Initialize line to 1.
      	(cpp_destroy): Free tokenruns.
      	(push_include): Don't update lexer_pos.
      	* cpplex.c (unterminated, parse_string): Update.
      	(lex_token): Don't update lexer_pos, update.
      	* cpplib.c (if_stack): Save line instead of line + col.
      	(start_directive, _cpp_do__Pragma, do_else, do_elif,
      	push_conditional, _cpp_pop_buffer): Update.
      	* cppmacro.c (funlike_invocation_p): Don't save lexer_pos.
      	(_cpp_create_definition): Update.
      
      From-SVN: r45627
      50410426
  13. Sep 14, 2001
    • Neil Booth's avatar
      cpperror.c (print_location): Take line and column, for default positioning use... · 97293897
      Neil Booth authored
      cpperror.c (print_location): Take line and column, for default positioning use the previously lexed token.
      
      	* cpperror.c (print_location): Take line and column, for
      	default positioning use the previously lexed token.
      	(_cpp_begin_message): Take line and column.
      	(cpp_ice, cpp_fatal, cpp_error, cpp_error_with_line, cpp_warning,
      	cpp_warning_with_line, cpp_pedwarn, cpp_pedwarn_with_line): Update.
      	* cpphash.h (_cpp_begin_message): Update prototype.
      	* cppinit.c (push_include): Don't set output line.
      	* cpplex.c (_cpp_lex_token): Callback for start of new output lines.
      	* cpplib.c (do_diagnostic, _cpp_pop_buffer): Update.
      	(do_pragma): Kludge for front ends.  Don't expand macros at all.
      	* cpplib.h (cpp_lookahead, cpp_token_with_pos, cpp_get_line): Remove.
      	(struct cpp_token): Remove output_line.
      	(struct cpp_callbacks): New member line_change.
      	* cppmacro.c (builtin_macro, paste_all_tokens, replace_args,
      	cpp_get_token): Preserve BOL flag.
      	(cpp_get_line): Remove.
      	(_cpp_backup_tokens): Remove useless abort().
      	* cppmain.c (cb_line_change): New.
      	(scan_translation_unit): Don't worry about starting new lines here.
      	* scan-decls.c (scan_decls): Update.
      	* c-lex.c (c_lex, init_c_lex): Update.
      	(cb_line_change, src_lineno): New.
      
      From-SVN: r45613
      97293897
  14. Sep 13, 2001
    • Neil Booth's avatar
      c-parse.in (_yylex): Use _cpp_backup_tokens. · bdcbe496
      Neil Booth authored
      	* c-parse.in (_yylex): Use _cpp_backup_tokens.
      	* cpphash.h (struct tokenrun): Add prev.
      	(struct lexer_state): Remove bol.
      	(struct cpp_reader): Remove old lookahead stuff, add lookaheads.
      	(_cpp_free_lookaheads, _cpp_release_lookahead, _cpp_push_token)
      	: Remove.
      	* cppinit.c (cpp_create_reader): Don't set bol.
      	(cpp_destroy): Don't free lookaheads.
      	* cpplex.c (lex_directive): Remove.
      	(next_tokenrun): Update.
      	(_cpp_lex_token): Clean up logic.
      	(lex_token): Update to return a pointer to lexed token, since it
      	can move to the start of the buffer.  Simpify newline handling.
      	* cpplib.c (SEEN_EOL): Update.
      	(skip_rest_of_line): Remove lookahead stuff.
      	(end_directive): Line numbers are already incremented.  Revert
      	to start of lexed token buffer if we can.
      	(_cpp_handle_directive, do_pragma, do_pragma_dependency,
      	parse_answer): Use _cpp_backup_tokens.
      	(run_directive, cpp_pop_buffer): Don't set bol, set saved_flags
      	instead.  Don't check for EOL.
      	(do_include_common, do_line, do_pragma_system_header): Use
      	skip_rest_of_line.
      	* cpplib.h (BOL, _cpp_backup_tokens): New.
      	* cppmacro.c (save_lookahead_token, take_lookahead_token,
      	alloc_lookahead, free_lookahead, _cpp_free_lookaheads,
      	cpp_start_lookahead, cpp_stop_lookahead, _cpp_push_token): Remove.
      	(builtin_macro): Don't use cpp_get_line.
      	(cpp_get_line): Short term kludge.
      	(parse_arg): Handle directives in arguments here.  Back up when
      	appropriate.  Store EOF at end of argument list.
      	(funlike_invocation_p): Use _cpp_backup_tokens.
      	(push_arg_context): Account for EOF at end of list.
      	(cpp_get_token): Remove lookahead stuff.  Update.
      
      	* gcc.dg/cpp/directiv.c: Update.
      	* gcc.dg/cpp/undef1.c: Update.
      
      From-SVN: r45582
      bdcbe496
  15. Sep 11, 2001
    • Neil Booth's avatar
      cpphash.h (struct tokenrun): New. · 5fddcffc
      Neil Booth authored
      	* cpphash.h (struct tokenrun): New.
      	(struct cpp_context): New member bol.
      	(struct cpp_reader): New members.
      	(_cpp_init_tokenrun): New.
      	* cppinit.c (cpp_create_reader): Set up the token runs.
      	* cpplex.c (lex_directive, lex_token, next_tokenrun): New.
      	(lex_token): New internalised version of _cpp_lex_token.  Don't
      	handle directives or the multiple include opimisation here any
      	more.  Simply lex a token.
      	* cpplib.c (run_directive): Clear bol.
      	(_cpp_pop_buffer): Set bol.
      	* cppmacro.c (funlike_invocation_p): Keep tokens whilst parsing
      	arguments.
      
      From-SVN: r45534
      5fddcffc
  16. Aug 22, 2001
    • Neil Booth's avatar
      cpperror.c (print_location): Don't show _Pragma. · 29401c30
      Neil Booth authored
      	* cpperror.c (print_location): Don't show _Pragma.
      	* cppfiles.c (_cpp_pop_file_buffer): Handle -include file pushing
      	and file change callback generation here.
      	(stack_include_file): Update use of cpp_push_buffer.
      	* cpphash.h (_cpp_pop_file_buffer): Update prototype.
      	(struct cpp_buffer): Remove type, pfile members.
      	* cppinit.c (cpp_handle_option): Use free_chain.
      	* cpplex.c (_cpp_lex_token): Don't do -include file pushing here.
      	(skip_escaped_newlines, get_effective_char, lex_percent): Take
      	a cpp_reader rather than a cpp_buffer.
      	(skip_escaped_newlines, get_effective_char, skip_block_comment,
      	skip_line_comment, parse_string, lex_percent, lex_dot,
      	_cpp_lex_token): Update accordingly.
      	* cpplib.c (_cpp_pop_buffer): Don't do file change callback
      	generation here.
      	(cpp_push_buffer): Update prototype.
      	(run_directive): Update use of cpp_push_buffer.
      	(_cpp_do__Pragma, cpp_define, cpp_define_builtin, cpp_undef,
      	handle_assertion): Update use of run_directive.
      	* cpplib.h (enum cpp_buffer_type): Remove.
      	(cpp_push_buffer): Update prototype.
      	* fix-header.c (read_scan_file): Update.
      
      From-SVN: r45112
      29401c30
  17. Aug 21, 2001
    • Neil Booth's avatar
      cppfiles.c (stack_include_file): line-map.c now handles include depth. · d8693c6f
      Neil Booth authored
      	* cppfiles.c (stack_include_file): line-map.c now handles include
      	depth.
      	(handle_missing_handler): Similarly.
      	(_cpp_execute_include): Similarly.
      	(_cpp_pop_file_buffer): Similarly.
      	* cpphash.h (struct cpp_reader): Remove system_include_depth,
      	buffer_stack_depth and include_depth.
      	* cpplib.c (do_include_common): line-map.c now handles include depth.
      	(cpp_push_buffer): Similarly.
      	(_cpp_pop_buffer): Similarly.
      	* cppmacro.c (builtin_macro): Update.
      	* line-map.c (init_line_maps): Set depth.
      	(add_line_map): Increment "used" earlier.  Update and use the
      	include depth.
      	(trace_include): Use the include depth.
      	* line-map.h (struct line_maps): New member depth.
      
      From-SVN: r45085
      d8693c6f
    • Neil Booth's avatar
      cpphash.h (_cpp_push_next_buffer): New. · d7bc7a98
      Neil Booth authored
      	* cpphash.h (_cpp_push_next_buffer): New.
      	* cppinit.c (do_includes): Remove.
      	(push_include, free_chain, _cpp_push_next_buffer): New.
      	(cpp_start_read): Use them to rework command line option handling.
      	(cpp_handle_option): Combine handling of -include and -imacros.
      	* cpplex.c (_cpp_lex_token): Push a new -include buffer if
      	appropriate.  Always insert missing \n at EOF.
      	* cpplib.c (start_directive): Get the directive position right.
      	* cppmain.c (cb_file_change): Always print the first line, unless
      	preprocessed.
      
      From-SVN: r45070
      d7bc7a98
  18. Aug 17, 2001
    • Neil Booth's avatar
      cpperror.c (print_location): Don't take a file name; use the line map instead. · bb74c963
      Neil Booth authored
      	* cpperror.c (print_location):  Don't take a file name; use the
      	line map instead.
      	(_cpp_begin_message): Similarly.
      	(cpp_ice, cpp_fatal, cpp_error, cpp_error_with_line, cpp_warning,
      	cpp_warning_with_line, cpp_pedwarn, cpp_pedwarn_with_line): Update.
      	(cpp_pedwarn_with_file_and_line): Remove.
      	* cppfiles.c (stack_include_file): Update; set filename to stdin
      	here when appropriate.
      	* cpphash.h (struct cpp_buffer): Remove nominal_fname.
      	(_cpp_begin_message): Don't take a file name.
      	* cppinit.c: Add comment.
      	* cpplex.c: Fix end-of-directive indicator.
      	* cpplib.c: Don't include intl.h.
      	(run_directive, do_diagnostic): Update.
      	(do_line): Update to not use nominal_fname.
      	(cpp_push_buffer): Don't take a filename.
      	* cpplib.h (struct ht): Remove.
      	(cpp_push_buffer): Don't take a filename.
      	(cpp_pedwarn_with_file_and_line): Remove.
      	* cppmacro.c (struct cpp_macro): Remove file.
      	(builtin_macro): Update.
      	(_cpp_create_definition): Update.
      	* cppmain.c: Correct comment.
      	* fix-header.c (read_scan_file): Update.
      
      From-SVN: r44986
      bb74c963
  19. Aug 11, 2001
    • Neil Booth's avatar
      cpphash.c (_cpp_destroy_hashtable): Use ht_destroy. · bef985f3
      Neil Booth authored
      	* cpphash.c (_cpp_destroy_hashtable): Use ht_destroy.
      	* cpphash.h (CPP_IN_SYSTEM_HEADER): Fix.
      	(struct cpp_pool): New member first.
      	* cppinit.c (append_include_chain): Plug memory leaks.
      	* cpplib.c (cpp_register_pragma, cpp_register_pragma_space):
      	Allocate pragma structures from the (aligned) macro pool to
      	avoid leaking memory.
      	* cpplex.c (_cpp_init_pool, _cpp_free_pool): Use pool->first
      	so we don't leak memory.
      	* hashtable.c (ht_destroy): New.
      	* hashtable.h (ht_destroy): New.
      
      From-SVN: r44794
      bef985f3
    • Neil Booth's avatar
      cpphash.h, cpplib.c: Correct erroneous previous checkin. · f80f7e8c
      Neil Booth authored
      
      	* cpphash.h, cpplib.c: Correct erroneous previous checkin.
      
      Co-Authored-By: default avatarFranz Sirl <Franz.Sirl-kernel@lauterbach.com>
      
      From-SVN: r44790
      f80f7e8c
    • Neil Booth's avatar
      c-lex.c (map): Make const. · 47d89cf3
      Neil Booth authored
      	* c-lex.c (map): Make const.
      	(cb_file_change): Update for callback passing a line map.
      	Don't assume we have a previous map.  Remove sanity check
      	about popping too many files.
      	* cpperror.c (print_location): Make map const.
      	* cppfiles.c (stack_include_file): Update; line maps now hold sysp.
      	(cpp_make_system_header): Similarly.
      	(search_from): Similarly.
      	(_cpp_execute_include): Don't remember where we came from.
      	* cpphash.h (struct cpp_buffer): Remove return_to_line, sysp.
      	(struct cpp_reader): Make map const.
      	(CPP_IN_SYSTEM_HEADER, _cpp_do_file_change): Update.
      	* cpplib.c (do_line): Update; line maps now hold sysp.
      	(cpp_push_buffer): Similarly.
      	(_cpp_do_file_change): Similarly; callback with map instead.
      	(cpp_get_line_maps): Constify return value.
      	(_cpp_pop_buffer): Update.
      	* cpplib.h (struct cpp_file_change): Remove.
      	(struct cpp_callbacks): Update.
      	(cpp_get_line_maps): Constify return value.
      	* cppmacro.c (_cpp_create_definition): Update.
      	* cppmain.c (struct printer): Constify map.
      	(maybe_print_line): Similarly.
      	(print_line): Similarly.  Deduce flags 1 and 2 here.
      	(cb_file_change): Update.
      	* line-map.c (free_line_maps): Warn regardless.
      	(add_line_map): Return pointer to const.  When passed NULL to_file
      	with LC_LEAVE, use the obvious values for the return point so the
      	caller doesn't have to figure them out.
      	(lookup_line): Return pointer to const.
      	(print_containing_files): Take pointer to const.
      	* line-map.h (struct line_map): New members reason, sysp.
      	(add_line_map): Return pointer to const.
      	(lookup_line): Similarly.
      	(print_containing_files): Take pointer to const.
      
      From-SVN: r44789
      47d89cf3
  20. Aug 06, 2001
    • Neil Booth's avatar
      cpperror.c (print_containing_files): Moved to line-map.c. · fde84349
      Neil Booth authored
      	* cpperror.c (print_containing_files): Moved to line-map.c.
      	(print_location): line-map.c handles re-listing or otherwise.
      	* cpphash.h (struct lexer_state): Remove next_bol.
      	(struct cpp_buffer): Remove include_stack_listed.
      	* cpplib.c (do_line, cpp_push_buffer, _cpp_pop_buffer):
      	Remove faked buffer handling.
      	(_cpp_do_file_change): Tweak.
      	* cpplib.h (enum cpp_buffer_type): Remove BUF_FAKE.
      	* cppmain.c (struct printer): Remove filename.
      	(print_line, cb_file_change): Update accordingly.
      	* line-map.c: Include intl.h.
      	(init_line_maps): Initialize last_listed.
      	(free_line_maps): Sanity check, warn if ENABLED_CHECKING.
      	(add_line_map): Sanity check inputs, warn if ENABLED_CHECKING.
      	(print_containing_files): New.
      	* line-map.h (struct line_maps): New member last_listed.
      	(print_containing_files, INCLUDED_FROM): New.
      	* Makefile.in: Update.
      	* po/POTFILES.in: Add line-map.c.
      
      From-SVN: r44670
      fde84349
  21. Aug 05, 2001
    • Neil Booth's avatar
      * cpplib.c (do_line): Update line number after pop_buffer. · 9765f972
      Neil Booth authored
      From-SVN: r44653
      9765f972
    • Neil Booth's avatar
      re PR preprocessor/3081 (Preprocessor merges 2 first lines when -imacros is being used) · 67821e3a
      Neil Booth authored
      	PR preprocessor/3081
      	* c-lex.c (map): New.
      	(cb_file_change): Update map and use it.
      	(cb_def_pragma, cb_define, cb_undef): Use map and line.
      	(c_lex): Update to use map.
      	* cpperror.c (print_location): Move to using logical line numbers.
      	* cppfiles.c (stack_include_file): Update for new _cpp_do_file_change.
      	(cpp_make_system_header): Similarly.
      	(_cpp_execute_include): Stop line numbering hacks.  Store the
      	line we will return to.
      	* cpphash.h (CPP_BUF_LINE): Remove.
      	(struct cpp_buffer): Remove lineno and pseudo_newlines.
      	Add map and return_to_line.
      	(_cpp_do_file_change): Update.
      	* cppinit.c (cpp_start_read): Update line kludge.
      	* cpplex.c (handle_newline): Don't update lineno and pseudo_newlines.
      	(trigraph_ok): Use logical line numbers for diagnostics.
      	(skip_block_comment): Likewise.
      	(skip_whitespace): Likewise.
      	(skip_line_comment): Use pfile->line instead.
      	(_cpp_lex_token): Update to use logical line numbering exclusively.
      	Handle BOL locally.  Accept new lines in directives, but keep
      	pfile->line decremented.  Diagnostics use logical lines.  Update
      	directive handling.
      	* cpplib.c (SEEN_EOL): New.
      	(skip_rest_of_line, check_eol): Use it.
      	(end_directive): Increase line number when accepting the newline
      	at the end of a directive.
      	(run_directive): Simplify.
      	(do_line): Bad LC_LEAVEs become LC_RENAMEs.  Update.
      	(_cpp_do_file_change): Update to take buffer line number as an
      	argument, and store the current map in the cpp_reader.  Remove
      	line number kludges.
      	(_cpp_do__Pragma): Restore output position after a _Pragma.
      	(cpp_push_buffer): Don't set output line or lineno.
      	(_cpp_pop_buffer): Transfer more info from a faked buffer.
      	Remove line kludge.  Set output_line.
      	* cppmacro.c (builtin_macro): Update handling of __LINE__.
      	(parse_arg): Use logical lines.
      	(save_lookahead_token): Save EOFs too now.
      	* cppmain.c (struct printer): Fix comments.
      	(printer_init): Simplify, let caller do errors.
      	(scan_translation_unit, check_multiline_token, dump_macro): Update.
      	(maybe_print_line): Simplify.
      	(print_line): Don't print a linemarker if -P.
      	(cb_define, cb_undef, cb_def_pragma, cb_ident, cb_include): Update.
      	(cb_file_change): Simplify.
      	* line-map.h (LAST_SOURCE_LINE): Fix.
      	(CURRENT_LINE_MAP): New.
      
      	* gcc.dg/cpp/19951025-1.c: Revert.
      	* gcc.dg/cpp/directiv.c: We no longer process directives that
      	interrupt macro arguments.
      
      From-SVN: r44650
      67821e3a
  22. Aug 04, 2001
    • Neil Booth's avatar
      cpphash.h (struct cpp_reader): New member directive_line. · 8bbbef34
      Neil Booth authored
      	* cpphash.h (struct cpp_reader): New member directive_line.
      	* cpplib.h (struct cpp_callbacks): Update prototypes of callbacks.
      	* cpplib.c (do_define, do_undef, do_ident, do_include_common,
      	do_pragma): Pass line to callbacks.
      	(start_directive): Record line of directive.
      	* cppmain.c (cb_ident, cb_define, cb_undef, cb_def_pragma,
      	cb_include): Similarly.
      	* c-lex.c (cb_ident, cb_define, cb_undef, cb_def_pragma):
      	Similarly.
      
      From-SVN: r44637
      8bbbef34
    • Neil Booth's avatar
      Makefile.in (CPPLIB_H): New, so that dependencies on cpplib.h are also on line-map.h. · ef6e958a
      Neil Booth authored
      	* Makefile.in (CPPLIB_H): New, so that dependencies on cpplib.h
      	are also on line-map.h.
      	* cppfiles.c (stack_include_file): Update.
      	* cpphash.h (struct cpp_buffer): New member return_at_eof.
      	(_cpp_pop_buffer): New.
      	* cppinit.c (cpp_destroy, cpp_finish): Update.
      	(do_includes): Mark each buffer to return at EOF.
      	* cpplex.c (_cpp_lex_token): Pop buffers at EOF.  Continue or
      	return as requested.
      	* cpplib.c (run_directive, do_line, cpp_push_buffer): Update.
      	(cpp_pop_buffer): Rename _cpp_pop_buffer.  Stop skipping.
      	* cpplib.h (cpp_pop_buffer): Remove.
      	(cpp_scan_buffer_nooutput): Rename cpp_scan_nooutput.
      	* cppmacro.c (cpp_scan_buffer_nooutput): Similarly.  No need to pop
      	buffers.
      	* cppmain.c (scan_buffer): Rename scan_translation_unit.  No need
      	to pop buffers.
      	(do_preprocessing): Update.
      	* fix-header.c (read_scan_file): Update.  No need to pop buffers.
      	* c-parse.in (_yylex): Similarly.
      	* scan-decls.c (scan_decls): Similarly.
      	* line-map.h: Update comments.
      
      	* cp/spew.c (read_token): No need to pop buffers.
      
      	* objc/Make-lang.in (objc-act.o): Update dependencies.
      
      From-SVN: r44634
      ef6e958a
  23. Aug 02, 2001
    • Neil Booth's avatar
      line-map.c: New. · d82fc108
      Neil Booth authored
      	* line-map.c: New.
      	* line-map.h: New.
      	* Makefile.in (line-map.o): New.
      	(LIBCPP_OBJS, LIBCPP_DEPS): Update.
      	* c-lex.c (cb_file_change): Update for new cpp_file_change structure.
      	* cpperror.c (print_containing_files): Similarly.
      	(print_location): Update.  Don't output a space before _Pragma.
      	* cppfiles.c (stack_include_file): Set to line 1 immediately.
      	(stack_include_filee, cpp_make_system_header): Update.
      	(_cpp_execute_include): Get logical line number right for calling
      	as-yet-unterminated #include.
      	* cpphash.h (struct cpp_reader): Add line_maps.
      	(_cpp_do_file_change): Update.
      	* cppinit.c (cpp_create_reader): Initialize line maps.
      	(cpp_destroy): Destroy line maps.
      	(cpp_start_read): Get logical line number right.
      	* cpplex.c (parse_string): Only warn once for multi-line strings.
      	Use boolean variable for null warning.
      	* cpplib.c (_cpp_handle_directive): End the directive if it isn't
      	already.
      	(do_include_common): End the directive early.
      	(do_line): Don't warn about out-of-range lines in preprocessed
      	source.  Update.  Remove unused variables.
      	(_cpp_do_file_change): Update for new line mapping.
      	(pragma_cb): New typedef.
      	(cpp_register_pragma): Stop looking ahead before calling the
      	handler.  Clean up.
      	(do_pragma_system_header): End directive early.
      	(cpp_get_line_maps): New.
      	(cpp_pop_buffer): Fudge logical line.  Update.
      	* cpplib.h: Include line-map.h
      	(enum cpp_fc_reason): Remove.
      	(struct cpp_file_change): Update.
      	(cpp_get_line_maps): New.
      	* cppmain.c (struct_printer): New member map.
      	(cb_file_change): Update for new mappings.
      	* fix-header.c (cb_file_change): Similarly.
      testsuite:
      	* gcc.dg/cpp/19951025-1.c: Update.
      
      From-SVN: r44584
      d82fc108
  24. Aug 01, 2001
    • Kazu Hirata's avatar
      alias.c: Fix comment formatting. · ec5c56db
      Kazu Hirata authored
      	* alias.c: Fix comment formatting.
      	* bitmap.c: Likewise.
      	* builtins.c: Likewise.
      	* calls.c: Likewise.
      	* c-common.c: Likewise.
      	* c-decl.c: Likewise.
      	* c-dump.c: Likewise.
      	* c-lex.c: Likewise.
      	* collect2.c: Likewise.
      	* combine.c: Likewise.
      	* conflict.c: Likewise.
      	* cppfiles.c: Likewise.
      	* cppinit.c: Likewise.
      	* cpplex.c: Likewise.
      	* cpplib.c: Likewise.
      	* cppmacro.c: Likewise.
      	* cppspec.c: Likewise.
      	* c-pragma.c: Likewise.
      	* crtstuff.c: Likewise.
      	* cse.c: Likewise.
      	* cselib.c: Likewise.
      	* c-semantics.c: Likewise.
      	* c-typeck.c: Likewise.
      
      From-SVN: r44547
      ec5c56db
  25. Jul 29, 2001
    • Neil Booth's avatar
      cpphash.h (struct cpp_reader): Remove import_warning. · 09b82253
      Neil Booth authored
      	* cpphash.h (struct cpp_reader): Remove import_warning.
      	* cpplib.c (skip_rest_of_line): Don't bother turning off
      	macro expansion.
      	(parse_include): Move include handling to...
      	(do_include_common): ... here.  Move import warning from...
      	(do_import): ... here.
      	(do_pragma_poison): Don't do a callback for poison identifiers.
      	* cpplib.h (struct cpp_callbacks): Don't do poison callbacks.
      	* cppmain.c (setup_callbacks): Similarly.
      
      From-SVN: r44466
      09b82253
    • Neil Booth's avatar
      cppexp.c (parse_defined): Always record the macro name. · 6d18adbc
      Neil Booth authored
      	* cppexp.c (parse_defined): Always record the macro name.
      	(lex): Don't worry about identifiers, or special-case
      	CPP_NOT here.
      	(_cpp_parse_expr): Figure out at the end of the routine
      	whether we saw a valid !defined() expression.
      	* cppfiles.c (stack_include_file): Update for mi_valid.
      	(_cpp_pop_file_buffer): Similarly.
      	* cpplex.c (_cpp_lex_token): Similarly.
      	* cpphash.h (enum mi_state, enum mi_ind, mi_state,
      	mi_if_not_defined, mi_lexed): Remove.
      	(mi_valid): New.
      	* cpplib.c (do_if): Simplify.
      	(do_endif, push_conditional, _cpp_handle_directive): Update
      	for renaming of mi_state to mi_valid.
      
      	* cpp.texi: Add index entries for digraphs, and add comment
      	that C++ refers to them as alternative tokens.
      
      From-SVN: r44459
      6d18adbc
  26. Jul 26, 2001
    • Neil Booth's avatar
      cpphash.h (struct_lexer_state): Delete was_skipping. · cef0d199
      Neil Booth authored
      	* cpphash.h (struct_lexer_state): Delete was_skipping.
      	Move skipping here from struct cpp_reader.
      	* cpplex.c (parse_identifier): Update.
      	(_cpp_lex_token): Don't skip tokens in a directive.
      	* cpplib.c (struct if_stack): Update.
      	(start_directive, end_directive): Don't change skipping state.
      	(_cpp_handle_directive): Update.
      	(do_ifdef, do_ifndef, do_if, do_elif): Similarly.
      	(do_else, do_endif): Update; only check for excess tokens if not
      	in a skipped conditional block.
      	(push_conditional): Update for new struct if_stack.
      
      	* gcc.dg/cpp/extratokens.c: Fix.
      	* gcc.dg/cpp/skipping2.c: New tests.
      
      From-SVN: r44380
      cef0d199
  27. Jul 01, 2001
    • Zack Weinberg's avatar
      c-common.h (enum rid): Add RID_FIRST_AT, RID_LAST_AT, RID_LAST_PQ. · b8363a24
      Zack Weinberg authored
      	* c-common.h (enum rid): Add RID_FIRST_AT, RID_LAST_AT,
      	RID_LAST_PQ.  Move RID_FIRST_PQ down with the other FIRST/LAST
      	enumerators.
      	(OBJC_IS_AT_KEYWORD, OBJC_IS_PQ_KEYWORD): New macros.
      
      	* c-parse.in (OBJC_STRING): Kill.
      	(objc_string): Decompose to [objc_string] '@' STRING.
      	(reswords): Take the leading '@' off all the Objective C keywords.
      	(objc_rid_sans_at): Kill.
      	(init_reswords): Don't initialize it.
      	(yylexname): Use OBJC_IS_AT_KEYWORD and OBJC_IS_PQ_KEYWORD.
      	(_yylex): Kill reconsider label.  Look ahead one token after
      	an '@'; if we get an identifier, check whether it's an
      	Objective C @-keyword.  If so, return the keyword.  Otherwise,
      	put back the token and return the '@' as a terminal.
      
      	* cpplib.c (lex_macro_node): Remove unnecessary check for
      	leading '@' on identifier.  Clarify control flow and commentary.
      
      From-SVN: r43674
      b8363a24
  28. May 27, 2001
  29. May 20, 2001
    • Neil Booth's avatar
      Makefile.in (OBJS, [...]): Update. · 2a967f3d
      Neil Booth authored
      	* Makefile.in (OBJS, LIBCPP_OBJS, LIBCPP_DEPS,
      	cpplib.o, cpphash.o, fix-header): Update.
      	(hashtable.o): New target.
      	* c-common.h: Include cpplib.h.  Define C_RID_CODE and
      	struct c_common_identifier here.
      	* c-lang.c (c_init_options): Update.  Call set_identifier_size.
      	* c-lex.c (c_lex): Update.
      	* c-pragma.h: Update.
      	* c-tree.h (struct lang_identifier): Contain c_common_identifier.
      	Delete rid_code.
      	(C_RID_CODE): Delete.
      	* cpphash.c: Rewrite to use hashtable.c.
      	* cpphash.h: Update include guards.
      	(struct cpp_reader): Remove hashtab.
      	hash_ob and buffer_ob are no longer pointers.  Add hash_table
      	and our_hashtable.
      	(HASHSTEP, _cpp_init_hashtable,	_cpp_lookup_with_hash): Delete.
      	(_cpp_cleanup_hashtable): Rename _cpp_destroy_hashtable.
      	(_cpp_cleanup_stacks): Rename _cpp_init_directives.
      	* cppinit.c (cpp_create_reader): Update.
      	* cpplex.c (cpp_ideq, parse_identifier, cpp_output_token): Update.
      	(cpp_interpret_charconst): Eliminate warning.
      	* cpplib.c (do_pragma, do_endif, push_conditional,
      	cpp_push_buffer, cpp_pop_buffer): Update.
      	(_cpp_init_stacks): Rename cpp_init_directives.
      	(_cpp_cleanup_stacks): Remove.
      	* cpplib.h: Update include guards.  Include tree-core.h and c-rid.h.
      	(cpp_hashnode, cpp_token, NODE_LEN, NODE_NAME,
      	 cpp_forall_identifiers, cpp_create_reader): Update.
      	(C_RID_CODE, cpp_make_node): New.
      	(c_common_identifier): New identifier node for C front ends.
      	* cppmain.c (main): Update.
      	* fix-header.c (read_scan_file): Update.
      	* flags.h (id_clash_len): Make unsigned.
      	* ggc.h (ggc_mark_nonnull_tree): New.
      	* hashtable.c: New.
      	* hashtable.h: New.
      	* stringpool.c: Update comments and copyright.  Update to use
      	hashtable.c.
      	* toplev.c (approx_sqrt): Move to hashtable.c.
      	(id_clash_len): Make unsigned.
      	* toplev.h (ident_hash): New.
      	* tree.c (gcc_obstack_init): Move to hashtable.c.
      	* tree.h: Include hashtable.h.
      	(IDENTIFIER_POINTER, IDENTIFIER_LENGTH): Update.
      	(GCC_IDENT_TO_HT_IDENT, HT_IDENT_TO_GCC_IDENT): New.
      	(struct tree_identifier): Update.
      	(make_identifier): New.
      cp:
      	* cp-tree.h (struct lang_identifier, C_RID_YYCODE): Update.
      	(C_RID_CODE): Remove.
      	* lex.c (cxx_init_options): Call set_identifier_size.  Update.
      	(init_parse): Don't do it here.
      objc:
      	* objc-act.c (objc_init_options): Call set_identifier_size. Update.
      
      From-SVN: r42334
      2a967f3d
  30. May 16, 2001
    • Neil Booth's avatar
      cppexp.c (lex): Use NODE_NAME and NODE_LEN. · a28c5035
      Neil Booth authored
      	* cppexp.c (lex): Use NODE_NAME and NODE_LEN.
      	* cpphash.c (_cpp_lookup_with_hash): Similarly.
      	* cpplex.c (cpp_ideq, parse_identifier, cpp_token_len,
      	cpp_spell_token, cpp_output_token): Similarly.
      	* cpplib.c (lex_macro_node, do_undef, do_pragma,
      	do_pragma_poison, parse_assertion, do_assert): Similarly.
      	* cppmacro.c (builtin_macro, parse_args, funlike_invocation_p,
      	save_parameter, _cpp_create_definition, check_trad_stringification,
      	cpp_macro_definition): Similarly.
      	* cppmain.c (cb_define, cb_undef, dump_macro): Similarly.
      	* c-lex.c (cb_undef, c_lex): Similarly.
      	* fix-header.c (recognized_function): Similarly.
      	* cpplib.h (NODE_LEN, NODE_NAME): New.
      	(cpp_hashnode): Rename length len.
      
      From-SVN: r42174
      a28c5035
  31. May 10, 2001
    • Zack Weinberg's avatar
      cppinit.c (cpp_post_options): Shut off macro expansion if -fpreprocessed. · 6d4587f7
      Zack Weinberg authored
      	* cppinit.c (cpp_post_options): Shut off macro expansion if
      	-fpreprocessed.
      	* cpplib.c (_cpp_handle_directive): If -fpreprocessed, accept
      	IN_I directives only if the # is in column 1 and the directive
      	name begins in column 2.
      	* cppmain.c (scan_buffer): Insert a space between # and an
      	identifier, when that identifier is a directive name.
      
      	* tradcpp.c (struct file_buf): Add a pointer to the next entry
      	in the header search path.
      	(enum node_type): Add T_INCLUDE_NEXT.
      	(directive_table): Add entry for include_next.
      	(do_include_next): New function.
      	(process_include): New routine, broken out of do_include.
      	(finclude): Insert 'nhd' argument, to be copied into
      	next_header_dir of the new buffer.
      	(main): Adjust to match.
      	* gsyslimits.h, limity.h: Un-indent #include_next.
      
      testsuite:
      	* gcc.dg/cpp/direct2.c: New test.
      	* gcc.dg/cpp/direct2s.c: New test.
      
      	* gcc.c-torture/execute/920730-1t.c: #undef __GNUC__ at head.
      
      From-SVN: r41932
      6d4587f7
Loading