Skip to content
Snippets Groups Projects
  1. Feb 05, 2024
    • Richard Ball's avatar
      arm: Fix missing bti instruction for virtual thunks · 23f1b496
      Richard Ball authored
      Adds missing bti instruction at the beginning of a virtual
      thunk, when bti is enabled.
      
      gcc/ChangeLog:
      
      	* config/arm/arm.cc (arm_output_mi_thunk): Emit
      	insn for bti_c when bti is enabled.
      
      gcc/testsuite/ChangeLog:
      
      	* lib/target-supports.exp: Add v8_1_m_main_pacbti.
      	* g++.target/arm/bti_thunk.C: New test.
      23f1b496
    • H.J. Lu's avatar
      x86-64: Update gcc.target/i386/apx-ndd.c · e5f50e63
      H.J. Lu authored
      Fix the following issues:
      
      1. Replace long with int64_t to support x32.
      2. Replace \\(%rdi\\) with \\(%(?:r|e)di\\) for memory operand since x32
      uses (%edi).
      3. Replace %(?:|r|e)al with %al in negb scan.
      
      	* gcc.target/i386/apx-ndd.c: Updated.
      e5f50e63
    • Xi Ruoyao's avatar
      mips: Fix missing mode in neg<mode:MSA>2 · 55357960
      Xi Ruoyao authored
      I was too sleepy writting this :(.
      
      gcc/ChangeLog:
      
      	* config/mips/mips-msa.md (neg<mode:MSA>2): Add missing mode for
      	neg.
      55357960
    • Xi Ruoyao's avatar
      MIPS: Fix wrong MSA FP vector negation · 4d7fe3cf
      Xi Ruoyao authored
      We expanded (neg x) to (minus const0 x) for MSA FP vectors, this is
      wrong because -0.0 is not 0 - 0.0.  This causes some Python tests to
      fail when Python is built with MSA enabled.
      
      Use the bnegi.df instructions to simply reverse the sign bit instead.
      
      gcc/ChangeLog:
      
      	* config/mips/mips-msa.md (elmsgnbit): New define_mode_attr.
      	(neg<mode>2): Change the mode iterator from MSA to IMSA because
      	in FP arithmetic we cannot use (0 - x) for -x.
      	(neg<mode>2): New define_insn to implement FP vector negation,
      	using a bnegi instruction to negate the sign bit.
      4d7fe3cf
    • Richard Biener's avatar
      tree-optimization/113707 - ICE with VN elimination · 42959acb
      Richard Biener authored
      The following avoids different avail answers depending on how the
      iteration progressed.
      
      	PR tree-optimization/113707
      	* tree-ssa-sccvn.cc (rpo_elim::eliminate_avail): After
      	checking the avail set treat out-of-region defines as
      	available.
      
      	* gcc.dg/torture/pr113707-1.c: New testcase.
      	* gcc.dg/torture/pr113707-2.c: Likewise.
      42959acb
    • Richard Biener's avatar
      Vectorizer and address-spaces · 9d139c03
      Richard Biener authored
      The following makes sure to use the correct pointer mode when
      building pointer types to a non-default address-space.
      
      	* tree-vect-data-refs.cc (vect_create_data_ref_ptr): Use
      	the default mode when building a pointer.
      9d139c03
    • Jakub Jelinek's avatar
      lower-bitint: Remove single label _BitInt switches [PR113737] · dede174f
      Jakub Jelinek authored
      The following testcase ICEs, because group_case_labels_stmt optimizes
        switch (a.0_7) <default: <L6> [50.00%], case 0: <L7> [50.00%], case 2: <L7> [50.00%]>
      where L7 block starts with __builtin_unreachable (); to
        switch (a.0_7) <default: <L6> [50.00%]>
      and single label GIMPLE_SWITCH is something the switch expansion refuses to
      lower:
        if (gimple_switch_num_labels (m_switch) == 1
            || range_check_type (index_type) == NULL_TREE)
          return false;
      (range_check_type never returns NULL for BITINT_TYPE), but the gimple
      lowering pass relies on all large/huge _BitInt switches to be lowered
      by that pass.
      
      The following patch just removes those after making the single successor
      edge EDGE_FALLTHRU.  I've done it even if !optimize just in case in case
      we'd end up with single case label from earlier passes.
      
      2024-02-05  Jakub Jelinek  <jakub@redhat.com>
      
      	PR tree-optimization/113737
      	* gimple-lower-bitint.cc (gimple_lower_bitint): If GIMPLE_SWITCH
      	has just a single label, remove it and make single successor edge
      	EDGE_FALLTHRU.
      
      	* gcc.dg/bitint-84.c: New test.
      dede174f
    • Jakub Jelinek's avatar
      i386: Clear REG_UNUSED and REG_DEAD notes from the IL at the end of vzeroupper pass [PR113059] · d413df07
      Jakub Jelinek authored
      The move of the vzeroupper pass from after reload pass to after
      postreload_cse helped only partially, CSE-like passes can still invalidate
      those notes (especially REG_UNUSED) if they use some earlier register
      holding some value later on in the IL.
      
      So, either we could try to move it one pass further after gcse2 and hope
      no later pass invalidates the notes, or the following patch attempts to
      restore the REG_DEAD/REG_UNUSED state from GCC 13 and earlier, where
      the LRA or reload passes remove all REG_DEAD/REG_UNUSED notes and the notes
      reappear only at the start of dse2 pass when it calls
        df_note_add_problem ();
        df_analyze ();
      So, effectively
                NEXT_PASS (pass_postreload_cse);
                NEXT_PASS (pass_gcse2);
                NEXT_PASS (pass_split_after_reload);
                NEXT_PASS (pass_ree);
                NEXT_PASS (pass_compare_elim_after_reload);
                NEXT_PASS (pass_thread_prologue_and_epilogue);
      passes operate without those notes in the IL.
      While in GCC 14 mode switching computes the notes problem at the start of
      vzeroupper, the patch below removes them at the end of the pass again, so
      that the above passes continue to operate without them.
      
      2024-02-05  Jakub Jelinek  <jakub@redhat.com>
      
      	PR target/113059
      	* config/i386/i386-features.cc (rest_of_handle_insert_vzeroupper):
      	Remove REG_DEAD/REG_UNUSED notes at the end of the pass before
      	df_analyze call.
      d413df07
    • Richard Biener's avatar
      target/113255 - avoid REG_POINTER on a pointer difference · 5b281946
      Richard Biener authored
      The following avoids re-using a register holding a pointer (and
      thus might be REG_POINTER) for the result of a pointer difference
      computation.  That might confuse heuristics in (broken) RTL alias
      analysis which relies on REG_POINTER indicating that we're
      dealing with one.
      
      This alone doesn't fix anything.
      
      	PR target/113255
      	* config/i386/i386-expand.cc
      	(expand_set_or_cpymem_prologue_epilogue_by_misaligned_moves):
      	Use a new pseudo for the skipped number of bytes.
      5b281946
    • Monk Chiang's avatar
      RISC-V: Add sifive-p450, sifive-p67 to -mcpu · 91e09b3a
      Monk Chiang authored
      gcc/ChangeLog:
      
      	* config/riscv/riscv-cores.def: Add sifive-p450, sifive-p670.
      	* doc/invoke.texi (RISC-V Options): Add sifive-p450,
      	sifive-p670.
      
      gcc/testsuite/ChangeLog:
      
      	* gcc.target/riscv/mcpu-sifive-p450.c: New test.
      	* gcc.target/riscv/mcpu-sifive-p670.c: New test.
      91e09b3a
    • Monk Chiang's avatar
      RISC-V: Support scheduling for sifive p400 series · 7c190f93
      Monk Chiang authored
      Add sifive p400 series scheduler module. For more information
      see https://www.sifive.com/cores/performance-p450-470.
      
      gcc/ChangeLog:
      
      	* config/riscv/riscv.md: Include sifive-p400.md.
      	* config/riscv/sifive-p400.md: New file.
      	* config/riscv/riscv-cores.def (RISCV_TUNE): Add parameter.
      	* config/riscv/riscv-opts.h (enum riscv_microarchitecture_type):
      	Add sifive_p400.
      	* config/riscv/riscv.cc (sifive_p400_tune_info): New.
      	* config/riscv/riscv.h (TARGET_SFB_ALU): Update.
      	* doc/invoke.texi (RISC-V Options): Add sifive-p400-series
      7c190f93
    • GCC Administrator's avatar
      Daily bump. · 72319171
      GCC Administrator authored
      72319171
  2. Feb 04, 2024
    • Jonathan Wakely's avatar
      libstdc++: Replace padding bits with bit-fields in __format::_Spec · 260a22de
      Jonathan Wakely authored
      This ensures that the unused bits will be zero-initialized reliably, and
      so can be used later by assigning them values in formatter
      specializations. For example, formatters for std::chrono will need to
      use an extra bit for a boolean flag to optimize the conversions between
      locale encodings and UTF-8.
      
      Adding the 16-bit _M_reserved2 bit-field results in an increased size
      for targets that use 1- or 2-byte alignment for all integral types, e.g.
      cris-elf or m68k.  Placing that member before the _M_width member
      adjusts the layout for all targets, but keeps all the bit-fields
      together. We can't make that change once C++20 support is ABI stable and
      non-experimental, so do it now before GCC 14 is released. The _M_fill
      data member already change from char to char32_t in
      r14-6991-g37a4c5c23a270c so _Spec is already incompatible with gcc-13
      anyway.
      
      libstdc++-v3/ChangeLog:
      
      	* include/std/format (__format::_Spec::_M_reserved): Define new
      	bit-field members to reserve padding bits for future extensions.
      260a22de
    • Jonathan Wakely's avatar
      libstdc++: Fix libstdc++exp.a so it really does contain Filesystem TS symbols · abf40d29
      Jonathan Wakely authored
      In r14-3812-gb96b554592c5cb I claimed that libstdc++exp.a now contains
      all the symbols from libstdc++fs.a as well as libstdc++_libbacktrace.a,
      but that wasn't true. Only the symbols from the latter were added to
      libstdc++exp.a, the Filesystem TS ones weren't. This seems to be because
      libtool won't combine static libs that are going to be installed
      separately. Because libstdc++fs.a is still installed, libtool decides it
      shouldn't be included in libstdc++exp.a.
      
      The solution is similar to what we already do for libsupc++.a: build two
      static libs, libstdc++fs.a and libstdc++fsconvenience.a, where the
      former is installed and the latter isn't. If we then tell libtool to
      include the latter in libstdc++exp.a it will do as it's told.
      
      libstdc++-v3/ChangeLog:
      
      	* src/experimental/Makefile.am: Use libstdc++fsconvenience.a
      	instead of libstdc++fs.a.
      	* src/experimental/Makefile.in: Regenerate.
      	* src/filesystem/Makefile.am: Build libstdc++fsconvenience.a as
      	well.
      	* src/filesystem/Makefile.in: Regenerate.
      abf40d29
    • Jonathan Wakely's avatar
      libstdc++: Add copyright and license text to new generated headers · e99d9607
      Jonathan Wakely authored
      contrib/ChangeLog:
      
      	* unicode/gen_libstdcxx_unicode_data.py: Add copyright and
      	license text to the output.
      
      libstdc++-v3/ChangeLog:
      
      	* include/bits/text_encoding-data.h: Regenerate.
      	* include/bits/unicode-data.h: Regenerate.
      	* scripts/gen_text_encoding_data.py: Add copyright and license
      	text to the output.
      e99d9607
    • Takayuki 'January June' Suwa's avatar
      xtensa: Fix missing mode warning in "*eqne_zero_masked_bits" · 3f722e78
      Takayuki 'January June' Suwa authored
      gcc/ChangeLog:
      
      	* config/xtensa/xtensa.md (*eqne_zero_masked_bits):
      	Add missing ":SI" to the match_operator.
      3f722e78
    • Takayuki 'January June' Suwa's avatar
      xtensa: Recover constant synthesis for HImode after LRA transition · 7c2c7dd2
      Takayuki 'January June' Suwa authored
      After LRA transition, HImode constants that don't fit into signed 12 bits
      are no longer subject to constant synthesis:
      
          /* example */
          void test(void) {
            short foo = 32767;
            __asm__ ("" :: "r"(foo));
          }
      
          ;; before
          	.literal_position
          	.literal .LC0, 32767
          test:
          	l32r	a9, .LC0
          	ret.n
      
      This patch fixes that:
      
          ;; after
          test:
          	movi.n	a9, -1
          	extui	a9, a9, 17, 15
          	ret.n
      
      gcc/ChangeLog:
      
      	* config/xtensa/xtensa.md (SHI): New mode iterator.
      	(2 split patterns related to constsynth):
      	Change to also accept HImode operands.
      7c2c7dd2
    • Jeff Law's avatar
      [committed] Reasonably handle SUBREGs in risc-v cost modeling · 777df37a
      Jeff Law authored
      
      This patch adjusts the costs so that we treat REG and SUBREG expressions the
      same for costing.
      
      This was motivated by bt_skip_func and bt_find_func in xz and results in nearly
      a 5% improvement in the dynamic instruction count for input #2 and smaller, but
      definitely visible improvements pretty much across the board.  Exceptions would
      be perlbench input #1 and exchange2 which showed very small regressions.
      
      In the bt_find_func and bt_skip_func cases we have  something like this:
      
      > (insn 10 7 11 2 (set (reg/v:DI 136 [ x ])
      >         (zero_extend:DI (subreg/s/u:SI (reg/v:DI 137 [ a ]) 0))) "zz.c":6:21 387 {*zero_extendsidi2_bitmanip}
      >      (nil))
      > (insn 11 10 12 2 (set (reg:DI 142 [ _1 ])
      >         (plus:DI (reg/v:DI 136 [ x ])
      >             (reg/v:DI 139 [ b ]))) "zz.c":7:23 5 {adddi3}
      >      (nil))
      
      [ ... ]> (insn 13 12 14 2 (set (reg:DI 143 [ _2 ])
      >         (plus:DI (reg/v:DI 136 [ x ])
      >             (reg/v:DI 141 [ c ]))) "zz.c":8:23 5 {adddi3}
      >      (nil))
      
      Note the two uses of (reg 136). The best way to handle that in combine might be
      a 3->2 split.  But there's a much better approach if we look at fwprop...
      
      (set (reg:DI 142 [ _1 ])
          (plus:DI (zero_extend:DI (subreg/s/u:SI (reg/v:DI 137 [ a ]) 0))
              (reg/v:DI 139 [ b ])))
      change not profitable (cost 4 -> cost 8)
      
      So that should be the same cost as a regular DImode addition when the ZBA
      extension is enabled.  But it ends up costing more because the clause to cost
      this variant isn't prepared to handle a SUBREG.  That results in the RTL above
      having too high a cost and fwprop gives up.
      
      One approach would be to replace the REG_P  with REG_P || SUBREG_P in the
      costing code.  I ultimately decided against that and instead check if the
      operand in question passes register_operand.
      
      By far the most important case to handle is the DImode PLUS.  But for the sake
      of consistency, I changed the other instances in riscv_rtx_costs as well.  For
      those other cases we're talking about improvements in the .000001% range.
      
      While we are into stage4, this just hits cost modeling which we've generally
      agreed is still appropriate (though we were mostly talking about vector).  So
      I'm going to extend that general agreement ever so slightly and include scalar
      cost modeling :-)
      
      gcc/
      	* config/riscv/riscv.cc (riscv_rtx_costs): Handle SUBREG and REG
      	similarly.
      
      gcc/testsuite/
      
      	* gcc.target/riscv/reg_subreg_costs.c: New test.
      
      Co-authored-by: default avatarJivan Hakobyan <jivanhakobyan9@gmail.com>
      777df37a
    • Xi Ruoyao's avatar
      LoongArch: Fix wrong LSX FP vector negation · aa335700
      Xi Ruoyao authored
      We expanded (neg x) to (minus const0 x) for LSX FP vectors, this is
      wrong because -0.0 is not 0 - 0.0.  This causes some Python tests to
      fail when Python is built with LSX enabled.
      
      Use the vbitrevi.{d/w} instructions to simply reverse the sign bit
      instead.  We are already doing this for LASX and now we can unify them
      into simd.md.
      
      gcc/ChangeLog:
      
      	* config/loongarch/lsx.md (neg<mode:FLSX>2): Remove the
      	incorrect expand.
      	* config/loongarch/simd.md (simdfmt_as_i): New define_mode_attr.
      	(elmsgnbit): Likewise.
      	(neg<mode:FVEC>2): New define_insn.
      	* config/loongarch/lasx.md (negv4df2, negv8sf2): Remove as they
      	are now instantiated in simd.md.
      aa335700
    • Xi Ruoyao's avatar
      LoongArch: Avoid out-of-bounds access in loongarch_symbol_insns · 829b2632
      Xi Ruoyao authored
      We call loongarch_symbol_insns with mode = MAX_MACHINE_MODE sometimes.
      But in loongarch_symbol_insns:
      
          if (LSX_SUPPORTED_MODE_P (mode) || LASX_SUPPORTED_MODE_P (mode))
            return 0;
      
      And LSX_SUPPORTED_MODE_P is defined as:
      
          #define LSX_SUPPORTED_MODE_P(MODE) \
            (ISA_HAS_LSX \
             && GET_MODE_SIZE (MODE) == UNITS_PER_LSX_REG ... ...
      
      GET_MODE_SIZE is expanded to a call to mode_to_bytes, which is defined:
      
          ALWAYS_INLINE poly_uint16
          mode_to_bytes (machine_mode mode)
          {
          #if GCC_VERSION >= 4001
            return (__builtin_constant_p (mode)
      	  ? mode_size_inline (mode) : mode_size[mode]);
          #else
            return mode_size[mode];
          #endif
          }
      
      There is an assertion in mode_size_inline:
      
          gcc_assert (mode >= 0 && mode < NUM_MACHINE_MODES);
      
      Note that NUM_MACHINE_MODES = MAX_MACHINE_MODE (emitted by genmodes.cc),
      thus if __builtin_constant_p (mode) is evaluated true (it happens when
      GCC is bootstrapped with LTO+PGO), the assertion will be triggered and
      cause an ICE.  OTOH if __builtin_constant_p (mode) is evaluated false,
      mode_size[mode] is still an out-of-bound array access (the length or the
      mode_size array is NUM_MACHINE_MODES).
      
      So we shouldn't call LSX_SUPPORTED_MODE_P or LASX_SUPPORTED_MODE_P with
      MAX_MACHINE_MODE in loongarch_symbol_insns.  This is very similar to a
      MIPS bug PR98491 fixed by me about 3 years ago.
      
      gcc/ChangeLog:
      
      	* config/loongarch/loongarch.cc (loongarch_symbol_insns): Do not
      	use LSX_SUPPORTED_MODE_P or LASX_SUPPORTED_MODE_P if mode is
      	MAX_MACHINE_MODE.
      829b2632
    • Li Wei's avatar
      LoongArch: testsuite: Fix gcc.dg/vect/vect-reduc-mul_{1, 2}.c FAIL. · 8e6ebacc
      Li Wei authored
      This FAIL was introduced from r14-6908. The reason is that when merging
      constant vector permutation implementations, the 128-bit matching situation
      was not fully considered. In fact, the expansion of 128-bit vectors after
      merging only supports value-based 4 elements set shuffle, so this time is a
      complete implementation of the entire 128-bit vector constant permutation,
      and some structural adjustments have also been made to the code.
      
      gcc/ChangeLog:
      
      	* config/loongarch/loongarch.cc (loongarch_expand_vselect): Adjust.
      	(loongarch_expand_vselect_vconcat): Ditto.
      	(loongarch_try_expand_lsx_vshuf_const): New, use vshuf to implement
      	all 128-bit constant permutation situations.
      	(loongarch_expand_lsx_shuffle): Adjust and rename function name.
      	(loongarch_is_imm_set_shuffle): Renamed function name.
      	(loongarch_expand_vec_perm_even_odd): Function forward declaration.
      	(loongarch_expand_vec_perm_even_odd_1): Add implement for 128-bit
      	extract-even and extract-odd permutations.
      	(loongarch_is_odd_extraction): Delete.
      	(loongarch_is_even_extraction): Ditto.
      	(loongarch_expand_vec_perm_const): Adjust.
      8e6ebacc
    • Iain Buclaw's avatar
      libphobos: Merge upstream phobos 37796e783 · 2ada8bc5
      Iain Buclaw authored
      Phobos changes:
      
          - std.uni tables have been regenerated as hex strings.
      
      libphobos/ChangeLog:
      
      	* src/MERGE: Merge upstream phobos 37796e783.
      2ada8bc5
    • Iain Buclaw's avatar
      d: Merge dmd, druntime a6f1083699, phobos 31dedd7da · c428454e
      Iain Buclaw authored
      D front-end changes:
      
      	- Import dmd v2.107.0.
      	- Character postfixes can now also be used for integers of size
      	  two or four.
      
      D run-time changes:
      
      	- Import druntime v2.107.0.
      
      Phobos changes:
      
      	- Import phobos v2.107.0.
      
      gcc/d/ChangeLog:
      
      	* dmd/MERGE: Merge upstream dmd a6f1083699.
      	* dmd/VERSION: Bump version to v2.107.0
      	* Make-lang.in (D_FRONTEND_OBJS): Add d/pragmasem.o.
      	* d-builtins.cc (strip_type_modifiers): Update for new front-end
      	interface.
      	* d-codegen.cc (declaration_type): Likewise.
      	(parameter_type): Likewise.
      	* d-target.cc (TargetCPP::parameterType): Likewise.
      	* expr.cc (ExprVisitor::visit (IndexExp *)): Likewise.
      	(ExprVisitor::visit (VarExp *)): Likewise.
      	(ExprVisitor::visit (AssocArrayLiteralExp *)): Likewise.
      	* runtime.cc (get_libcall_type): Likewise.
      	* typeinfo.cc (TypeInfoVisitor::visit (TypeInfoConstDeclaration *)):
      	Likewise.
      	(TypeInfoVisitor::visit (TypeInfoInvariantDeclaration *)): Likewise.
      	(TypeInfoVisitor::visit (TypeInfoSharedDeclaration *)): Likewise.
      	(TypeInfoVisitor::visit (TypeInfoWildDeclaration *)): Likewise.
      	* types.cc (build_ctype): Likewise.
      
      libphobos/ChangeLog:
      
      	* libdruntime/MERGE: Merge upstream druntime a6f1083699.
      	* src/MERGE: Merge upstream phobos 31dedd7da.
      c428454e
    • GCC Administrator's avatar
      Daily bump. · 435bed3f
      GCC Administrator authored
      435bed3f
  3. Feb 03, 2024
    • John David Anglin's avatar
      Fix xfail for 32-bit hppa*-*-* in gcc.dg/pr84877.c · fa960999
      John David Anglin authored
      2024-02-03  John David Anglin  <danglin@gcc.gnu.org>
      
      gcc/testsuite/ChangeLog:
      
      	* gcc.dg/pr84877.c: Adjust xfail parentheses.
      fa960999
    • Jerry DeLisle's avatar
      libgfortran: EN0.0E0 and ES0.0E0 format editing. · d436e8e7
      Jerry DeLisle authored
      F2018 and F2023 standards added zero width exponents. This required
      additional special handing in the process of building formatted
      floating point strings.
      
      G formatting uses either F or E formatting as documented in
      write_float.def comments. This logic changes the format token from FMT_G
      to FMT_F or FMT_E. The new formatting requirements interfere with this
      process when a FMT_G float string is being built.  To avoid this, a new
      component called 'pushed' is added to the fnode structure to save this
      condition.  The 'pushed' condition is then used to bypass portions of
      the new ES,E,EN, and D formatting, falling through to the existing
      default formatting which is retained.
      
      libgfortran/ChangeLog:
      	PR libfortran/111022
      	* io/format.c (get_fnode): Update initialization of fnode.
      	(parse_format_list): Initialization.
      	* io/format.h (struct fnode): Added the new 'pushed' component.
      	* io/write.c (select_buffer): Whitespace.
      	(write_real): Whitespace.
      	(write_real_w0): Adjust logic for the d == 0 condition.
      	* io/write_float.def (determine_precision): Whitespace.
      	(build_float_string): Calculate width of ..E0 exponents and
      	adjust logic accordingly.
      	(build_infnan_string): Whitespace.
      	(CALCULATE_EXP): Whitespace.
      	(quadmath_snprintf): Whitespace.
      	(determine_en_precision): Whitespace.
      
      gcc/testsuite/ChangeLog:
      	PR libfortran/111022
      	* gfortran.dg/fmt_error_10.f: Show D+0 exponent.
      	* gfortran.dg/pr96436_4.f90: Show E+0 exponent.
      	* gfortran.dg/pr96436_5.f90: Show E+0 exponent.
      	* gfortran.dg/pr111022.f90: New test.
      d436e8e7
    • John David Anglin's avatar
      libatomic: Provide FPU exception defines for __hppa__ · 26635401
      John David Anglin authored
      The exception defines in <fenv.h> do not match the exception bits
      in the FPU status register on hppa-linux and hppa64-hpux11.11.  On
      linux, they match the trap enable bits.  On 64-bit hpux, they match
      the exception bits for IA64.  The IA64 bits are in a different
      order and location than HPPA.  HP uses table look ups to reorder
      the bits in code to test and raise exceptions.
      
      All the architectures that I looked at just pass the FPU status
      register to __atomic_feraiseexcept().  The simplest approach for
      hppa is to define FE_INEXACT, etc, to match the status register
      and not include <fenv.h>..
      
      2024-02-03  John David Anglin  <danglin@gcc.gnu.org>
      
      libatomic/ChangeLog:
      
      	PR target/59778
      	* configure.tgt (hppa*): Set ARCH.
      	* config/pa/fenv.c: New file.
      26635401
    • Maciej W. Rozycki's avatar
      MAINTAINERS: Update my e-mail address · 78005c64
      Maciej W. Rozycki authored
      	* MAINTAINERS: Update my e-mail address.
      78005c64
    • Jakub Jelinek's avatar
      wide-int: Fix up wi::bswap_large [PR113722] · 09df058a
      Jakub Jelinek authored
      Since bswap has been converted from a method to a function we miscompile
      the following testcase.  The problem is the assumption that the passed in
      len argument (number of limbs in the xval array) is the upper bound for the
      bswap result, which is true only if precision is <= 64.  If precision is
      larger than that, e.g. 128 as in the testcase, if the argument has only
      one limb (i.e. 0 to ~(unsigned HOST_WIDE_INT) 0), the result can still
      need 2 limbs for that precision, or generally BLOCKS_NEEDED (precision)
      limbs, it all depends on how many least significant limbs of the operand
      are zero.  bswap_large as implemented only cleared len limbs of result,
      then swapped the bytes (invoking UB when oring something in all the limbs
      above it) and finally passed len to canonize, saying that more limbs
      aren't needed.
      
      The following patch fixes it by renaming len to xlen (so that it is clear
      it is X's length), using it solely for safe_uhwi argument when we attempt
      to read from X, and using new len = BLOCKS_NEEDED (precision) instead in
      the other two spots (i.e. when clearing the val array, turned it also
      into memset, and in canonize argument).  wi::bswap asserts it isn't invoked
      on widest_int, so we are always invoked on wide_int or similar and those
      have preallocated result sized for the corresponding precision (i.e.
      BLOCKS_NEEDED (precision)).
      
      2024-02-03  Jakub Jelinek  <jakub@redhat.com>
      
      	PR middle-end/113722
      	* wide-int.cc (wi::bswap_large): Rename third argument from
      	len to xlen and adjust use in safe_uhwi.  Add len variable, set
      	it to BLOCKS_NEEDED (precision) and use it for clearing of val
      	and as canonize argument.  Clear val using memset instead of
      	a loop.
      
      	* gcc.dg/pr113722.c: New test.
      09df058a
    • Jakub Jelinek's avatar
      ggc-common: Fix save PCH assertion · a4e24064
      Jakub Jelinek authored
      We are getting a gnuradio PCH ICE
      /usr/include/pybind11/stl.h:447:1: internal compiler error: in gt_pch_save, at ggc-common.cc:693
      0x1304e7d gt_pch_save(_IO_FILE*)
              ../../gcc/ggc-common.cc:693
      0x12a45fb c_common_write_pch()
              ../../gcc/c-family/c-pch.cc:175
      0x18ad711 c_parse_final_cleanups()
              ../../gcc/cp/decl2.cc:5062
      0x213988b c_common_parse_file()
              ../../gcc/c-family/c-opts.cc:1319
      (unfortunately it isn't reproduceable always, but often needs
      up to 100 attempts, isn't reproduceable in a cross etc.).
      The bug is in the assertion I've added in gt_pch_save when adding
      relocation support for the PCH files in case they happen not to be
      mmapped at the selected address.
      addr is a relocated address which points to a location in the PCH
      blob (starting at mmi.preferred_base, with mmi.size bytes) which contains
      a pointer that needs to be relocated.  So the assertion is meant to
      verify the address is within the PCH blob, obviously it needs to be
      equal or above mmi.preferred_base, but I got the other comparison wrong
      and when one is very unlucky and the last sizeof (void *) bytes of the
      blob happen to be a pointer which needs to be relocated, such as on the
      s390x host addr 0x8008a04ff8, mmi.preferred_base 0x8000000000 and
      mmi.size 0x8a05000, addr + sizeof (void *) is equal to mmi.preferred_base +
      mmi.size and that is still fine, both addresses are end of something.
      
      2024-02-03  Jakub Jelinek  <jakub@redhat.com>
      
      	* ggc-common.cc (gt_pch_save): Allow addr to be equal to
      	mmi.preferred_base + mmi.size - sizeof (void *).
      a4e24064
    • Iain Buclaw's avatar
      d: Merge dmd. druntime e770945277, phobos 6d6e0b9b9 · 51c4eb28
      Iain Buclaw authored
      D front-end changes:
      
          - Import latest fixes from dmd v2.107.0-beta.1.
          - Hex strings can now be cast to integer arrays.
          - Add support for Interpolated Expression Sequences.
      
      D runtime changes:
      
          - Import latest fixes from druntime v2.107.0-beta.1.
          - New core.interpolation module to provide run-time support for D
            interpolated expression sequence literals.
      
      Phobos changes:
      
          - Import latest fixes from phobos v2.107.0-beta.1.
          - `std.range.primitives.isBidirectionalRange', and
            `std.range.primitives.isRandomAccessRange' now take an optional
            element type.
      
      gcc/d/ChangeLog:
      
      	* dmd/MERGE: Merge upstream dmd e770945277.
      	* Make-lang.in (D_FRONTEND_OBJS): Add d/basicmangle.o, d/enumsem.o,
      	d/funcsem.o, d/templatesem.o.
      	* d-builtins.cc (build_frontend_type): Update for new front-end
      	interface.
      	* d-codegen.cc (declaration_type): Likewise.
      	(parameter_type): Likewise.
      	* d-incpath.cc (add_globalpaths): Likewise.
      	(add_filepaths): Likewise.
      	(add_import_paths): Likewise.
      	* d-lang.cc (d_init_options): Likewise.
      	(d_handle_option): Likewise.
      	(d_parse_file): Likewise.
      	* decl.cc (DeclVisitor::finish_vtable): Likewise.
      	(DeclVisitor::visit (FuncDeclaration *)): Likewise.
      	(get_symbol_decl): Likewise.
      	* expr.cc (ExprVisitor::visit (StringExp *)): Likewise.
      	Implement support for 8-byte hexadecimal strings.
      	* typeinfo.cc (create_tinfo_types): Update internal TypeInfo
      	representation.
      	(TypeInfoVisitor::visit (TypeInfoConstDeclaration *)): Update for new
      	front-end interface.
      	(TypeInfoVisitor::visit (TypeInfoInvariantDeclaration *)): Likewise.
      	(TypeInfoVisitor::visit (TypeInfoSharedDeclaration *)): Likewise.
      	(TypeInfoVisitor::visit (TypeInfoWildDeclaration *)): Likewise.
      	(TypeInfoVisitor::visit (TypeInfoClassDeclaration *)): Move data for
      	TypeInfo_Class.nameSig to the end of the object.
      	(create_typeinfo): Update for new front-end interface.
      
      libphobos/ChangeLog:
      
      	* libdruntime/MERGE: Merge upstream druntime e770945277.
      	* libdruntime/Makefile.am (DRUNTIME_SOURCES): Add
      	core/interpolation.d.
      	* libdruntime/Makefile.in: Regenerate.
      	* src/MERGE: Merge upstream phobos 6d6e0b9b9.
      51c4eb28
    • Xi Ruoyao's avatar
      LoongArch: Fix an ODR violation · 854b8555
      Xi Ruoyao authored
      When bootstrapping GCC 14 with --with-build-config=bootstrap-lto, an ODR
      violation is detected:
      
          ../../gcc/config/loongarch/loongarch-opts.cc:57: warning:
          'abi_minimal_isa' violates the C++ One Definition Rule [-Wodr]
          57 | abi_minimal_isa[N_ABI_BASE_TYPES][N_ABI_EXT_TYPES];
          ../../gcc/config/loongarch/loongarch-def.cc:186: note:
          'abi_minimal_isa' was previously declared here
          186 |   abi_minimal_isa = array<array<loongarch_isa, N_ABI_EXT_TYPES>,
          ../../gcc/config/loongarch/loongarch-def.cc:186: note:
          code may be misoptimized unless '-fno-strict-aliasing' is used
      
      Fix it by adding a proper declaration of abi_minimal_isa into
      loongarch-def.h and remove the ODR-violating local declaration in
      loongarch-opts.cc.
      
      gcc/ChangeLog:
      
      	* config/loongarch/loongarch-def.h (abi_minimal_isa): Declare.
      	* config/loongarch/loongarch-opts.cc (abi_minimal_isa): Remove
      	the ODR-violating locale declaration.
      854b8555
    • Iain Buclaw's avatar
      libphobos: Merge upstream phobos c6e1f98fa · 11495888
      Iain Buclaw authored
      Phobos changes:
      
          - std.uni has been upgraded from Unicode 15.0.0 to 15.1.0.
      
      libphobos/ChangeLog:
      
      	* src/MERGE: Merge upstream phobos c6e1f98fa.
      11495888
    • GCC Administrator's avatar
      Daily bump. · 4b7d4d8a
      GCC Administrator authored
      4b7d4d8a
    • Patrick Palka's avatar
      c++: requires-exprs and partial constraint subst [PR110006] · 686b5eb9
      Patrick Palka authored
      
      In r11-3261-gb28b621ac67bee we made tsubst_requires_expr never partially
      substitute into a requires-expression so as to avoid checking its
      requirements out of order during e.g. generic lambda regeneration.
      
      These PRs however illustrate that we still sometimes do need to
      partially substitute into a requires-expression, in particular when it
      appears in associated constraints that we're directly substituting for
      sake of declaration matching or dguide constraint rewriting.  In these
      cases we're being called from tsubst_constraint during which
      processing_constraint_expression_p is true, so this patch checks this
      predicate to control whether we defer substitution or partially
      substitute.
      
      In turn, we now need to propagate semantic tsubst flags through
      tsubst_requires_expr rather than just using tf_none, notably for sake of
      dguide constraint rewriting which sets tf_dguide.
      
      	PR c++/110006
      	PR c++/112769
      
      gcc/cp/ChangeLog:
      
      	* constraint.cc (subst_info::quiet): Accomodate non-diagnostic
      	tsubst flags.
      	(tsubst_valid_expression_requirement): Likewise.
      	(tsubst_simple_requirement): Return a substituted _REQ node when
      	processing_template_decl.
      	(tsubst_type_requirement_1): Accomodate non-diagnostic tsubst
      	flags.
      	(tsubst_type_requirement): Return a substituted _REQ node when
      	processing_template_decl.
      	(tsubst_compound_requirement): Likewise.  Accomodate non-diagnostic
      	tsubst flags.
      	(tsubst_nested_requirement): Likewise.
      	(tsubst_requires_expr): Don't defer partial substitution when
      	processing_constraint_expression_p is true, in which case return
      	a substituted REQUIRES_EXPR.
      	* pt.cc (tsubst_expr) <case REQUIRES_EXPR>: Accomodate
      	non-diagnostic tsubst flags.
      
      gcc/testsuite/ChangeLog:
      
      	* g++.dg/cpp2a/class-deduction-alias18.C: New test.
      	* g++.dg/cpp2a/concepts-friend16.C: New test.
      
      Reviewed-by: default avatarJason Merrill <jason@redhat.com>
      686b5eb9
    • Gaius Mulley's avatar
      PR modula2/113730 Unexpected handling of mixed-precision integer arithmetic · 64b0130b
      Gaius Mulley authored
      
      This patch fixes a bug which occurs when an expression is created with
      a ZType and an integer or cardinal.  The resulting subexpression is
      incorrecly given a ZType which allows compatibility with another
      integer/cardinal type.  The solution was to fix the subexpression
      type.  In turn this required a minor change to SArgs.mod.
      
      gcc/m2/ChangeLog:
      
      	PR modula2/113730
      	* gm2-compiler/M2Base.mod (IsUserType): New procedure function.
      	(MixTypes): Use IsUserType instead of IsType before calling MixTypes.
      	* gm2-compiler/M2GenGCC.mod (GetTypeMode): Remove and import from
      	SymbolTable.
      	(CodeBinaryCheck): Replace call to MixTypes with MixTypesBinary.
      	(CodeBinary): Replace call to MixTypes with MixTypesBinary.
      	(CodeIfLess): Replace MixTypes with ComparisonMixTypes.
      	(CodeIfGre): Replace MixTypes with ComparisonMixTypes.
      	(CodeIfLessEqu): Replace MixTypes with ComparisonMixTypes.
      	(CodeIfGreEqu): Replace MixTypes with ComparisonMixTypes.
      	(CodeIfEqu): Replace MixTypes with ComparisonMixTypes.
      	(CodeIfNotEqu): Replace MixTypes with ComparisonMixTypes.
      	(ComparisonMixTypes): New procedure function.
      	* gm2-compiler/M2Quads.mod (BuildEndFor): Replace GenQuadO
      	with GenQuadOtok and pass tokenpos for the operands to the AddOp
      	and XIndrOp.
      	(CheckRangeIncDec): Check etype against NulSym and dtype for a
      	pointer and set etype to Address.
      	(BuildAddAdrFunction): New variable opa.  Convert operand to an
      	address and save result in opa.  Replace GenQuad with GenQuadOtok.
      	(BuildSubAdrFunction): New variable opa.  Convert operand to an
      	address and save result in opa.  Replace GenQuad with GenQuadOtok.
      	(BuildDiffAdrFunction): New variable opa.  Convert operand to an
      	address and save result in opa.  Replace GenQuad with GenQuadOtok.
      	(calculateMultipicand): Replace GenQuadO with GenQuadOtok.
      	(ConvertToAddress): New procedure function.
      	(BuildDynamicArray): Convert index to address before adding to
      	the base.
      	* gm2-compiler/SymbolTable.def (GetTypeMode): New procedure function.
      	* gm2-compiler/SymbolTable.mod (GetTypeMode): New procedure
      	function implemented (moved from M2GenGCC.mod).
      	* gm2-libs/SArgs.mod (GetArg): Replace cast to PtrToChar with ADDRESS.
      
      gcc/testsuite/ChangeLog:
      
      	PR modula2/113730
      	* gm2/extensions/fail/arith1.mod: New test.
      	* gm2/extensions/fail/arith2.mod: New test.
      	* gm2/extensions/fail/arith3.mod: New test.
      	* gm2/extensions/fail/arith4.mod: New test.
      	* gm2/extensions/fail/arithpromote.mod: New test.
      	* gm2/extensions/fail/extensions-fail.exp: New test.
      	* gm2/linking/fail/badimp.def: New test.
      	* gm2/linking/fail/badimp.mod: New test.
      	* gm2/linking/fail/linking-fail.exp: New test.
      	* gm2/linking/fail/testbadimp.mod: New test.
      
      Signed-off-by: default avatarGaius Mulley <gaiusmod2@gmail.com>
      64b0130b
  4. Feb 02, 2024
    • Tamar Christina's avatar
      middle-end: check memory accesses in the destination block [PR113588]. · 85094e2a
      Tamar Christina authored
      When analyzing loads for early break it was always the intention that for the
      exit where things get moved to we only check the loads that can be reached from
      the condition.
      
      However the main loop checks all loads and we skip the destination BB.  As such
      we never actually check the loads reachable from the COND in the last BB unless
      this BB was also the exit chosen by the vectorizer.
      
      This leads us to incorrectly vectorize the loop in the PR and in doing so access
      out of bounds.
      
      gcc/ChangeLog:
      
      	PR tree-optimization/113588
      	PR tree-optimization/113467
      	* tree-vect-data-refs.cc
      	(vect_analyze_data_ref_dependence):  Choose correct dest and fix checks.
      	(vect_analyze_early_break_dependences): Update comments.
      
      gcc/testsuite/ChangeLog:
      
      	PR tree-optimization/113588
      	PR tree-optimization/113467
      	* gcc.dg/vect/vect-early-break_108-pr113588.c: New test.
      	* gcc.dg/vect/vect-early-break_109-pr113588.c: New test.
      85094e2a
    • Andrew Pinski's avatar
      Fix some of vect-avg-*.c testcases · 48148a0b
      Andrew Pinski authored
      
      The vect-avg-*.c testcases are trying to make sure
      the AVG internal function are used and not
      doing promotion to `vector unsigned short`
      but when V4QI is implemented, `vector(2) unsigned short`
      shows up in the detail dump file and causes the failure.
      To fix this checking the optimized dump instead of the vect dump
      for `vector unsigned short` to make sure the vectorizer does not
      do the promotion.
      
      Built and tested for aarch64-linux-gnu.
      
      gcc/testsuite/ChangeLog:
      
      	* gcc.dg/vect/vect-avg-1.c: Check optimized dump
      	for `vector *signed short` instead of the `vect` dump.
      	* gcc.dg/vect/vect-avg-11.c: Likewise.
      	* gcc.dg/vect/vect-avg-12.c: Likewise.
      	* gcc.dg/vect/vect-avg-13.c: Likewise.
      	* gcc.dg/vect/vect-avg-14.c: Likewise.
      	* gcc.dg/vect/vect-avg-2.c: Likewise.
      	* gcc.dg/vect/vect-avg-3.c: Likewise.
      	* gcc.dg/vect/vect-avg-4.c: Likewise.
      	* gcc.dg/vect/vect-avg-5.c: Likewise.
      	* gcc.dg/vect/vect-avg-6.c: Likewise.
      	* gcc.dg/vect/vect-avg-7.c: Likewise.
      	* gcc.dg/vect/vect-avg-8.c: Likewise.
      
      Signed-off-by: default avatarAndrew Pinski <quic_apinski@quicinc.com>
      48148a0b
    • Iain Buclaw's avatar
      d: Merge dmd, druntime bce5c1f7b5, phobos e4d0dd513. · f2043599
      Iain Buclaw authored
      D front-end changes:
      
      	- Import latest changes from dmd v2.107.0-beta.1.
      	- Keywords like `__FILE__' are now always evaluated at the
      	  callsite.
      
      D runtime changes:
      
      	- Import latest changes from druntime v2.107.0-beta.1.
      	- Added `nameSig' field to TypeInfo_Class in object.d.
      
      Phobos changes:
      
      	- Import latest changes from phobos v2.107.0-beta.1.
      
      gcc/d/ChangeLog:
      
      	* dmd/MERGE: Merge upstream dmd bce5c1f7b5.
      	* d-attribs.cc (build_attributes): Update for new front-end interface.
      	* d-lang.cc (d_parse_file): Likewise.
      	* decl.cc (DeclVisitor::visit (VarDeclaration *)): Likewise.
      	* expr.cc (build_lambda_tree): New function.
      	(ExprVisitor::visit (FuncExp *)): Use build_lambda_tree.
      	(ExprVisitor::visit (SymOffExp *)): Likewise.
      	(ExprVisitor::visit (VarExp *)): Likewise.
      	* typeinfo.cc (create_tinfo_types): Add two ulong fields to internal
      	TypeInfo representation.
      	(TypeInfoVisitor::visit (TypeInfoClassDeclaration *)): Emit stub data
      	for TypeInfo_Class.nameSig.
      	(TypeInfoVisitor::visit (TypeInfoStructDeclaration *)): Update for new
      	front-end interface.
      
      libphobos/ChangeLog:
      
      	* libdruntime/MERGE: Merge upstream druntime bce5c1f7b5.
      	* src/MERGE: Merge upstream phobos e4d0dd513.
      f2043599
    • Iain Buclaw's avatar
      d: Merge dmd, druntime d8e3976a58, phobos 7a6e95688 · 5470a9b1
      Iain Buclaw authored
      D front-end changes:
      
          - Import dmd v2.107.0-beta.1.
          - A string literal as an assert condition is deprecated.
          - Added `@standalone` for module constructors.
      
      D runtime changes:
      
          - Import druntime v2.107.0-beta.1.
      
      Phobos changes:
      
          - Import phobos v2.107.0-beta.1.
      
      gcc/d/ChangeLog:
      
      	* dmd/MERGE: Merge upstream dmd d8e3976a58.
      	* dmd/VERSION: Bump version to v2.107.0-beta.1.
      	* d-lang.cc (d_parse_file): Update for new front-end interface.
      	* modules.cc (struct module_info): Add standalonectors.
      	(build_module_tree): Implement @standalone.
      	(register_module_decl): Likewise.
      
      libphobos/ChangeLog:
      
      	* libdruntime/MERGE: Merge upstream druntime d8e3976a58.
      	* src/MERGE: Merge upstream phobos 7a6e95688.
      5470a9b1
Loading