Skip to content
Snippets Groups Projects
  1. May 27, 2019
  2. May 26, 2019
    • Uros Bizjak's avatar
      i386.md (@leave_<mode>): New expander. · a963ca40
      Uros Bizjak authored
      	* config/i386/i386.md (@leave_<mode>): New expander.
      	(*leave): Rename from leave.
      	(*leave_rex64): Rename from leave_rex64.
      	(@monitorx_<mode>): Rename from monitorx_<mode>.
      	(@clzero_<mode>): Rename from clzero_<mode>.
      	* config/i386/sse.md (@sse3_monitor_<mode>): Rename from
      	sse3_monitor_<mode>.
      	* config/i386/i386.c (*ix86_gen_leave): Remove indirect function.
      	(*ix86_gen_monitor): Ditto.
      	(*ix86_gen_monitorx): Ditto.
      	(*ix86_gen_clzero): Ditto.
      	(*ix86_gen_one_cmpl2): Ditto.
      	(ix86_emit_leave): Use gen_leave instead of ix86_gen_leave.
      	* config/i386/i386-expand.c (ix86_expand_builtin)
      	<case IX86_BUILTIN_MONITOR>: Use gen_sse3_monitor
      	instead of ix86_gen_monitor.
      	<case IX86_BUILTIN_MONITORX>: Use gen_monitorx
      	instead of ix86_gen_monitorx.
      	<case IX86_BUILTIN_CLZERO>: Use gen_clzero
      	instead of ix86_gen_clzero.
      	* config/i386/i386-options.c (ix86_option_override_internal):
      	Do not initialize ix86_gen_leave, ix86_gen_monitor,
      	ix86_gen_monitorx, ix86_gen_clzero and ix86_gen_one_cmpl2.
      
      	* config/i386/i386.md (@tls_global_dynamic_64_<mode>):
      	Rename from tls_global_dynamic_64_<mode>.
      	(@tls_local_dynamic_base_64_<mode>): Rename from
      	tls_local_dynamic_base_64_<mode>.
      	* config/i386/i386.c (*ix86_gen_tls_global_dynamic_64):
      	Remove indirect function.
      	(*ix86_gen_tls_local_dynamic_base_64): Ditto.
      	(legitimize_tls_address): Use gen_tls_global_dynamic_64 function
      	instead of ix86_gen_tls_global_dynamic_64.
      	Use gen_tls_local_dynamic_base_64 instead of
      	ix86_gen_tls_local_dynamic_base_64.
      	* config/i386/i386-options.c (ix86_option_override_internal):
      	Do not initialize ix86_gen_tls_global_dynamic_64 and
      	ix86_gen_tls_local_dynamic_base_64.
      
      	* config/i386/i386.md (@pro_epilogue_adjust_stack_add_<mode>)
      	Rename from pro_epilogue_adjust_stack_<mode>_add.
      	(@pro_epilogue_adjust_stack_sub_<mode>)
      	Rename from pro_epilogue_adjust_stack_<mode>_sub.
      	(@allocate_stack_worker_probe_<mode>):
      	Rename from allocate_stack_worker_probe_<mode>.
      	(allocate_stack): Use gen_allocate_stack_worker_probe.
      	(probe_stack): Use gen_probe_stack_1.
      	(@probe_stack_1_<mode>): Rename from probe_stack_<mode>.
      	(@adjust_stack_and_probe_<mode>): Rename from
      	adjust_stack_and_probe<mode>.
      	(@probe_stack_range_<mode>): Rename from probe_stack_range<mode>.
      	(stack_protect_set): Use gen_stack_protect_set_1.
      	(@stack_protect_set_1_<mode>): Rename from stack_protect_set_<mode>.
      	(stack_protect_test): Use gen_stack_protect_test_1.
      	(@stack_protect_test_1_<mode>): Rename from stack_protect_test_<mode>.
      	* config/i386/i386.c (*ix86_gen_allocate_stack_worker):
      	Remove indirect function.
      	(*ix86_gen_adjust_stack_and_probe): Ditto.
      	(*ix86_gen_probe_stack_range): Ditto.
      	(pro_epilogue_adjust_stack): Use gen_pro_epilogue_adjust_stack_add
      	instead of gen_pro_epilogue_adjust_stack_{si,di}_add.
      	(ix86_adjust_stack_and_probe_stack_clash): Use
      	gen_adjust_stack_and_probe instead of ix86_gen_adjust_stack_and_probe.
      	(ix86_adjust_stack_and_probe): Ditto.
      	(ix86_emit_probe_stack_range): Use gen_probe_stack_range instead
      	of ix86_gen_probe_stack_range.
      	(ix86_expand_prologue):  Use gen_pro_epilogue_adjust_stack_sub
      	instead of gen_pro_epilogue_adjust_stack_{si,di}_sub.
      	* config/i386/x86-tune-sched.c (ix86_macro_fusion_pair_p):
      	Include insn-opinit.h.  Use code_for_stack_protect_test_1 instead of
      	CODE_FOR_stack_protect_test_{si,di}.
      	* config/i386/i386-options.c (ix86_option_override_internal):
      	Do not initialize ix86_gen_allocate_stack_worker,
      	ix86_gen_adjust_stack_and_probe and ix86_gen_probe_stack_range.
      
      From-SVN: r271636
      a963ca40
    • Iain Sandoe's avatar
      darwin, x86, testsuite - Amend three PIE tests, · 2e776eff
      Iain Sandoe authored
      Darwin requires PIC code in order to support PIE, amend the test scan-asms
      to match this.
      
      2019-05-26  Iain Sandoe  <iain@sandoe.co.uk>
      
      	* gcc.target/i386/pr39013-1.c: Adjust scan-asms for PIE to
      	account for PIC code on Darwin.
      	* gcc.target/i386/pr39013-2.c: Likewise.
      	* gcc.target/i386/pr64317.c: Likewise.
      
      From-SVN: r271634
      2e776eff
    • Gerald Pfeifer's avatar
      invoke.texi (Link Options): Many editorial changes around -flinker-output. · e1fb36b8
      Gerald Pfeifer authored
      	* doc/invoke.texi (Link Options): Many editorial changes around
      	-flinker-output.
      
      From-SVN: r271633
      e1fb36b8
    • Thomas Koenig's avatar
      re PR fortran/90539 (481.wrf slowdown by 25% on Intel Kaby with -Ofast... · c51ecf28
      Thomas Koenig authored
      re PR fortran/90539 (481.wrf slowdown by 25% on Intel Kaby with -Ofast -march=native starting with r271377)
      
      2019-05-26  Thomas Koenig  <tkoenig@gcc.gnu.org>
      
      	PR fortran/90539
      	* trans-types.c (get_formal_from_actual_arglist): Set rank
      	and lower bound for assumed size arguments.
      
      From-SVN: r271630
      c51ecf28
    • Rainer Orth's avatar
      Added ChangeLog entry for last commit. · 6145df62
      Rainer Orth authored
      From-SVN: r271629
      6145df62
    • Rainer Orth's avatar
      Remove Solaris 10-only note about -mvect8-ret-in-mem · 11a04334
      Rainer Orth authored
      From-SVN: r271628
      11a04334
    • GCC Administrator's avatar
      Daily bump. · ddc9512a
      GCC Administrator authored
      From-SVN: r271627
      ddc9512a
  3. May 25, 2019
  4. May 24, 2019
    • John David Anglin's avatar
      re PR target/90530 (Invalid SUBREG insn generated by reload) · 0241901b
      John David Anglin authored
      	PR target/90530
      	* config/pa/pa.c (pa_can_change_mode_class): Accept mode changes from
      	DImode to SImode in floating-point registers on 64-bit target.
      	* config/pa/pa.md (umulsidi3): Change nonimmediate_operand to
      	register_operand in xmpyu patterns.
      
      From-SVN: r271611
      0241901b
    • Jakub Jelinek's avatar
      tree-core.h (enum omp_clause_code): Add OMP_CLAUSE__CONDTEMP_. · 6c7ae8c5
      Jakub Jelinek authored
      	* tree-core.h (enum omp_clause_code): Add OMP_CLAUSE__CONDTEMP_.
      	* tree.h (OMP_CLAUSE_DECL): Use OMP_CLAUSE__CONDTEMP_ instead of
      	OMP_CLAUSE__REDUCTEMP_.
      	* tree.c (omp_clause_num_ops, omp_clause_code_name): Add
      	OMP_CLAUSE__CONDTEMP_.
      	(walk_tree_1): Handle OMP_CLAUSE__CONDTEMP_.
      	* tree-pretty-print.c (dump_omp_clause): Likewise.
      	* tree-nested.c (convert_nonlocal_omp_clauses,
      	convert_local_omp_clauses): Likewise.
      	* gimplify.c (enum gimplify_omp_var_data): Use hexadecimal constants
      	instead of decimal.  Add GOVD_LASTPRIVATE_CONDITIONAL.
      	(gimplify_scan_omp_clauses): Don't reject lastprivate conditional
      	on OMP_FOR.
      	(gimplify_omp_for): Warn and disable conditional modifier from
      	lastprivate on loop iterators.
      	* omp-general.h (struct omp_for_data): Add lastprivate_conditional
      	member.
      	* omp-general.c (omp_extract_for_data): Initialize it.
      	* omp-low.c (struct omp_context): Add lastprivate_conditional_map
      	member.
      	(delete_omp_context): Delete it.
      	(lower_lastprivate_conditional_clauses): New function.
      	(lower_lastprivate_clauses): Add BODY_P and CSTMT_LIST arguments,
      	handle lastprivate conditional clauses.
      	(lower_reduction_clauses): Add CLIST argument, emit it into
      	the critical section if any.
      	(lower_omp_sections): Adjust lower_lastprivate_clauses and
      	lower_reduction_clauses callers.
      	(lower_omp_for_lastprivate): Add CLIST argument, pass it through
      	to lower_lastprivate_clauses.
      	(lower_omp_for): Call lower_lastprivate_conditional_clauses, adjust
      	lower_omp_for_lastprivate and lower_reduction_clauses callers, emit
      	clist into a critical section if not emitted there already by
      	lower_reduction_clauses.
      	(lower_omp_taskreg, lower_omp_teams): Adjust lower_reduction_clauses
      	callers.
      	(lower_omp_1): Handle GIMPLE_ASSIGNs storing into lastprivate
      	conditional variables.
      	* omp-expand.c (determine_parallel_type): Punt if OMP_CLAUSE__CONDTEMP_
      	clause is present.
      	(expand_omp_for_generic, expand_omp_for_static_nochunk,
      	expand_omp_for_static_chunk): Handle lastprivate conditional.
      	(expand_omp_for): Handle fd.lastprivate_conditional like
      	fd.have_reductemp.
      gcc/testsuite/
      	* c-c++-common/gomp/lastprivate-conditional-2.c (foo): Don't expect
      	sorry for omp for.
      	* c-c++-common/gomp/lastprivate-conditional-3.c: New test.
      libgomp/
      	* testsuite/libgomp.c-c++-common/lastprivate-conditional-1.c: New test.
      	* testsuite/libgomp.c-c++-common/lastprivate-conditional-2.c: New test.
      
      From-SVN: r271610
      6c7ae8c5
    • Andrew Stubbs's avatar
      GCN: Wait for exit value to write before exiting. · e8daba7e
      Andrew Stubbs authored
      2019-05-24  Andrew Stubbs  <ams@codesourcery.com>
      
      	gcc/
      	* config/gcn/gcn-run.c (main): Set a non-zero return value if the
      	kernel does not exit cleanly.
      	* config/gcn/gcn.md (gcn_return): Insert s_waitcnt before s_dcache_wb.
      
      From-SVN: r271605
      e8daba7e
    • Jason Merrill's avatar
      Revert "* gimplify.c (gimplify_cond_expr): Don't check TREE_ADDRESSABLE." · c2465dae
      Jason Merrill authored
      This reverts commit ac0f04360cc04e5b80a7d74f7edc47e395d2e744.
      
      From-SVN: r271604
      c2465dae
    • Richard Biener's avatar
      re PR middle-end/90607 (gcc.dg/pr53265.c FAILs) · dbd59515
      Richard Biener authored
      2019-05-24  Richard Biener  <rguenther@suse.de>
      
      	PR testsuite/90607
      	* tree-loop-distribution.c (struct partition): Add location
      	member.
      	(partition_alloc): Initialize all fields.
      	(generate_memset_builtin): Use the location recorded in the
      	partition for the generated call.
      	(generate_memcpy_builtin): Likewise.
      	(classify_partition): Record the location of a single store
      	as location for the partition.
      
      	* gcc.dg/pr53265.c: Amend for new expected diagnostic.
      
      From-SVN: r271601
      dbd59515
    • Andrew Stubbs's avatar
      Fix 64-bit addition in prologue. · 3258c2d6
      Andrew Stubbs authored
      2019-05-24  Andrew Stubbs  <ams@codesourcery.com>
      
      	gcc/
      	* config/gcn/gcn.c (gcn_expand_prologue): Use gen_addsi3_scalar_carry
      	for lo-part.
      
      From-SVN: r271600
      3258c2d6
    • Matthew Malcomson's avatar
      [aarch64] Change two function declaration types · 1ec77eed
      Matthew Malcomson authored
      Commit r271514 missed changing the type of two functions in
      aarch64-protos.h.  The function definitions had been updated to use
      uint64_t while the function declarations had been missed.
      They were missed since I only tested the patch on aarch64 where
      `unsigned long` is the same as `uint64_t`.
      
      This patch updates these declarations in aarch64-protos.h.
      
      Tested by building an aarch64 cross-compiler on arm-none-linux-gnu (so
      that `unsigned long` and `uint64_t` are different and would give error
      messages), and bootstrapping on aarch64-none-linux-gnu.
      Also manually tested command line options to see that
      -march=armv8-a+typo prints out the expected flags while using the new
      feature flags does not complain about missing flags.
      
      gcc/ChangeLog:
      
      2019-05-24  Matthew Malcomson  <matthew.malcomson@arm.com>
      
      	PR target/90588
      	* common/config/aarch64/aarch64-common.c
      	(aarch64_rewrite_selected_cpu): Change local temporary variable
      	type from unsigned long to uint64_t.
      	* config/aarch64/aarch64-protos.h (aarch64_parse_extension,
      	aarch64_get_extension_string_for_isa_flags): Change declaration to
      	match new definition by replacing unsigned long with uint64_t.
      
      From-SVN: r271599
      1ec77eed
    • Jakub Jelinek's avatar
      re PR tree-optimization/90106 (builtin sqrt() ignoring libm's sqrt call result) · 64124cef
      Jakub Jelinek authored
      	PR tree-optimization/90106
      	PR testsuite/90517
      	* gcc.dg/cdce1.c: Don't scan-assembler, instead -fdump-tree-optimized
      	and scan-tree-dump for tail call.
      	* gcc.dg/cdce2.c: Likewise.
      
      From-SVN: r271598
      64124cef
    • Jakub Jelinek's avatar
      re PR target/90568 (stack protector should use cmp or sub, not xor, to allow macro-fusion on x86) · d2e8b6ae
      Jakub Jelinek authored
      	PR target/90568
      	* config/i386/x86-tune-sched.c (ix86_macro_funsion_pair_p): Call
      	gen_attr_type just once instead of 4-7 times.  Formatting fixes.
      	Handle stack_protect_test_<mode> codegen similarly to corresponding
      	sub instruction.
      
      From-SVN: r271596
      d2e8b6ae
    • Richard Biener's avatar
      re PR tree-optimization/88440 (size optimization of memcpy-like code) · 1d672917
      Richard Biener authored
      2019-05-23  Richard Biener  <rguenther@suse.de>
      
      	PR tree-optimization/88440
      	* opts.c (default_options_table): Enable -ftree-loop-distribute-patterns
      	at -O[2s]+.
      	* tree-loop-distribution.c (generate_memset_builtin): Fold the
      	generated call.
      	(generate_memcpy_builtin): Likewise.
      	(distribute_loop): Pass in whether to only distribute patterns.
      	(prepare_perfect_loop_nest): Also allow size optimization.
      	(pass_loop_distribution::execute): When optimizing a loop
      	nest for size allow pattern replacement.
      
      	* gcc.dg/tree-ssa/ldist-37.c: New testcase.
      	* gcc.dg/tree-ssa/ldist-38.c: Likewise.
      	* gcc.dg/vect/vect.exp: Add -fno-tree-loop-distribute-patterns.
      	* gcc.dg/tree-ssa/ldist-37.c: Adjust.
      	* gcc.dg/tree-ssa/ldist-38.c: Likewise.
      	* g++.dg/tree-ssa/pr78847.C: Likewise.
      	* gcc.dg/autopar/pr39500-1.c: Likewise.
      	* gcc.dg/autopar/reduc-1char.c: Likewise.
      	* gcc.dg/autopar/reduc-7.c: Likewise.
      	* gcc.dg/tree-ssa/ivopts-lt-2.c: Likewise.
      	* gcc.dg/tree-ssa/ivopts-lt.c: Likewise.
      	* gcc.dg/tree-ssa/predcom-dse-1.c: Likewise.
      	* gcc.dg/tree-ssa/predcom-dse-2.c: Likewise.
      	* gcc.dg/tree-ssa/predcom-dse-3.c: Likewise.
      	* gcc.dg/tree-ssa/predcom-dse-4.c: Likewise.
      	* gcc.dg/tree-ssa/prefetch-7.c: Likewise.
      	* gcc.dg/tree-ssa/prefetch-8.c: Likewise.
      	* gcc.dg/tree-ssa/prefetch-9.c: Likewise.
      	* gcc.dg/tree-ssa/scev-11.c: Likewise.
      	* gcc.dg/vect/costmodel/i386/costmodel-vect-31.c: Likewise.
      	* gcc.dg/vect/costmodel/i386/costmodel-vect-33.c: Likewise.
      	* gcc.dg/vect/costmodel/x86_64/costmodel-vect-31.c: Likewise.
      	* gcc.dg/vect/costmodel/x86_64/costmodel-vect-33.c: Likewise.
      	* gcc.target/i386/pr30970.c: Likewise.
      	* gcc.target/i386/vect-double-1.c: Likewise.
      	* gcc.target/i386/vect-double-2.c: Likewise.
      	* gcc.dg/tree-ssa/gen-vect-2.c: Likewise.
      	* gcc.dg/tree-ssa/gen-vect-26.c: Likewise.
      	* gcc.dg/tree-ssa/gen-vect-28.c: Likewise.
      	* gcc.dg/tree-ssa/gen-vect-32.c: Likewise.
      	* gfortran.dg/vect/vect-5.f90: Likewise.
      	* gfortran.dg/vect/vect-8.f90: Likewise.
      
      From-SVN: r271595
      1d672917
    • Iain Sandoe's avatar
      add missed Changelog. · 9453b779
      Iain Sandoe authored
      From-SVN: r271592
      9453b779
    • Iain Sandoe's avatar
      Darwin, x86, testsuite - Make match strings more specific. · 66885312
      Iain Sandoe authored
      Some of the i386.exp tests fail on Darwin (and at least one passes
      incorrectly on Linux) because their scan-asm match strings are too
      general.  In some cases the strings also match instances in the .file
      and size directives or in comment output.  This patch makes the match
      strings more specific.
      
      2019-05-24  Iain Sandoe  <iain@sandoe.co.uk>
      
      	* gcc.target/i386/pconfig-1.c: Scan for the string in the generated
      	code, not in comments or miscellaneous directives. Adjust expected
      	count.
      	* gcc.target/i386/pr18041-1.c: Likewise.
      	* gcc.target/i386/pr18041-2.c: Likewise.
      	* gcc.target/i386/wbinvd-1.c: Likewise.
      	* gcc.target/i386/wbnoinvd-1.c: Likewise.
      	* gcc.target/i386/pr66819-3.c: Specifically, check that there is no
      	call to "bar".
      	* gcc.target/i386/pr66819-4.c: Likewise.
      	* gcc.target/i386/pr82662.c
      	* gcc.target/i386/ptwrite2.c: Make the checks look for the specific
      	destination register, don't try the m32 test on m64 targets.
      
      From-SVN: r271591
      66885312
    • Iain Sandoe's avatar
      Darwin, x86, testsuite - Adjust test labels. · 4ef1d2e2
      Iain Sandoe authored
      A couple of the i386.exp tests fail because the label spelling used
      is different between ELF and Mach-O targets. Adjusted here.
      
      2019-05-24  Iain Sandoe  <iain@sandoe.co.uk>
      
      	* gcc.target/i386/pr67985-2.c: Adjust label checks for
      	Darwin.
      	* gcc.target/i386/pr77881.c: Likewise.
      
      From-SVN: r271590
      4ef1d2e2
    • Iain Sandoe's avatar
      Darwin, x86, testsuite - Disable tests that cannot pass. · 3d61c31f
      Iain Sandoe authored
      A few of the i386.exp target tests cannot pass on Darwin
      because either the port doesn't support a feature, or the
      ABI demands sufficiently different codegen that matching
      the output with scan-asms would require a different test.
      
      Disabling those tests here.
      
      2019-05-24  Iain Sandoe  <iain@sandoe.co.uk>
      
      	* gcc.target/i386/falign-functions-2.c: Skip for Darwin.
      	* gcc.target/i386/pr70738-7.c: Likewise.
      	* gcc.target/i386/pr24414.c: Likewise.
      
      From-SVN: r271589
      3d61c31f
    • GCC Administrator's avatar
      Daily bump. · a2c8ea56
      GCC Administrator authored
      From-SVN: r271588
      a2c8ea56
  5. May 23, 2019
    • Iain Sandoe's avatar
      darwin, x86 - disable '-mfentry' for the port. · aa992ce7
      Iain Sandoe authored
      This can't work without special support because placing
      the call directly after the function label breaks the
      ABI requirement that call sites are 16byte aligned.
      
      gcc/
      
      2019-05-23  Iain Sandoe  <iain@sandoe.co.uk>
      
             * config/i386/darwin.h: Reject -mfentry*.
             * doc/sourcebuild.texi: Document mfentry target support.
      
      gcc/testsuite/
      
      2019-05-23  Iain Sandoe  <iain@sandoe.co.uk>
      
             * lib/target-supports.exp (check_effective_target_mfentry): New.
             * gcc.target/i386/fentry-override.c: Require effective target mfentry.
             * gcc/testsuite/gcc.target/i386/fentry.c: Likewise
             * gcc.target/i386/fentryname1.c: Likewise
             * gcc.target/i386/fentryname2.c: Likewise
             * gcc.target/i386/fentryname3.c: Likewise
             * gcc.target/i386/nop-mcount.c: Likewise
             * gcc.target/i386/pr82699-2.c: Likewise
             * gcc.target/i386/pr82699-4.c: Likewise
             * gcc.target/i386/pr82699-5.c: Likewise
             * gcc.target/i386/pr82699-6.c: Likewise
             * gcc.target/i386/returninst1.c: Likewise
             * gcc.target/i386/returninst2.c: Likewise
             * gcc.target/i386/returninst3.c : Likewise
      
      From-SVN: r271580
      aa992ce7
    • Bill Schmidt's avatar
      rs6000.c (rs6000_global_entry_point_needed_p): Rename to... · 99f84323
      Bill Schmidt authored
      rs6000.c (rs6000_global_entry_point_needed_p): Rename to rs6000_global_entry_point_prologue_needed_p.
      
      [gcc]
      
      2019-05-22  Bill Schmidt  <wschmidt@linux.ibm.com>
      
      	* config/rs6000/rs6000.c (rs6000_global_entry_point_needed_p):
      	Rename to rs6000_global_entry_point_prologue_needed_p.  Return
      	false for PC-relative functions.
      	(rs6000_output_function_prologue): Change called function name to
      	rs6000_global_entry_point_prologue_needed_p.  Emit ".localentry
      	name,1" for PC-relative functions.
      	(rs6000_elf_declare_function_name): Change called function name to
      	rs6000_global_entry_point_prologue_needed_p.
      
      [gcc/testsuite]
      
      2019-05-22  Bill Schmidt  <wschmidt@linux.ibm.com>
      
      	* gcc.target/powerpc/localentry-1.c: New file.
      
      From-SVN: r271577
      99f84323
    • Uros Bizjak's avatar
      re PR target/90552 (attribute((optimize(3))) not overriding -Os) · 103d91c7
      Uros Bizjak authored
      	PR target/90552
      	* config/i386/i386.c (gen_rtx_cost):
      	Use ix86_tune_cost instead of ix86_cost.
      
      testsuite/ChangeLog:
      
      	PR target/90552
      	* gcc.target/i386/pr90552.c: New test.
      
      From-SVN: r271576
      103d91c7
    • Bill Schmidt's avatar
      rs6000-cpus.def (ISA_FUTURE_MASKS_SERVER): Add OPTION_MASK_PCREL. · 91117603
      Bill Schmidt authored
      
      2019-05-22  Bill Schmidt  <wschmidt@linux.ibm.com>
      	    Michael Meissner  <meissner@linux.ibm.com>
      	    Segher Boessenkool  <segher@kernel.crashing.org>
      
      	* config/rs6000/rs6000-cpus.def (ISA_FUTURE_MASKS_SERVER): Add
      	OPTION_MASK_PCREL.
      	(POWERPC_MASKS): Add OPTION_MASK_PCREL.
      	* config/rs6000/rs6000-protos.h (rs6000_pcrel_p): New prototype.
      	(rs6000_fndecl_pcrel_p): Likewise.
      	* config/rs6000/rs6000.c (rs6000_option_override_internal): Report
      	error if -mpcrel is requested without -mcpu=future.
      	(rs6000_opt_masks): Add entry for pcrel.
      	(rs6000_fndecl_pcrel_p): New function.
      	(rs6000_pcrel_p): Likewise.
      	* config/rs6000/rs6000.opt (mpcrel): New option.
      	* doc/invoke.texi: Document -mpcrel and -mno-pcrel.
      
      
      Co-Authored-By: default avatarMichael Meissner <meissner@linux.ibm.com>
      Co-Authored-By: default avatarSegher Boessenkool <segher@kernel.crashing.org>
      
      From-SVN: r271575
      91117603
    • Mark Eggleston's avatar
      fmt_f_default_field_width_1.f90: Hide REAL(16) behind __GFC_REAL_16__. · f58be48c
      Mark Eggleston authored
      2019-05-23  Mark Eggleston  <mark.eggleston@codethink.com>
      
      	* gfortran.dg/fmt_f_default_field_width_1.f90: Hide REAL(16) behind
      	__GFC_REAL_16__.  Add -cpp to dg-options.
      	* gfortran.dg/fmt_f_default_field_width_2.f90: Ditto.
      	* gfortran.dg/fmt_f_default_field_width_3.f90: Ditto.
      	* gfortran.dg/fmt_g_default_field_width_1.f90: Ditto.
      	* gfortran.dg/fmt_g_default_field_width_2.f90: Ditto.
      	* gfortran.dg/fmt_g_default_field_width_3.f90: Ditto.
      
      From-SVN: r271573
      f58be48c
    • Jan Hubicka's avatar
      re PR tree-optimization/90576 (SPEC CPU2006 450.soplex miscompiled with -Os -flto after r271413) · a44ae258
      Jan Hubicka authored
      
      	PR tree-optimization/90576
      	* tree-ssa-alias.c (compare_sizes): Remove dead calls to
      	poly_int_tree_p.
      	(aliasing_component_refs_p): Fix three way size compare conditional;
      	give up earlier in case we can not decide on equivalence.
      
      Co-Authored-By: default avatarMartin Liska <mliska@suse.cz>
      
      From-SVN: r271572
      a44ae258
    • Bill Schmidt's avatar
      Add infrastructure to support -mcpu=future to represent a future · 5fa3b3cb
      Bill Schmidt authored
      architecture level, as yet unnamed.
      
      [gcc]
      
      2019-05-22  Bill Schmidt  <wschmidt@linux.ibm.com>
      	    Michael Meissner  <meissner@linux.ibm.com>
      	    Segher Boessenkool  <segher@kernel.crashing.org>
      
      	* config.gcc: Add future cpu.
      	* config/rs6000/driver-rs6000.c (asm_names): Add future cpu.
      	* config/rs6000/rs6000-cpus.def (ISA_FUTURE_MASKS_SERVER): New
      	#define.
      	(POWERPC_MASKS): Add OPTION_MASK_FUTURE.
      	(RS6000_CPU): New instantiation for future cpu.
      	* config/rs6000/rs6000-opts.h (enum processor_type): Add
      	PROCESSOR_FUTURE.
      	* config/rs6000/rs6000-string.c (expand_compare_loop): Treat
      	PROCESSOR_FUTURE like PROCESSOR_POWER9 for now.
      	* config/rs6000/rs6000-tables.opt: Regenerate.
      	* config/rs6000/rs6000.c (rs6000_option_override_internal): Treat
      	PROCESSOR_FUTURE similarly to PROCESSOR_POWER9 for now.
      	(rs6000_machine_from_flags): Handle future cpu.
      	(rs6000_reassociation_width): Treat PROCESSOR_FUTURE like
      	PROCESSOR_POWER9 for now.
      	(rs6000_adjust_cost): Likewise.
      	(rs6000_issue_rate): Likewise.
      	(rs6000_register_move_cost): Likewise.
      	(rs6000_opt_mask): Add entry for future.
      	* config/rs6000/rs6000.h (ASM_CPU_SPEC): Add future cpu.
      	(MASK_FUTURE): New #define.
      	* config/rs6000/rs6000.md (define_attr "cpu"): Add future cpu.
      	* config/rs6000/rs6000.opt (mfuture): New target option.
      	* doc/invoke.texi (mcpu): Add future cpu.
      
      [gcc/testsuite]
      
      2019-05-22  Bill Schmidt  <wschmidt@linux.ibm.com>
      
      	* gcc.target/powerpc/cpu-future.c: New test.
      
      
      Co-Authored-By: default avatarMichael Meissner <meissner@linux.ibm.com>
      Co-Authored-By: default avatarSegher Boessenkool <segher@kernel.crashing.org>
      
      From-SVN: r271567
      5fa3b3cb
    • Martin Liska's avatar
      Do not use tree_to_wide_ref that point to a temporary (PR c++/90587). · 56a4e074
      Martin Liska authored
      2019-05-23  Martin Liska  <mliska@suse.cz>
      
      	PR c++/90587
      	* tree-ssa-uninit.c (value_sat_pred_p): The result of &
      	operation points to a temporary (pointed via tree_to_wide_ref)
      	that is out of scope after the &.
      
      From-SVN: r271555
      56a4e074
    • Jonathan Wakely's avatar
      PR c++/90592 add missing word "scope" to __func__ docs · 16f8992e
      Jonathan Wakely authored
      	PR c++/90592
      	* doc/extend.texi (Function Names): Add missing word.
      
      From-SVN: r271554
      16f8992e
    • Richard Biener's avatar
      re PR tree-optimization/88440 (size optimization of memcpy-like code) · 5879ab5f
      Richard Biener authored
      2019-05-23  Richard Biener  <rguenther@suse.de>
      
      	PR tree-optimization/88440
      	* opts.c (default_options_table): Enable -ftree-loop-distribute-patterns
      	at -O[2s]+.
      	* tree-loop-distribution.c (generate_memset_builtin): Fold the
      	generated call.
      	(generate_memcpy_builtin): Likewise.
      	(distribute_loop): Pass in whether to only distribute patterns.
      	(prepare_perfect_loop_nest): Also allow size optimization.
      	(pass_loop_distribution::execute): When optimizing a loop
      	nest for size allow pattern replacement.
      
      	* gcc.dg/tree-ssa/ldist-37.c: New testcase.
      	* gcc.dg/tree-ssa/ldist-38.c: Likewise.
      	* gcc.dg/vect/vect.exp: Add -fno-tree-loop-distribute-patterns.
      	* gcc.dg/tree-ssa/ldist-37.c: Adjust.
      	* gcc.dg/tree-ssa/ldist-38.c: Likewise.
      	* g++.dg/tree-ssa/pr78847.C: Likewise.
      	* gcc.dg/autopar/pr39500-1.c: Likewise.
      	* gcc.dg/autopar/reduc-1char.c: Likewise.
      	* gcc.dg/autopar/reduc-7.c: Likewise.
      	* gcc.dg/tree-ssa/ivopts-lt-2.c: Likewise.
      	* gcc.dg/tree-ssa/ivopts-lt.c: Likewise.
      	* gcc.dg/tree-ssa/predcom-dse-1.c: Likewise.
      	* gcc.dg/tree-ssa/predcom-dse-2.c: Likewise.
      	* gcc.dg/tree-ssa/predcom-dse-3.c: Likewise.
      	* gcc.dg/tree-ssa/predcom-dse-4.c: Likewise.
      	* gcc.dg/tree-ssa/prefetch-7.c: Likewise.
      	* gcc.dg/tree-ssa/prefetch-8.c: Likewise.
      	* gcc.dg/tree-ssa/prefetch-9.c: Likewise.
      	* gcc.dg/tree-ssa/scev-11.c: Likewise.
      	* gcc.dg/vect/costmodel/i386/costmodel-vect-31.c: Likewise.
      	* gcc.dg/vect/costmodel/i386/costmodel-vect-33.c: Likewise.
      	* gcc.dg/vect/costmodel/x86_64/costmodel-vect-31.c: Likewise.
      	* gcc.dg/vect/costmodel/x86_64/costmodel-vect-33.c: Likewise.
      	* gcc.target/i386/pr30970.c: Likewise.
      	* gcc.target/i386/vect-double-1.c: Likewise.
      	* gcc.target/i386/vect-double-2.c: Likewise.
      	* gcc.dg/tree-ssa/gen-vect-2.c: Likewise.
      	* gcc.dg/tree-ssa/gen-vect-26.c: Likewise.
      	* gcc.dg/tree-ssa/gen-vect-28.c: Likewise.
      	* gcc.dg/tree-ssa/gen-vect-32.c: Likewise.
      	* gfortran.dg/vect/vect-5.f90: Likewise.
      	* gfortran.dg/vect/vect-8.f90: Likewise.
      
      From-SVN: r271553
      5879ab5f
Loading