Skip to content
Snippets Groups Projects
  1. Jan 15, 2007
    • Andreas Tobler's avatar
      os_dep.c (defined(MPROTECT_VDB) && defined(DARWIN)): Adjust mail reference. · 52bdc531
      Andreas Tobler authored
      2007-01-15  Andreas Tobler  <a.tobler@schweiz.org>
      
      	* os_dep.c (defined(MPROTECT_VDB) && defined(DARWIN)): Adjust mail
      	reference.
      	(catch_exception_raise): Fix typo in the I386 exc_state.
      
      From-SVN: r120801
      52bdc531
    • Thomas Koenig's avatar
      string_0xfe_0xff_1.f90: Use char instead of achar for 0xff to avoid the "Extended ASCII not... · bc31cbf4
      Thomas Koenig authored
      2007-01-15  Thomas Koenig  <Thomas.Koenig@online.de>
      
             * gfortran.dg/string_0xfe_0xff_1.f90:  Use char instead
             of achar for 0xff to avoid the "Extended ASCII not
             implemented" error message.
      
      From-SVN: r120800
      bc31cbf4
    • Paolo Carlini's avatar
      valarray (valarray<>::cshift): Fix typo. · 226d4e94
      Paolo Carlini authored
      2007-01-15  Paolo Carlini  <pcarlini@suse.de>
      
      	* include/std/valarray (valarray<>::cshift): Fix typo.
      
      From-SVN: r120798
      226d4e94
    • Jan Hubicka's avatar
      tree-ssa-dce.c (DCE_TODOs): New. · 7665f023
      Jan Hubicka authored
      	* tree-ssa-dce.c (DCE_TODOs): New.
      	(propagate_necessity): Return if something changed.
      	(eliminate_unnecessary_stmts): Likewise.
      	(perform_tree_ssa_dce): Return TODO flags when needed.
      	(pass_dce, pass_dce_loop, pass_cd_dce): Remove TODO flags.
      
      From-SVN: r120797
      7665f023
    • Gary Benson's avatar
      MappedByteBuffer.java: Removed. · 0122c9e7
      Gary Benson authored
      2007-01-15  Gary Benson  <gbenson@redhat.com>
      
      	* java/nio/MappedByteBuffer.java: Removed.
      	* sources.am, Makefile.in: Rebuilt.
      
      From-SVN: r120793
      0122c9e7
    • Uros Bizjak's avatar
      i386.md (fyl2xxf3_i387): Rename from fyl2x_xf3. · 0ac45694
      Uros Bizjak authored
      	* config/i386/i386.md (fyl2xxf3_i387): Rename from fyl2x_xf3.
      	(fyl2x_extend<mode>xf3_i387): New insn pattern.
      	(log<mode>2): Rename from logsf2 and logdf2 and macroize insn
      	insn patterns using X87MODEF12 mode macro.  Extend operand 1
      	to XFmode. Use SSE_FLOAT_MODE_P to disable patterns for SSE math.
      	(log10<mode>2): Ditto.
      	(log2<mode>2): Ditto.
      	(log1p<mode>2): Ditto.
      	(logb<mode>2): Ditto.
      	(fyl2xp1xf3_i387): Rename from fyl2xp1_xf3.
      	(fyl2xp1_extend<mode>xf3_i387): New insn pattern.
      	(*fxtractxf3_i387): Rename from *fxtractxf3.
      	(fxtract_extend<mode>xf3_i387): New insn pattern.
      	(ilogbsi2): Use match_dup 3, not match_operand:XF 3.
      
      	* config/i386/i386.c (ix86_emit_i387_log1p): Use gen_fyl2xp1xf3_i387()
      	and gen_fyl2xxf3_i387().
      
      From-SVN: r120792
      0ac45694
    • Gary Benson's avatar
      URLClassLoader.java: Removed. · a5c0f6fe
      Gary Benson authored
      2007-01-15  Gary Benson  <gbenson@redhat.com>
      
      	* java/net/URLClassLoader.java: Removed.
      	* gnu/java/net/loader/Load_gcjlib.java: New file.
      	* gnu/gcj/runtime/BootClassLoader.java: Ensure core
      	URL handler is present in static executables.
      	* sources.am, Makefile.in: Rebuilt.
      
      From-SVN: r120791
      a5c0f6fe
    • Paul Thomas's avatar
      re PR fortran/28172 ([4.2 and 4.1 only] alternate return in contained procedure segfaults) · 9ebe2d22
      Paul Thomas authored
      2007-01-15  Paul Thomas  <pault@gcc.gnu.org>
      
      	PR fortran/28172
      	* trans-stmt.c (gfc_trans_call): If it does not have one, get
      	a backend_decl for an alternate return.
      
      	PR fortran/29389
      	* resolve.c (pure_function): Statement functions are pure. Note
      	that this will have to recurse to comply fully with F95.
      
      	PR fortran/29712
      	* resolve.c (resolve_function): Only a reference to the final
      	dimension of an assumed size array is an error in an inquiry
      	function.
      
      	PR fortran/30283
      	* resolve.c (resolve_function): Make sure that the function
      	expression has a type.
      
      2007-01-15  Paul Thomas  <pault@gcc.gnu.org>
      
      	PR fortran/28172
      	* gfortran.dg/altreturn_4.f90: New test.
      
      	PR fortran/29389
      	* gfortran.dg/stfunc_4.f90: New test.
      
      	PR fortran/29712
      	* gfortran.dg/bound_2.f90: Reinstate commented out line.
      	* gfortran.dg/initialization_1.f90: Change warning.
      
      	PR fortran/30283
      	* gfortran.dg/specification_type_resolution_2.f90: New test.
      
      From-SVN: r120790
      9ebe2d22
    • GCC Administrator's avatar
      Daily bump. · 32d6b8ae
      GCC Administrator authored
      From-SVN: r120788
      32d6b8ae
  2. Jan 14, 2007
    • Daniel Franke's avatar
      libgomp.texi: Document implementation specific default values of environment variables. · 7c2b7f45
      Daniel Franke authored
      2007-01-14  Daniel Franke  <franke.daniel@gmail.com>
      
              * libgomp.texi: Document implementation specific default values of
              environment variables.
      
      From-SVN: r120783
      7c2b7f45
    • Zdenek Dvorak's avatar
      loop-unswitch.c (unswitch_loop): Do not call fix_loop_placement. · b4c1c7e3
      Zdenek Dvorak authored
      	* loop-unswitch.c (unswitch_loop): Do not call fix_loop_placement.
      	* cfgloopmanip.c (fix_loop_placement): Made static.  Use
      	get_loop_exit_edges.  Changed return type to bool.
      	* cfgloop.h (fix_loop_placement): Declaration removed.
      
      From-SVN: r120782
      b4c1c7e3
    • Jan Hubicka's avatar
      * gcc.dg/tree-prof/stringop-1.c: Update pattern for memcpy folding. · cd9ae11c
      Jan Hubicka authored
      From-SVN: r120781
      cd9ae11c
    • Jan Hubicka's avatar
      vrp11.c: Fix thinkos in my last patch. · fb3c516f
      Jan Hubicka authored
      	* gcc.dg/tree-ssa/vrp11.c: Fix thinkos in my last patch.
      	* gcc.dg/always_inline3.c: Update for pre-inline tail recursion
      	elimination.
      
      From-SVN: r120779
      fb3c516f
    • Paolo Carlini's avatar
      stl_algobase.h (fill_n(char*, _Size, const signed char&)): Fix signature. · 30beae0c
      Paolo Carlini authored
      2007-01-14  Paolo Carlini  <pcarlini@suse.de>
      
      	* include/bits/stl_algobase.h (fill_n(char*, _Size,
      	const signed char&)): Fix signature.
      	* testsuite/25_algorithms/fill/3.cc: New.
      
      From-SVN: r120778
      30beae0c
    • Jan Hubicka's avatar
      always_inline3.c: Update for pre-inline tail recursion elimination. · 4f698118
      Jan Hubicka authored
      	* gcc.dg/always_inline3.c: Update for pre-inline tail recursion
      	elimination.
      
      From-SVN: r120777
      4f698118
    • H.J. Lu's avatar
      Put back removed entries. · ad703964
      H.J. Lu authored
      From-SVN: r120774
      ad703964
    • H.J. Lu's avatar
      ld-symbolic.m4: New. · 76b972d6
      H.J. Lu authored
      config/
      
      2007-01-14  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* ld-symbolic.m4: New.
      
      libjava/
      
      2007-01-14  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* Makefile.am (libgcj_la_LDFLAGS): Add
      	$(LIBGCJ_LD_SYMBOLIC_FUNCTIONS).
      	(libgcj_tools_la_LDFLAGS): Likewise.
      	(libgcj_bc_la_LDFLAGS): Likewise.
      	* Makefile.in: Regenerated.
      
      	* configure.ac: Use ACX_PROG_LD_GNU_SYMBOLIC.  Set
      	LIBGCJ_LD_SYMBOLIC_FUNCTIONS to $SYMBOLIC_LDFLAGS.  Set
      	libgcj_ld_symbolic to $SYMBOLIC_LDFLAGS if it isn't set.
      	Substitute LIBGCJ_LD_SYMBOLIC_FUNCTIONS.
      	* configure: Regenerated.
      	* aclocal.m4: Likewise.
      	* gcj/Makefile.in: Likewise.
      	* include/Makefile.in: Likewise.
      	* testsuite/Makefile.in: Likewise.
      
      From-SVN: r120773
      76b972d6
    • Paul Thomas's avatar
      re PR fortran/30410 (Host association bug w/ EXTERNAL) · c89686a8
      Paul Thomas authored
      2007-01-14  Paul Thomas  <pault@gcc.gnu.org>
      
      	PR fortran/30410
      	* trans-decl.c (gfc_sym_mangled_function_id): Module, external
      	symbols must not have the module name prepended.
      
      2007-01-14  Paul Thomas  <pault@gcc.gnu.org>
      
      	PR fortran/30410
      	* gfortran.dg/external_procedures_2.f90: New test.
      
      From-SVN: r120771
      c89686a8
    • Dorit Nuzman's avatar
      param.h (MIN_VECT_LOOP_BOUND): New. · acdc40df
      Dorit Nuzman authored
              * param.h (MIN_VECT_LOOP_BOUND): New.
              * params.def (MIN_VECT_LOOP_BOUND): New.
              * tree-vectorizer.c (slpeel_tree_peel_loop_to_edge): Takes another
              argument - minimum threshold for number of iterations.
              * tree-vectorizer.h (slpeel_tree_peel_loop_to_edge): Add another
              argument to declaration.
              * tree-vect-analyze.c (vect_analyze_operations): Check value of
              MIN_VECT_LOOP_BOUND.
              * tree-vect-transform.c (vect_do_peeling_for_loop_bound): Call
              slpeel_tree_peel_loop_to_edge with additional argument.
              (vect_do_peeling_for_alignment): Likewise.
              * doc/invoke.texi (min-vect-loop-bound): Document new param option.
      
      From-SVN: r120770
      acdc40df
    • Uros Bizjak's avatar
      re PR target/30413 (%z produces ICE for char operands) · 37fc8424
      Uros Bizjak authored
              PR target/30413
              * config/i386/i386.c (print_operand) ['z']: Output 'b' for
              operands of size 1.
      
      testsuite/ChangeLog:
      
              PR target/30413
              * gcc.target/i386/pr30413.c: New test.
      
      From-SVN: r120769
      37fc8424
    • Thomas Koenig's avatar
      re PR fortran/30452 ([4.2, 4.1 only] Strange syntax error with high-value character) · 16a374c6
      Thomas Koenig authored
      2007-01-14  Thomas Koenig  <Thomas.Koenig@online.de>
      
      	PR fortran/30452
      	* scanner.c(next_char):  Cast next character to unsigned
      	to avoid confusion with error return codes.
      
      2007-01-14  Thomas Koenig  <Thomas.Koenig@online.de>
      
      	PR fortran/30452
      	* gfortran.dg/string_0xfe_0xff_1.f90:  New test.
      
      From-SVN: r120768
      16a374c6
    • Jan Hubicka's avatar
      tree-dfa.c (remove_referenced_var): New function. · 326648f1
      Jan Hubicka authored
      	* tree-dfa.c (remove_referenced_var): New function.
      	* tree-ssa-live.c (remove_unused_locals): Walk referenced vars and
      	prune referenced vars list too.
      	* tree-flow.h (remove_referenced_var): Declare.
      
      From-SVN: r120767
      326648f1
    • Jan Hubicka's avatar
      tree-eh.c (add_stmt_to_eh_region_fn): Do not add call_exprs separately. · 4437b50d
      Jan Hubicka authored
      	* tree-eh.c (add_stmt_to_eh_region_fn): Do not add call_exprs
      	separately.
      	(remove_stmt_from_eh_region_fn): Do not remove call_exprs.
      	(verify_eh_throw_stmt_node, verify_eh_throw_table_statements): Kill.
      	* except.h (verify_eh_throw_table_statements): Kill prototype.
      	* cfgexpand.c (expand_gimple_basic_block): Propagate Eh regions
      	into call exrepssions.
      	* tree-optimize.c (execute_free_cfg_annotatiosn): Do not call
      	eh trhow verifier.
      	* tree-cfg.c: Include pointer-set.h.
      	(verify_node_sharing): Work on pointer set.
      	(verify_eh_throw_stmt_node): New.
      	(verify_stmts): Use pointers sets, verify throw_stmt.
      
      From-SVN: r120766
      4437b50d
    • GCC Administrator's avatar
      Daily bump. · 843b6343
      GCC Administrator authored
      From-SVN: r120764
      843b6343
  3. Jan 13, 2007
    • Zdenek Dvorak's avatar
      ipa-reference.c (analyze_function): Consider also addresses taken in phi nodes. · 2a134b73
      Zdenek Dvorak authored
      	* ipa-reference.c (analyze_function): Consider also addresses taken
      	in phi nodes.
      
      	* gcc.dg/20070112-1.c: New test.
      
      From-SVN: r120757
      2a134b73
    • John David Anglin's avatar
      atomicity.h (__exchange_and_add): Don't use ordered store. · 8f0d85d6
      John David Anglin authored
      	* config/cpu/hppa/atomicity.h (__exchange_and_add): Don't use ordered
      	store.
      	(__atomic_add): Likewise.
      
      From-SVN: r120751
      8f0d85d6
    • Paolo Carlini's avatar
      re PR libstdc++/14991 (stream::attach(int fd) porting entry out-of-date) · d8867564
      Paolo Carlini authored
      2007-01-13  Paolo Carlini  <pcarlini@suse.de>
      
      	PR libstdc++/14991
      	* docs/html/17_intro/porting-howto.html ([3]): Mention stdio_filebuf.
      	* docs/html/17_intro/porting-howto.xml: Remove.
      
      	* docs/html/17_intro/porting-howto.html: Remove spurious end tags
      	pointed out by validator.w3.org.
      
      From-SVN: r120749
      d8867564
    • Roger Sayle's avatar
      c-typeck.c (null_pointer_constant_p): Replace use of TREE_CONSTANT_OVERFLOW with TREE_OVERFLOW. · 8bcd6380
      Roger Sayle authored
      	* c-typeck.c (null_pointer_constant_p): Replace use of
      	TREE_CONSTANT_OVERFLOW with TREE_OVERFLOW.
      	(build_c_cast): Likewise.
      
      From-SVN: r120747
      8bcd6380
    • Roger Sayle's avatar
      tree.h (force_fit_type_double): Remove unused final argument. · d95787e6
      Roger Sayle authored
      	* tree.h (force_fit_type_double): Remove unused final argument.
      	* c-common.c (constant_expression_warning): Replace use of
      	TREE_CONSTANT_OVERFLOW with TREE_OVERFLOW.
      	(convert_and_check): Likewise.
      	(shorten_compare): Update call to force_fit_type_double.
      	(c_common_truthvalue_conversion) <INTEGER_CST>: Use integer_zerop.
      	* convert.c (convert_to_pointer): Update call to
      	force_fit_type_double.
      	* fold-const.c (force_fit_type_double): Remove overflowed_const
      	argument.
      	(int_const_binop, fold_convert_const_int_from_int,
      	fold_convert_const_int_from_real, fold_div_compare,
      	fold_sign_changed_comparison, fold_unary, fold_negate_const,
      	fold_abs_const, fold_not_const): Remove the final argument from
      	calls to force_fit_type_double.
      
      From-SVN: r120746
      d95787e6
    • Tom Tromey's avatar
      jcf-dump.c (main): Updated call to find_class. · 6ef795d2
      Tom Tromey authored
      	* jcf-dump.c (main): Updated call to find_class.
      	* lang.c (java_init): Removed dead code.
      	* jcf-parse.c (read_class): Don't use java_source field.  Removed
      	dead code.
      	(parse_zip_file_entries): Don't use java_source field.
      	(process_zip_dir): Likewise.
      	(jcf_parse): Removed dead code.
      	(java_parse_file): Likewise.
      	(read_class): Updated call to find_class.
      	* jcf-io.c (find_class): Don't use java_source field.  Removed
      	'source_ok' argument, .java logic.
      	* jcf.h (JCF) <java_source>: Removed field.
      	(JCF_ZERO): Updated.	(find_class): Updated.
      	* decl.c: Removed dead code.
      	* class.c: Removed dead code.
      
      From-SVN: r120745
      6ef795d2
    • GCC Administrator's avatar
      Daily bump. · 86b5186f
      GCC Administrator authored
      From-SVN: r120743
      86b5186f
  4. Jan 12, 2007
    • Jerry DeLisle's avatar
      re PR fortran/30435 (Slash at end of input not recognized according to standard) · 2e014a85
      Jerry DeLisle authored
      2007-01-12  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
      
      	PR libgfortran/30435
      	* gfortran.dg/list_read_6.f90: New test.
      
      From-SVN: r120738
      2e014a85
    • Jerry DeLisle's avatar
      re PR fortran/30435 (Slash at end of input not recognized according to standard) · b8df885f
      Jerry DeLisle authored
      2007-01-12  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
      
      	PR libgfortran/30435
      	* io/list_read.c (finish_separator): Don't call next_record.
      	(list_formatted_read_scalar): Clean up some comments and whitespace.
      	(nml_read_obj): Whitespace fix.
      
      From-SVN: r120737
      b8df885f
    • Andrew Pinski's avatar
      configure.ac: Set insn to "nop" for spu-*-* also. · 714f737f
      Andrew Pinski authored
      2007-01-12  Andrew Pinski  <andrew_pinski@playstation.sony.com>
      
              * configure.ac: Set insn to "nop" for spu-*-* also.
              * configure: Regenerate.
      
      From-SVN: r120736
      714f737f
    • Kaz Kojima's avatar
      locks.h (read_barrier): New. · 228e6ac2
      Kaz Kojima authored
      	* sysdep/sh/locks.h (read_barrier): New.
      	(write_barrier): Likewise.
      
      From-SVN: r120735
      228e6ac2
    • Olga Golovanevsky's avatar
      Add BUILT_IN_FREE · db9d500a
      Olga Golovanevsky authored
      From-SVN: r120732
      db9d500a
    • Tom Tromey's avatar
      re PR preprocessor/28227 (valid #ifdef rejected) · ee1c2a10
      Tom Tromey authored
      libcpp
      	PR preprocessor/28227:
      	* directives.c (lex_macro_node): Added 'is_def_or_undef'
      	argument.
      	(do_define): Update.
      	(do_undef): Update.
      	(do_ifdef): Update.
      	(do_ifndef): Update.
      gcc/testsuite
      	PR preprocessor/28227:
      	* gcc.dg/cpp/pr28227.c: New file.
      
      From-SVN: r120731
      ee1c2a10
    • Jan Hubicka's avatar
      re PR middle-end/30443 (4.3 internal compiler error: verify_cgraph_node failed) · 3d283195
      Jan Hubicka authored
      	PR tree-optimization/30443
      	* tree-inline.c (tree_function_versioning): Do not optimize when
      	cloning for inlining.
      
      From-SVN: r120730
      3d283195
    • Zdenek Dvorak's avatar
      loop.texi: Document recording of loop exits. · 6270df4c
      Zdenek Dvorak authored
      	* doc/loop.texi: Document recording of loop exits.
      	* cfgloopmanip.c (loopify, duplicate_loop): Use alloc_loop.
      	(update_single_exits_after_duplication,
      	update_single_exit_for_duplicated_loop,
      	update_single_exit_for_duplicated_loops): Removed.
      	(duplicate_loop_to_header_edge): Do not call
      	update_single_exits_after_duplication and
      	update_single_exit_for_duplicated_loops.
      	(loop_version): Do not update single_exit information.
      	(fix_loop_structure): Use record_loop_exits instead of
      	mark_single_exit_loops.
      	* tree-ssa-loop-manip.c (tree_transform_and_unroll_loop): Update
      	the lists of loop exits.
      	* cfghooks.c (redirect_edge_and_branch, redirect_edge_and_branch_force,
      	split_edge, merge_blocks): Update the lists of loop exits.
      	* modulo-sched.c (sms_schedule): Pass LOOPS_HAVE_RECORDED_EXITS to
      	loop_optimizer_init.
      	* loop-init.c (loop_optimizer_init): Call record_loop_exits instead
      	of mark_single_exit_loops.
      	(loop_optimizer_finalize): Call release_recorded_exits.
      	* tree-ssa-loop.c (tree_loop_optimizer_init): Pass
      	LOOPS_HAVE_RECORDED_EXITS to loop_optimizer_init.
      	* tree-vectorizer.c (slpeel_tree_duplicate_loop_to_edge_cfg): Do not
      	update single exit information.
      	* lambda-code.c (perfect_nestify): Ditto.
      	* cfgloop.c (flow_loop_free): Destroy the list of exits of the loop.
      	(mark_single_exit_loops): Removed.
      	(alloc_loop, loop_exit_hash, loop_exit_eq, loop_exit_free,
      	get_exit_descriptions, rescan_loop_exit, record_loop_exits,
      	dump_recorded_exit, dump_recorded_exits, release_recorded_exits): New
      	functions.
      	(get_loop_exit_edges, single_exit): Use recorded exit lists.
      	(add_bb_to_loop, remove_bb_from_loops): Update the lists of loop exits.
      	(verify_loop_structure): Verify consistency of the exit lists.
      	(flow_loops_find): Use alloc_loop.  Initialize exits hash.
      	(set_single_exit): Removed.
      	* cfgloop.h (struct loop_exit): New function.
      	(struct loop): single_exit_ field replaced by exits field.
      	(LOOPS_HAVE_MARKED_SINGLE_EXITS): Replaced by LOOPS_HAVE_RECORDED_EXITS.
      	(struct loops): Added exits hash.
      	(mark_single_exit_loops, set_single_exit): Declaration removed.
      	(release_recorded_exits, record_loop_exits, rescan_loop_exit): Declare.
      
      From-SVN: r120728
      6270df4c
    • Richard Sandiford's avatar
      invoke.texi: Avoid use of @headitem. · 1cbe999f
      Richard Sandiford authored
      gcc/
      	* doc/invoke.texi: Avoid use of @headitem.
      
      From-SVN: r120726
      1cbe999f
Loading