Skip to content
Snippets Groups Projects
  1. Aug 22, 2010
    • Joseph Myers's avatar
      Makefile.in (gccspec.o, cppspec.o): Update dependencies. · d9d16a19
      Joseph Myers authored
      	* Makefile.in (gccspec.o, cppspec.o): Update dependencies.
      	* common.opt (L, nodefaultlibs, nostdlib, pg, static): New
      	options.
      	* config/avr/avr.h (LIBSTDCXX): Remove initial "-l".
      	* config/freebsd.h (MATH_LIBRARY_PROFILE): Remove initial "-l".
      	* config/i386/djgpp.h (LIBSTDCXX): Remove initial "-l".
      	* config/rs6000/aix.h (LIBSTDCXX_STATIC): Remove initial "-l".
      	* config/s390/tpf.h (MATH_LIBRARY, LIBSTDCXX): Remove initial
      	"-l".
      	* cppspec.c: Include opts.h.
      	(lang_specific_driver): Use cl_decoded_option structures.
      	* doc/tm.texi.in (MATH_LIBRARY): Update documentation.
      	* doc/tm.texi: Regenerate.
      	* gcc.c (translate_options): Translate -d to -foutput-class-dir=.
      	(driver_handle_option): Allow driver options needing no special
      	processing.
      	(process_command): Decode options before call to
      	lang_specific_driver.  Pass decoded options to
      	lang_specific_driver.
      	* gcc.h (lang_specific_driver): Update prototype.
      	* gccspec.c: Include opts.h.
      	(lang_specific_driver): Use cl_decoded_option structures.
      	* opts-common.c (option_ok_for_language, generate_option,
      	generate_option_input_file): New.
      	(decode_cmdline_option): Use option_ok_for_language.
      	(decode_cmdline_options_to_array): Use generate_option_input_file.
      	(handle_generated_option): Use generate_option.
      	* opts.h (generate_option, generate_option_input_file): Declare.
      
      cp:
      	* Make-lang.in (g++spec.o): Update dependencies.
      	* g++spec.c: Include opts.h
      	(MATH_LIBRARY, LIBSTDCXX): Remove initial "-l".
      	(lang_specific_driver): Use cl_decoded_option structures.
      
      fortran:
      	* Make-lang.in (gfortranspec.o): Update dependencies.
      	* gfortranspec.c: Include coretypes.h before gcc.h.  Include
      	opts.h.
      	(MATH_LIBRARY, FORTRAN_LIBRARY): Remove initial "-l".
      	(ADD_ARG_LIBGFORTRAN, Option, lookup_option): Remove.
      	(g77_xargc): Make unsigned.
      	(g77_xargv): Change to g77_x_decoded_options.
      	(g77_newargc): Make unsigned.
      	(g77_newargv): Change to g77_new_decoded_options.
      	(strings_same, options_same): New.
      	(append_arg): Use cl_decoded_option structures.
      	(append_option): New.
      	(add_arg_libgfortran): New.
      	(lang_specific_driver): Use cl_decoded_option structures.
      
      java:
      	* Make-lang.in (jvspec.o): Update dependencies.
      	* jvspec.c: Include opts.h.
      	(PARAM_ARG): Remove.
      	(find_spec_file): Do not add leading -specs=.
      	(lang_specific_driver): Use cl_decoded_option structures.
      	* lang.opt (C, CLASSPATH, D, bootclasspath, classpath, encoding,
      	extdirs, fmain=, s-bc-abi): New options.
      
      From-SVN: r163459
      d9d16a19
  2. Jul 28, 2010
    • Joseph Myers's avatar
      darwin-driver.c (SWITCH_TAKES_ARG, [...]): Remove. · eea13ead
      Joseph Myers authored
      	* config/darwin-driver.c (SWITCH_TAKES_ARG,
      	WORD_SWITCH_TAKES_ARG): Remove.
      	* cppspec.c (SWITCH_TAKES_ARG, WORD_SWITCH_TAKES_ARG): Remove.
      	* defaults.h (DEFAULT_SWITCH_TAKES_ARG,
      	DEFAULT_WORD_SWITCH_TAKES_ARG): Move from gcc.h.
      	(SWITCH_TAKES_ARG, WORD_SWITCH_TAKES_ARG): Move default
      	definitions from gcc.c.
      	* gcc.c (SWITCH_TAKES_ARG, WORD_SWITCH_TAKES_ARG): Move to
      	defaults.h.
      	* gcc.h (DEFAULT_SWITCH_TAKES_ARG, DEFAULT_WORD_SWITCH_TAKES_ARG):
      	Move to defaults.h.
      	* opts-common.c: Include tm.h.
      	(decode_cmdline_option): Use SWITCH_TAKES_ARG and
      	WORD_SWITCH_TAKES_ARG to count arguments to unknown options.
      	Handle more than one argument.  Set canonical_option_num_elements.
      	(decode_cmdline_options_to_array): Set
      	canonical_option_num_elements and trailing elements of
      	canonical_option.
      	* opts.h (struct cl_decoded_option): Allow four elements in
      	canonical_option.  Add field canonical_option_num_elements.
      	* Makefile.in (opts-common.o): Update dependencies.
      
      ada:
      	* gcc-interface/misc.c (gnat_init_options): Ignore erroneous
      	options.  Check canonical_option_num_elements on options copied.
      
      fortran:
      	* gfortranspec.c (SWITCH_TAKES_ARG, WORD_SWITCH_TAKES_ARG):
      	Remove.
      
      From-SVN: r162620
      eea13ead
  3. Jun 04, 2010
    • Joseph Myers's avatar
      darwin-driver.c (darwin_default_min_version): Use · bdc6b402
      Joseph Myers authored
      	* config/darwin-driver.c (darwin_default_min_version): Use
      	* GCC-specific formats in diagnostics.
      	* cppspec.c (lang_specific_driver): Use GCC-specific formats in
      	diagnostics.
      	* gcc.c (translate_options, read_specs, add_sysrooted_prefix,
      	execute, process_command, end_going_arg, do_self_spec, do_spec_1,
      	eval_spec_function, handle_braces, process_brace_body, main,
      	perror_with_name, used_arg, set_multilib_dir, print_multilib_info,
      	getenv_spec_function, compare_version_strings,
      	version_compare_spec_function): Use GCC-specific formats in
      	diagnostics.
      
      cp:
      	* g++spec.c (lang_specific_driver): Use GCC-specific formats in
      	diagnostics.
      
      fortran:
      	* gfortranspec.c (append_arg, lang_specific_driver): Use
      	GCC-specific formats in diagnostics.
      
      java:
      	* jvspec.c (lang_specific_driver): Use GCC-specific formats in
      	diagnostics.
      
      From-SVN: r160292
      bdc6b402
  4. May 28, 2010
    • Joseph Myers's avatar
      re PR driver/15303 (When gcc sees an unrecognized option, the exit status indicates success) · 2dec80c7
      Joseph Myers authored
      	PR driver/15303
      	* gcc.c (inform, warning, inform): New functions.
      	(fatal_ice): Rename to internal_error; change cmsgid parameter to
      	gmsgid.  All callers changed.
      	(notice): Rename to fnotice; add parameter fp.  All callers
      	changed.
      	(fatal_error): Rename to fatal_signal.  All users changed.
      	(fatal): Rename to fatal_error; change cmsgid parameter to
      	gmsgid.  All callers changed.
      	(process_command): Use warning instead of error for warnings.
      	(end_going_arg): Don't use _() around argument of error.
      	(do_spec_1): Use inform for message from %n specs.  Use warning
      	instead of error for warnings.
      	(main): Use inform for comparison messages.  Use warning for
      	message about unused linker input.
      	(error): Increment error_count.  Print "error: ".
      	* gcc.h (fatal): Change to fatal_error.
      	(warning): Declare.
      	* config/darwin-driver.c (darwin_default_min_version): Use warning
      	instead of fprintf for warnings.
      	* cppspec.c (lang_specific_driver): Use fatal_error instead of
      	fatal.
      
      cp:
      	* g++spec.c (lang_specific_driver): Use fatal_error instead of
      	fatal.
      
      fortran:
      	* gfortranspec.c (append_arg, lang_specific_driver): Use
      	fatal_error instead of fatal.  Use warning instead of fprintf for
      	warnings.
      
      java:
      	* jvspec.c (lang_specific_driver): Use fatal_error instead of
      	fatal.  Use warning instead of error for warnings.
      
      From-SVN: r159986
      2dec80c7
  5. Sep 09, 2007
  6. Jul 26, 2007
  7. Jan 31, 2006
    • Marcin Dalecki's avatar
      tree-vrp.c: Use XNEW/XCNEW allocation wrappers. · 5ed6ace5
      Marcin Dalecki authored
      2006-01-31  Marcin Dalecki  <martin@dalecki.de>
      
      	* tree-vrp.c: Use XNEW/XCNEW allocation wrappers.
      	* regrename.c: Ditto.
      	* tree-ssa-loop-im.c: Ditto.
      	* tree-dump.c: Ditto.
      	* tree-complex.c: Ditto.
      	* genrecog.c: Ditto.
      	* tree-ssa-threadupdate.c: Ditto.
      	* tracer.c: Ditto.
      	* java/class.c: Ditto.
      	* java/jcf-parse.c: Ditto.
      	* java/resource.c: Ditto.
      	* java/except.c: Ditto.
      	* java/jvspec.c: Ditto.
      	* java/jcf-write.c: Ditto.
      	* java/jcf-path.c: Ditto.
      	* java/gjavah.c: Ditto.
      	* java/zextract.c: Ditto.
      	* java/jcf-io.c: Ditto.
      	* java/jcf.h: Ditto.
      	* java/buffer.c: Ditto.
      	* java/lang.c: Ditto.
      	* java/parse-scan.y: Ditto.
      	* java/lex.c: Ditto.
      	* java/lex.h: Ditto.
      	* cfgloopmanip.c: Ditto.
      	* postreload-gcse.c: Ditto.
      	* tree-ssa-loop-manip.c: Ditto.
      	* postreload.c: Ditto.
      	* tree-ssa-loop-ch.c: Ditto.
      	* loop.c: Ditto.
      	* ipa-cp.c: Ditto.
      	* cppspec.c: Ditto.
      	* diagnostic.c: Ditto.
      	* final.c: Ditto.
      	* genoutput.c: Ditto.
      	* gcc.c: Ditto.
      	* cfghooks.c: Ditto.
      	* cfgloopanal.c: Ditto.
      	* objc/objc-act.c: Ditto.
      	* gcov.c: Ditto.
      	* genextract.c: Ditto.
      	* genautomata.c: Ditto.
      	* pretty-print.c: Ditto.
      	* genemit.c: Ditto.
      	* cgraphunit.c: Ditto.
      	* flow.c: Ditto.
      	* df-scan.c: Ditto.
      	* haifa-sched.c: Ditto.
      	* dominance.c: Ditto.
      	* dbxout.c: Ditto.
      	* tree-ssa-loop-ivopts.c: Ditto.
      	* df-core.c: Ditto.
      	* mode-switching.c: Ditto.
      	* modulo-sched.c: Ditto.
      	* graph.c: Ditto.
      	* ipa-pure-const.c: Ditto.
      	* cse.c: Ditto.
      	* fix-header.c: Ditto.
      	* web.c: Ditto.
      	* tree-stdarg.c: Ditto.
      	* ipa-utils.c: Ditto.
      	* loop-init.c: Ditto.
      	* ipa-inline.c: Ditto.
      	* cfganal.c: Ditto.
      	* global.c: Ditto.
      	* alloc-pool.c: Ditto.
      	* dwarf2out.c: Ditto.
      	* opts.c: Ditto.
      	* genattrtab.c: Ditto.
      	* tree-ssa-loop-ivcanon.c: Ditto.
      	* predict.c: Ditto.
      	* timevar.c: Ditto.
      	* lcm.c: Ditto.
      	* fortran/gfortranspec.c: Ditto.
      	* regmove.c: Ditto.
      	* local-alloc.c: Ditto.
      	* langhooks.c: Ditto.
      	* function.c: Ditto.
      	* tree-vectorizer.c: Ditto.
      	* gcse.c: Ditto.
      	* ipa-type-escape.c: Ditto.
      	* alias.c: Ditto.
      	* tree-if-conv.c: Ditto.
      	* profile.c: Ditto.
      	* ipa.c: Ditto.
      	* tree-data-ref.c: Ditto.
      	* loop-unroll.c: Ditto.
      	* treelang/treetree.c: Ditto.
      	* calls.c: Ditto.
      	* bt-load.c: Ditto.
      	* ggc-common.c: Ditto.
      	* except.c: Ditto.
      	* coverage.c: Ditto.
      	* cselib.c: Ditto.
      	* tree-cfgcleanup.c: Ditto.
      	* tree-ssa-pre.c: Ditto.
      	* cfgcleanup.c: Ditto.
      	* loop-invariant.c: Ditto.
      	* loop-iv.c: Ditto.
      	* ipa-prop.c: Ditto.
      	* print-tree.c: Ditto.
      	* conflict.c: Ditto.
      	* ggc-page.c: Ditto.
      	* sched-deps.c: Ditto.
      	* regclass.c: Ditto.
      	* tree-object-size.c: Ditto.
      	* combine.c: Ditto.
      	* bb-reorder.c: Ditto.
      	* resource.c: Ditto.
      	* var-tracking.c: Ditto.
      	* cfgloop.c: Ditto.
      	* df-problems.c: Ditto.
      	* reg-stack.c: Ditto.
      	* tlink.c: Ditto.
      	* gccspec.c: Ditto.
      	* sched-rgn.c: Ditto.
      	* tree-ssa-structalias.c: Ditto.
      	* tree-ssa-reassoc.c: Ditto.
      	* config/darwin-c.c: Ditto.
      	* config/darwin.c: Ditto.
      	* config/arm/arm.c: Ditto.
      	* cfgrtl.c: Ditto.
      	* collect2.c: Ditto.
      	* reload1.c: Ditto.
      
      From-SVN: r110446
      5ed6ace5
  8. Jan 16, 2006
    • Rafael Espindola's avatar
      jvspec.c (lang_specific_spec_functions): remove · 4c360e1f
      Rafael Espindola authored
      * gcc/java/jvspec.c (lang_specific_spec_functions): remove
      * gcc/cppspec.c (lang_specific_spec_functions): remove
      * gcc/gcc.c (lookup_spec_function): use static_spec_functions directelly
      * gcc/gcc.h (lang_specific_spec_functions): remove
      * gcc/gccspec.c (lang_specific_spec_functions): remove
      * gcc/cp/g++spec.c (lang_specific_spec_functions): remove
      * gcc/fortran/gfortranspec.c (lang_specific_spec_functions): remove
      * gcc/treelang/spec.c (lang_specific_spec_functions): remove
      
      From-SVN: r109761
      4c360e1f
  9. Jun 25, 2005
  10. Jul 19, 2003
    • Kaveh R. Ghazi's avatar
      alias.c [...]: Remove unnecessary casts. · 703ad42b
      Kaveh R. Ghazi authored
      	* alias.c alloc-pool.c bitmap.c bitmap.h bt-load.c builtins.c
      	c-common.c c-decl.c c-incpath.c c-lex.c c-opts.c c-parse.in
      	c-pragma.c c-typeck.c calls.c cfg.c cfganal.c cfgloop.c cfgrtl.c
      	collect2.c combine.c conflict.c coverage.c cppexp.c cppfiles.c
      	cpphash.c cppinit.c cpplex.c cpplib.c cppmacro.c cppspec.c
      	cpptrad.c cse.c cselib.c dbxout.c defaults.h df.c dominance.c
      	dwarf2out.c dwarfout.c emit-rtl.c except.c expmed.c expr.c final.c
      	fix-header.c flow.c fold-const.c function.c gcc.c gccspec.c gcov.c
      	gcse.c genattr.c genattrtab.c genautomata.c genconditions.c
      	genemit.c genextract.c genoutput.c genrecog.c gensupport.c
      	ggc-page.c ggc-simple.c global.c graph.c haifa-sched.c hashtable.c
      	integrate.c jump.c langhooks.c lcm.c line-map.c local-alloc.c
      	loop.c mips-tdump.c mips-tfile.c mkdeps.c optabs.c params.c
      	postreload.c prefix.c print-tree.c protoize.c ra-build.c
      	ra-colorize.c ra-rewrite.c ra.c recog.c reg-stack.c regclass.c
      	regmove.c regrename.c reload.c reload1.c reorg.c resource.c
      	sbitmap.c sched-deps.c sched-rgn.c sched-vis.c sdbout.c
      	simplify-rtx.c ssa-ccp.c ssa.c stmt.c stor-layout.c timevar.c
      	tlink.c toplev.c tree-dump.c tree.c unroll.c unwind-dw2-fde.c
      	varasm.c varray.c vmsdbgout.c xcoffout.c: Remove unnecessary
      	casts.
      
      From-SVN: r69587
      703ad42b
  11. Jun 17, 2003
    • Zack Weinberg's avatar
      * cpplib.h, cpphash.h, cppcharset.c, cpperror.c, cppexp.c · 6cf87ca4
      Zack Weinberg authored
      	* cppfiles.c, cpphash.c, cppinit.c, cpplex.c, cpplib.c
      	* cppmacro.c, cpppch.c, cpptrad.c, cppspec.c: Convert to
      	ISO C: new-style function declarations, no need for PARAMS,
      	no special punctuation on indirect function calls, use string
      	constant concatenation where convenient.
      
      From-SVN: r68070
      6cf87ca4
  12. Mar 11, 2003
    • Neil Booth's avatar
      Makefile.in: Update. · cb60f38d
      Neil Booth authored
      	* Makefile.in: Update.
      	* c-common.c: Don't include real.h or except.h.
      	(REGISTER_PREFIX): Remove.
      	(builtin_define_std, builtin_define_with_value,
      	builtin_define_with_int_value, builtin_define_with_hex_fp_value,
      	builtin_define_type_max, builtin_define_type_precision,
      	builtin_define_float_constants): Move to c-cppbuiltin.c.
      	(c_stddef_cpp_builtins): New.
      	* c-common.h (builtin_define_with_value, c_stddef_cpp_builtins): New.
      	* c-cppbuiltin.c: New, extracted from c-common.c.
      	(define__GNUC__): New.
      	* cppspec.c (lang_specific_driver): Remove support of -no-gcc.
      	* gcc.c: Remove support of %v1, %v2 and %v3 specs.
      	(cpp_unique_options): Don't support no-gcc.
      	(do_spec_1): Remove support of version specs.
      	* doc/invoke.texi: Remove documentation of %v1, %v2 and %v3.
      	* doc/passes.texi: Update.
      	* doc/tm.texi: Update.
      cp:
      	* Make-lang.in (CXX_C_OBJS): Update.
      	* lang-specs.h: Don't define __GNUG__ here.
      
      From-SVN: r64162
      cb60f38d
  13. Mar 10, 2003
    • Devang Patel's avatar
      gcc.c (DEFAULT_SWITCH_TAKES_ARG): Remove. · 87d7d780
      Devang Patel authored
      PR/9394
              * gcc.c (DEFAULT_SWITCH_TAKES_ARG): Remove.
              (DEFAULT_WORD_SWITCH_TAKES_ARG): Remove.
              * gcc.h (DEFAULT_SWITCH_TAKES_ARG): Add.
              (DEFAULT_WORD_SWITCH_TAKES_ARG): Add.
              * cppspec.c (DEFAULT_SWTICH_TAKES_ARG): Remove.
              (DEFAULT_WORD_SWITCH_TAKES_ARG): Remove.
      
      cp
              * g++spec.c (lang_specific_driver): Use DEFAULT_WORD_SWITCH_TAKES_ARG.
      
      testsuite
      
              * g++.dg/cpp/c++_cmd_1.C: New test.
              * g++.dg/cpp/c++_cmd_1.h: New file.
      
      From-SVN: r64144
      87d7d780
  14. Dec 16, 2002
  15. Nov 19, 2002
    • Jason Thorpe's avatar
      gcc.c (The Specs Language): Document spec functions. · f3226a90
      Jason Thorpe authored
      * gcc.c (The Specs Language): Document spec functions.
      (static_spec_functions, lookup_spec_function)
      (eval_spec_function, handle_spec_function)
      (if_exists_spec_function, alloc_args): New.
      (execute): Abort if processing_spec_function is true.
      (do_spec_1): Hand off spec to handle_spec_function if %:
      is encountered.  If processing_spec_function is true,
      end any pending argument when the end of the string is reached.
      (main): Use alloc_args to allocate the initial argument vector.
      * gcc.h (struct spec_function): New.
      (lang_specific_spec_functions): New extern.
      
      * config/netbsd-elf.h (STARTFILE_SPEC): Add if-exists(crti%O%s).
      (ENDFILE_SPEC): Add if-exists(crtn%O%s).
      * config/alpha/netbsd.h (ENDFILE_SPEC): Likewise.
      
      * doc/invoke.texi: Document spec functions.
      
      * cppspec.c (lang_specific_spec_functions): New.
      * gccspec.c: Likewise.
      
      * g++spec.c (lang_specific_spec_functions): New.
      
      * g77spec.c (lang_specific_spec_functions): New.
      
      * jvspec.c (lang_specific_spec_functions): New.
      
      From-SVN: r59241
      f3226a90
  16. May 22, 2002
    • Kazu Hirata's avatar
      cpperror.c: Fix formatting. · df383483
      Kazu Hirata authored
      	* cpperror.c: Fix formatting.
      	* cppexp.c: Likewise.
      	* cppfiles.c: Likewise.
      	* cpphash.c: Likewise.
      	* cpphash.h: Likewise.
      	* cppinit.c: Likewise.
      	* cpplex.c: Likewise.
      	* cpplib.c: Likewise.
      	* cppmacro.c: Likewise.
      	* cppmain.c: Likewise.
      	* cppspec.c: Likewise.
      
      From-SVN: r53751
      df383483
  17. Dec 04, 2001
  18. Aug 22, 2001
    • Lars Brinkhoff's avatar
      Makefile.in, [...]: replace "GNU CC" with "GCC". · 1322177d
      Lars Brinkhoff authored
      	* Makefile.in, alias.c, basic-block.h, bb-reorder.c, bitmap.c,
      	bitmap.h, builtin-types.def, builtins.c, builtins.def,
      	c-aux-info.c, c-common.c, c-common.def, c-common.h,
      	c-convert.c, c-decl.c, c-dump.c, c-dump.h, c-errors.c,
      	c-format.c, c-lang.c, c-lex.c, c-lex.h, c-parse.in,
      	c-pragma.c, c-pragma.h, c-semantics.c, c-tree.h, c-typeck.c,
      	caller-save.c, calls.c, collect2.c, collect2.h, combine.c,
      	conditions.h, config.gcc, configure.frag, configure.in,
      	conflict.c, convert.c, convert.h, cppspec.c, crtstuff.c,
      	cse.c, cselib.c, cselib.h, dbxout.c, dbxout.h, defaults.h,
      	dependence.c, df.c, df.h, diagnostic.c, diagnostic.h,
      	doloop.c, dominance.c, dwarf.h, dwarf2.h, dwarf2asm.c,
      	dwarf2asm.h, dwarf2out.c, dwarf2out.h, dwarfout.c,
      	emit-rtl.c, errors.c, errors.h, except.c, except.h,
      	exgettext, explow.c, expmed.c, expr.c, expr.h, final.c,
      	fixproto, flags.h, flow.c, fold-const.c, fp-test.c,
      	function.c, function.h, gbl-ctors.h, gcc.c, gcc.h, gcc.hlp,
      	gccspec.c, gcov-io.h, gcse.c, genattr.c, genattrtab.c,
      	gencheck.c, gencodes.c, genconfig.c, genemit.c,
      	genextract.c, genflags.c, gengenrtl.c, genmultilib,
      	genopinit.c, genoutput.c, genpeep.c, genrecog.c,
      	gensupport.c, gensupport.h, ggc-callbacks.c, ggc-common.c,
      	ggc-none.c, ggc-page.c, ggc-simple.c, ggc.h, global.c,
      	graph.c, graph.h, gthr-aix.h, gthr-dce.h, gthr-posix.h,
      	gthr-rtems.h, gthr-single.h, gthr-solaris.h, gthr-vxworks.h,
      	gthr-win32.h, gthr.h, haifa-sched.c, halfpic.c, halfpic.h,
      	hard-reg-set.h, hwint.h, ifcvt.c, input.h, insn-addr.h,
      	integrate.c, integrate.h, jump.c, lcm.c, libgcc2.c,
      	libgcc2.h, lists.c, local-alloc.c, loop.c, loop.h,
      	machmode.def, machmode.h, main.c, mbchar.c, mbchar.h,
      	mips-tdump.c, mips-tfile.c, mklibgcc.in, mkmap-flat.awk,
      	mkmap-symver.awk, optabs.c, output.h, params.c, params.def,
      	params.h, predict.c, predict.def, predict.h, prefix.c,
      	prefix.h, print-rtl.c, print-tree.c, profile.c, protoize.c,
      	read-rtl.c, real.c, real.h, recog.c, recog.h, reg-stack.c,
      	regclass.c, regmove.c, regrename.c, regs.h, reload.c,
      	reload.h, reload1.c, reorg.c, resource.c, resource.h, rtl.c,
      	rtl.def, rtl.h, rtlanal.c, sbitmap.c, sbitmap.h,
      	sched-deps.c, sched-ebb.c, sched-int.h, sched-rgn.c,
      	sched-vis.c, sdbout.c, sdbout.h, sibcall.c, simplify-rtx.c,
      	ssa-ccp.c, ssa-dce.c, ssa.c, ssa.h, stmt.c, stor-layout.c,
      	stringpool.c, system.h, timevar.c, timevar.def, timevar.h,
      	tlink.c, toplev.c, toplev.h, tree.c, tree.def, tree.h,
      	tsystem.h, unroll.c, unwind-dw2-fde.c, unwind-dw2-fde.h,
      	unwind-dw2.c, unwind-pe.h, unwind-sjlj.c, unwind.h,
      	unwind.inc, varasm.c, varray.c, varray.h, xcoffout.c,
      	xcoffout.h: replace "GNU CC" with "GCC".
      
      From-SVN: r45105
      1322177d
  19. 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
  20. Jan 11, 2001
  21. Oct 20, 2000
  22. Aug 02, 2000
    • Zack Weinberg's avatar
      gcc.h (lang_specific_driver): Constify second argument. · 37620334
      Zack Weinberg authored
      	* gcc.h (lang_specific_driver): Constify second argument.
      	* gcc.c (translate_options, process_command, main): Likewise.
      	Constify variables to match.  Cast second argument to
      	pexecute.
      
      	* cppspec.c, gccspec.c, g++spec.c, g77spec.c, jvspec.c: Adjust
      	type of second argument to lang_specific_driver, and update
      	code as necessary.
      
      From-SVN: r35433
      37620334
    • Zack Weinberg's avatar
      cppexp.c, [...]: Do not use 'legal' or 'illegal' in error messages and comments. · 5ef865d5
      Zack Weinberg authored
      	* cppexp.c, cppinit.c, cpplex.c, cpplib.c, cppmacro.c,
      	cppspec.c: Do not use 'legal' or 'illegal' in error messages
      	and comments.
      
      	* cppmain.c (cb_define, cb_undef): Don't generate any output
      	if not done_initializing.
      	* cpplex.c (maybe_paste_with_next): When the token after a ##
      	is an omitted rest argument, only delete the token before it
      	if that token is a comma.  Do not warn about bogus token
      	pastes for , ## rest_arg.
      
      	* cpp.texi: Update.
      	* cpp.1: Regenerate.
      
      	* gcc.dg/cpp/macsyntx.c: Fix error regexp.
      
      From-SVN: r35421
      5ef865d5
  23. Jul 04, 2000
  24. Sep 13, 1999
    • Kaveh Ghazi's avatar
      Fix typo in last change. · 4c3d3ad8
      Kaveh Ghazi authored
      From-SVN: r29368
      4c3d3ad8
    • Kaveh R. Ghazi's avatar
      Makefile.in (gcc.o, [...]): Depend on gcc.h. · 9257393c
      Kaveh R. Ghazi authored
      	* Makefile.in (gcc.o, gccspec.o, cppspec.o): Depend on gcc.h.
      
      	* gcc.h: New file.
      	(lang_specific_driver): Don't take a function pointer parameter.
      	All callers changed.
      
      	* gcc.c: Include gcc.h.
      	(do_spec, fancy_abort,lang_specific_driver,lang_specific_pre_link,
      	lang_specific_extra_outfiles, fatal): Don't declare.
      	(multilib_defaults_raw): Constify.
      	(read_specs): Call memset, rather than bzero.
      	(main): Call return, not exit.
      	(lookup_compiler): Call memcpy, not bcopy.
      	(fatal): Make extern.
      
      	* cppspec.c: Include gcc.h.
      	(lang_specific_driver): Initialize variable `quote'.  Constify a
      	char*.  All calls to the function pointer parameter now
      	explicitly call `fatal'.
      
      	* gccspec.c (lang_specific_driver): Include gcc.h.
      
      cp:
      
      	* Make-lang.in (g++spec.o): Depend on system.h and gcc.h.
      
      	* g++spec.c: Include gcc.h.
      	(lang_specific_driver): Constify a char*.  Call xcalloc, not
       	xmalloc/bzero.  All calls to the function pointer parameter now
       	explicitly call `fatal'.
      
      f:
      
      	* Make-lang.in (g77spec.o): Depend on system.h and gcc.h.
      
      	* g77spec.c: Include gcc.h.
      	(g77_xargv): Constify.
      	(g77_fn): Add parameter prototypes.
      	(lookup_option, append_arg): Add static prototypes.
      	(g77_newargv): Constify.
      	(lookup_option, append_arg, lang_specific_driver): Constify a char*.
      	(lang_specific_driver): All calls to the function pointer
       	parameter now explicitly call `fatal'.
      
      java:
      
      	* Make-lang.in (jvspec.o): Depend on system.h and gcc.h.
      
      	* jvspec.c: Include gcc.h.  Don't include gansidecl.h.
      	(do_spec, lang_specific_pre_link, lang_specific_driver,
      	input_filename, input_filename_length): Don't declare.
      	(main_class_name, jvgenmain_spec, lang_specific_driver):
      	Constify a char*.
      	(lang_specific_driver): All calls to the function pointer
      	parameter now explicitly call `fatal'.
      
      From-SVN: r29367
      9257393c
  25. Aug 24, 1999
  26. Jun 07, 1999
    • Dave Brolley's avatar
      cpplib.c (do_define): Cast `alloca' return value. · e7553be5
      Dave Brolley authored
      Mon Jun  7 13:33:39 1999  Dave Brolley  <brolley@cygnus.com>
      	* cpplib.c (do_define): Cast `alloca' return value.
      	(do_include, do_undef, do_pragma): Likewise.
      	* cpphash.c (dump_definition): Cast `xstrdup' and `alloca' return
       	values.
      	* cppfiles.c (initialize_input_buffer): Cast `xmalloc' return values.
      	* gcc/cppspec.c (lang_specific_driver): Cast xmalloc return value.
      
      From-SVN: r27391
      e7553be5
  27. May 17, 1999
    • Zack Weinberg's avatar
      cppspec.c: Insert -no-gcc into command line unless -gcc was given by user. · eeb183e9
      Zack Weinberg authored
              * cppspec.c: Insert -no-gcc into command line unless -gcc was
              given by user.
              * gcc.c (default_compilers): Define __GNUC__ and
              __GNUC_MINOR__ only if -no-gcc was not given.
              * objc/lang-specs.h: Likewise.
              * cpp.texi: Document -x and -std options; explain that -lang
              is no longer supported.  Minor related corrections.
      
      From-SVN: r26990
      eeb183e9
  28. May 10, 1999
    • Dave Brolley's avatar
      cppspec.c: Treat two non-option arguments as input and output file. · 54ff00f6
      Dave Brolley authored
      1999-05-10 18:21 -0400  Zack Weinberg  <zack@rabi.phys.columbia.edu>
      	* cppspec.c: Treat two non-option arguments as input and
      	output file.  Three or more non-option args is an error.
      	Clean up.
      	* gcc.c (default_compilers): Pass -$ to the preprocessor.
      	* cp/lang-specs.h,ch/lang-specs.h,f/lang-specs.h,
      	objc/lang-specs.h: Likewise.
      
      From-SVN: r26870
      54ff00f6
  29. Apr 06, 1999
    • Zack Weinberg's avatar
      cppexp.c (parse_charconst): Initialize c. · 099a9dd0
      Zack Weinberg authored
      1999-04-06 12:56 -0400  Zack Weinberg  <zack@rabi.columbia.edu>
      	* cppexp.c (parse_charconst): Initialize c.
      	(cpp_parse_expr): Initialize rprio.
      	* cppfiles.c (merge_include_chains): Initialize prev.
      	(finclude) Set fp->line_base to fp->buf before returning.
      	* cpphash.c (macroexpand): Initialize token.
      	* cppspec.c (lang_specific_driver): Change suff to
      	const char *const *.
      
      From-SVN: r26213
      099a9dd0
  30. Mar 26, 1999
    • Zack Weinberg's avatar
      Makefile.in (xcpp, cppspec.o): New targets. · 922cf99e
      Zack Weinberg authored
              * Makefile.in (xcpp, cppspec.o): New targets.
              (CPP_INSTALL_NAME): New macro.
              (install-cpp): Install xcpp.  Use CPP_INSTALL_NAME.
              (all.build, start.encap): Build xcpp.
              * cppspec.c: New file, implements argument filtering for a
              user-visible C preprocessor.
              * cpp.sh: Removed.
      
      From-SVN: r26007
      922cf99e
Loading