From 2553983e76953f46c43b4ea0c9f82d70cd9db51a Mon Sep 17 00:00:00 2001 From: GCC Administrator <gccadmin@gcc.gnu.org> Date: Sun, 20 Oct 2024 00:17:57 +0000 Subject: [PATCH] Daily bump. --- gcc/ChangeLog | 76 +++++++++++++++ gcc/DATESTAMP | 2 +- gcc/c/ChangeLog | 8 ++ gcc/fortran/ChangeLog | 78 +++++++++++++++ gcc/m2/ChangeLog | 146 ++++++++++++++++++++++++++++ gcc/testsuite/ChangeLog | 209 ++++++++++++++++++++++++++++++++++++++++ libcpp/ChangeLog | 11 +++ 7 files changed, 529 insertions(+), 1 deletion(-) diff --git a/gcc/ChangeLog b/gcc/ChangeLog index 90e05a5046ee..3c2a7b774e72 100644 --- a/gcc/ChangeLog +++ b/gcc/ChangeLog @@ -1,3 +1,79 @@ +2024-10-19 Andrew Pinski <quic_apinski@quicinc.com> + + PR tree-optimization/112418 + * tree-ssa-phiopt.cc (is_factor_profitable): New function. + (factor_out_conditional_operation): Add merge argument. Remove + arg0/arg1 arguments. Return bool instead of the new phi. + Early return for virtual ops. Call is_factor_profitable to + check if the factoring would be profitable. + (pass_phiopt::execute): Call factor_out_conditional_operation + on all phis instead of just singleton phi. + * doc/invoke.texi (--param phiopt-factor-max-stmts-live=): Document. + * params.opt (--param=phiopt-factor-max-stmts-live=): New opt. + +2024-10-19 Greg McGary <gkm@rivosinc.com> + + * config/riscv/autovec.md (vec_mask_len_load_lanes, vec_mask_len_store_lanes): + Predicate with TARGET_VECTOR_AUTOVEC_SEGMENT + * config/riscv/riscv-opts.h (TARGET_VECTOR_AUTOVEC_SEGMENT): New macro. + * config/riscv/riscv.opt (-m(no-)autovec-segment): New option. + +2024-10-19 Craig Blackmore <craig.blackmore@embecosm.com> + + * config/riscv/riscv.cc (riscv_use_by_pieces_infrastructure_p): + New function. + (TARGET_USE_BY_PIECES_INFRASTRUCTURE_P): Define. + +2024-10-19 Craig Blackmore <craig.blackmore@embecosm.com> + + * config/riscv/riscv-string.cc (struct stringop_info): New. + (expand_block_move): Move decision making code to... + (use_vector_stringop_p): ...here. + +2024-10-19 Craig Blackmore <craig.blackmore@embecosm.com> + + * config/riscv/riscv-protos.h (get_lmul_mode): New prototype. + (expand_block_move): Add bool parameter for movmem_p. + * config/riscv/riscv-string.cc (riscv_expand_block_move_scalar): + Pass movmem_p as false to riscv_vector::expand_block_move. + (expand_block_move): Add movmem_p parameter. Return false if + loop needed and movmem_p is true. Respect TARGET_MAX_LMUL. + * config/riscv/riscv-v.cc (get_lmul_mode): New function. + * config/riscv/riscv.md (movmem<mode>): Move checking for + whether to generate inline vector code to + riscv_vector::expand_block_move by passing movmem_p as true. + +2024-10-19 David Malcolm <dmalcolm@redhat.com> + + * diagnostic.h (json::value): Remove forward decl. + +2024-10-19 David Malcolm <dmalcolm@redhat.com> + + * diagnostic-format-json.cc (json_output_format::dump): New. + * diagnostic-format-sarif.cc (sarif_output_format::dump): New. + (sarif_file_output_format::dump): New. + * diagnostic-format-text.cc (diagnostic_text_output_format::dump): + New. + * diagnostic-format-text.h (diagnostic_text_output_format::dump): + New decl. + * diagnostic-format.h (diagnostic_output_format::dump): New decls. + * diagnostic.cc (diagnostic_context::dump): New. + (diagnostic_output_format::dump): New. + * diagnostic.h (diagnostic_context::dump): New decls. + * pretty-print-format-impl.h (pp_formatted_chunks::dump): Add + "indent" param. + * pretty-print.cc (bytes_per_hexdump_line): New constant. + (print_hexdump_line): New. + (print_hexdump): New. + (output_buffer::dump): Add "indent" param and use it. Add + hexdump of current object in m_formatted_obstack and + m_chunk_obstack. + (pp_formatted_chunks::dump): Add "indent" param and use it. + (pretty_printer::dump): Likewise. Add dumping of m_show_color + and m_url_format. + * pretty-print.h (output_buffer::dump): Add "indent" param. + (pretty_printer::dump): Likewise. + 2024-10-18 Alejandro Colomar <alx@kernel.org> * tree.h (array_type_nelts_top) diff --git a/gcc/DATESTAMP b/gcc/DATESTAMP index c8d7d3442a82..f616e4b768b3 100644 --- a/gcc/DATESTAMP +++ b/gcc/DATESTAMP @@ -1 +1 @@ -20241019 +20241020 diff --git a/gcc/c/ChangeLog b/gcc/c/ChangeLog index a41dbfd29f30..c6f9d95dba68 100644 --- a/gcc/c/ChangeLog +++ b/gcc/c/ChangeLog @@ -1,3 +1,11 @@ +2024-10-19 Joseph Myers <josmyers@redhat.com> + + * c-tree.h (c_arg_info): Add c23_empty_parens. + * c-decl.cc (grokparms): Set c23_empty_parens. + (build_arg_info): Clear c23_empty_parens. + (store_parm_decls_newstyle): Do not give -Wtraditional warning for + ISO C function definition if c23_empty_parens. + 2024-10-18 Alejandro Colomar <alx@kernel.org> * c-decl.cc (one_element_array_type_p, get_parm_array_spec) diff --git a/gcc/fortran/ChangeLog b/gcc/fortran/ChangeLog index 66f59dcb7c9b..4a427efe2b8b 100644 --- a/gcc/fortran/ChangeLog +++ b/gcc/fortran/ChangeLog @@ -1,3 +1,81 @@ +2024-10-19 Tobias Burnus <tburnus@baylibre.com> + + * check.cc (is_c_interoperable): Use _(...) around to mark strings + as translatable. + * data.cc (gfc_assign_data_value): Move string literal to gfc_error + to make it translatable. + * resolve.cc (resolve_fl_variable, resolve_equivalence): Use G_(...) + around string literals. + * scanner.cc (skip_fixed_omp_sentinel): Replace '...' by %<...%>. + * trans-openmp.cc (gfc_split_omp_clauses, + gfc_trans_omp_declare_variant): Likewise. + +2024-10-19 Tobias Burnus <tburnus@baylibre.com> + + * data.cc (gfc_assign_data_value): Use linemap_location_before_p + and GFC_LOCUS_IS_SET. + * decl.cc (gfc_verify_c_interop_param): Make better translatable. + (build_sym, variable_decl, gfc_match_formal_arglist, + gfc_match_subroutine): Add range-based locations, use it in + diagnostic and gobble whitespace for better locations. + * error.cc (gfc_get_location_with_offset): Handle new format. + (gfc_get_location_range): New. + * expr.cc (gfc_check_assign): Use GFC_LOCUS_IS_SET. + * frontend-passes.cc (check_locus_code, check_locus_expr): + Likewise. + (runtime_error_ne): Use GFC_LOCUS_IS_SET. + * gfortran.h (locus): Change lb to union with lb and location. + (GFC_LOCUS_IS_SET): Define. + (gfc_get_location_range): New prototype. + (gfc_new_symbol, gfc_get_symbol, gfc_get_sym_tree, + gfc_get_ha_symbol, gfc_get_ha_sym_tree): Take optional locus + argument. + * io.cc (io_constraint): Use GFC_LOCUS_IS_SET. + * match.cc (gfc_match_sym_tree): Use range locus. + * openmp.cc (gfc_match_omp_variable_list, + gfc_match_omp_doacross_sink): Likewise. + * parse.cc (next_free): Update for locus struct change. + * primary.cc (gfc_match_varspec): Likewise. + (match_variable): Use range locus. + * resolve.cc (find_array_spec): Use GFC_LOCUS_IS_SET. + * scanner.cc (gfc_at_eof, gfc_at_bol, gfc_start_source_files, + gfc_advance_line, gfc_define_undef_line, skip_fixed_comments, + gfc_gobble_whitespace, include_stmt, gfc_new_file): Update + for locus struct change. + * symbol.cc (gfc_new_symbol, gfc_get_sym_tree, gfc_get_symbol, + gfc_get_ha_sym_tree, gfc_get_ha_symbol): Take optional locus. + * trans-array.cc (gfc_trans_array_constructor_value): Use %L not %C. + (gfc_trans_g77_array, gfc_trans_dummy_array_bias, + gfc_trans_class_array, gfc_trans_deferred_array): Replace + gfc_{save,set,restore}_backend_locus by directly using + input_location. + * trans-common.cc (build_equiv_decl, get_init_field): Likewise. + * trans-decl.cc (gfc_get_extern_function_decl, build_function_decl, + build_entry_thunks, gfc_null_and_pass_deferred_len, + gfc_trans_deferred_vars, gfc_trans_use_stmts, finish_oacc_declare, + gfc_generate_block_data): Likewise. + * trans-expr.cc (gfc_copy_class_to_class, gfc_conv_expr): Changes + to avoid gfc_current_locus. + * trans-io.cc (set_error_locus): Likewise. + * trans-openmp.cc (gfc_trans_omp_workshare): Use input_locus directly. + * trans-stmt.cc (gfc_trans_if_1): Likewise and use GFC_LOCUS_IS_SET. + * trans-types.cc (gfc_get_union_type, gfc_get_derived_type): Likewise. + * trans.cc (gfc_locus_from_location): New. + (trans_runtime_error_vararg, gfc_trans_runtime_check): Use location_t + for file + line data. + (gfc_current_backend_file, gfc_save_backend_locus, + gfc_set_backend_locus, gfc_restore_backend_locus): Remove. + (trans_code): Use input_location directly, don't set gfc_current_locus. + * trans.h (gfc_save_backend_locus, gfc_set_backend_locus, + gfc_restore_backend_locus): Remove prototypes. + (gfc_locus_from_location): Add prototype. + +2024-10-19 Thomas Koenig <tkoenig@gcc.gnu.org> + + PR fortran/117225 + * primary.cc (match_sym_complex_part): An UNSIGNED in + a complex part is an error. + 2024-10-18 Alejandro Colomar <alx@kernel.org> * trans-array.cc (structure_alloc_comps) diff --git a/gcc/m2/ChangeLog b/gcc/m2/ChangeLog index d2e35d4e8681..7f775ea92c10 100644 --- a/gcc/m2/ChangeLog +++ b/gcc/m2/ChangeLog @@ -1,3 +1,149 @@ +2024-10-19 Gaius Mulley <gaiusmod2@gmail.com> + + * gm2-compiler/M2MetaError.mod (op): Alphabetically order + each case label and comment. + +2024-10-19 Gaius Mulley <gaiusmod2@gmail.com> + + PR modula2/115328 + * gm2-compiler/M2MetaError.def: Extend comment documentating + new format specifiers. + * gm2-compiler/M2MetaError.mod (GetTokProcedure): New declaration. + (doErrorScopeModule): New procedure. + (doErrorScopeForward): Ditto. + (doErrorScopeMod): Reimplement. + (doErrorScopeFor): New procedure. + (declarationMod): Ditto. + (doErrorScopeDefinition): Ditto. + (doErrorScopeDef): Reimplement. + (declaredDef): New procedure. + (declaredFor): Ditto. + (doErrorScopeProc): Ditto. + (declaredVar): Ditto. + (declaredType): Ditto. + (declaredFull): Ditto. + * gm2-compiler/M2Options.mod (SetAutoInit): Add missing + return type. + (GetDumpGimple): Remove duplicate implementation. + * gm2-compiler/M2Quads.def (DupFrame): New procedure. + * gm2-compiler/M2Quads.mod (DupFrame): New procedure. + * gm2-compiler/M2Reserved.def (ForwardTok): New variable. + * gm2-compiler/M2Reserved.mod (ForwardTok): Initialize variable. + * gm2-compiler/M2Scaffold.mod (DeclareArgEnvParams): Add + tokno parameter for call to PutParam. + * gm2-compiler/P0SymBuild.def (EndForward): New procedure. + * gm2-compiler/P0SymBuild.mod (EndForward): New procedure. + * gm2-compiler/P0SyntaxCheck.bnf (BlockAssert): New procedure. + (ProcedureDeclaration): Reimplement rule. + (PostProcedureHeading): New rule. + (ForwardDeclaration): Ditto. + (ProperProcedure): Ditto. + * gm2-compiler/P1Build.bnf (ProcedureDeclaration): Reimplement rule. + (PostProcedureHeading): New rule. + (ForwardDeclaration): Ditto. + (ProperProcedure): Ditto. + * gm2-compiler/P1SymBuild.def (Export): Removed unnecessary + export. + (EndBuildForward): New procedure. + * gm2-compiler/P1SymBuild.mod (StartBuildProcedure): Reimplement. + (EndBuildProcedure): Ditto. + (EndBuildForward): Ditto. + * gm2-compiler/P2Build.bnf (ProcedureDeclaration): Reimplement rule. + (PostProcedureHeading): New rule. + (ForwardDeclaration): Ditto. + (ProperProcedure): Ditto. + * gm2-compiler/P2SymBuild.def (BuildProcedureDefinedByForward): + New procedure. + (BuildProcedureDefinedByProper): Ditto. + (CheckProcedure): Ditto. + (EndBuildForward): Ditto. + * gm2-compiler/P2SymBuild.mod (EndBuildProcedure): Reimplement. + (EndBuildForward): New procedure. + (BuildFPSection): Reimplement to allow forward declaration or + checking of parameters. + (BuildProcedureDefinedByProper): New procedure. + (BuildProcedureDefinedByForward): Ditto + (FailParameter): Remove. + (ParameterError): New procedure. + (ParameterMismatch): Ditto. + (EndBuildFormalParameters): Add parameter number check. + (GetComparison): New procedure function. + (GetSourceDesc): Ditto. + (GetCurSrcDesc): Ditto. + (GetDeclared): New procedure. + (ReturnTypeMismatch): Ditto. + (BuildFunction): Reimplement. + (CheckProcedure): New procedure. + (CheckFormalParameterSection): Reimplement using ParameterError. + * gm2-compiler/P3Build.bnf (ProcedureDeclaration): Reimplement rule. + (PostProcedureHeading): New rule. + (ForwardDeclaration): Ditto. + (ProperProcedure): Ditto. + * gm2-compiler/P3SymBuild.def (Export): Remove unnecessary export. + (EndBuildForward): New procedure. + * gm2-compiler/P3SymBuild.mod (EndBuildForward): New procedure. + * gm2-compiler/PCBuild.bnf (ProcedureDeclaration): Reimplement rule. + (PostProcedureHeading): New rule. + (ForwardDeclaration): Ditto. + (ProperProcedure): Ditto. + * gm2-compiler/PCSymBuild.def (EndBuildForward): New procedure. + * gm2-compiler/PCSymBuild.mod (EndBuildForward): Ditto. + * gm2-compiler/PHBuild.bnf (ProcedureDeclaration): Reimplement rule. + (PostProcedureHeading): New rule. + (ForwardDeclaration): Ditto. + (ProperProcedure): Ditto. + * gm2-compiler/SymbolTable.def (PutVarTok): New procedure. + (PutParam): Add typetok parameter. + (PutVarParam): Ditto. + (PutParamName): Ditto. + (GetDeclaredFor): New procedure function. + (AreParametersDefinedInDefinition): Ditto. + (PutParametersDefinedByForward): New procedure. + (GetParametersDefinedByForward): New procedure function. + (PutParametersDefinedByProper): New procedure. + (GetParametersDefinedByProper): New procedure function. + (GetProcedureDeclaredForward): Ditto. + (PutProcedureDeclaredForward): New procedure. + (GetProcedureDeclaredProper): New procedure function. + (PutProcedureDeclaredProper): New procedure. + (GetProcedureDeclaredDefinition): New procedure function. + (PutProcedureDeclaredDefinition): New procedure. + (GetVarDeclTypeTok): Ditto. + (PutVarDeclTypeTok): New procedure. + (GetVarDeclTok): Ditto. + (PutVarDeclTok): New procedure. + (GetVarDeclFullTok): Ditto. + * gm2-compiler/SymbolTable.mod (ProcedureDecl): New record type. + (VarDecl): Ditto. + (SymProcedure): Add new field Declared. + (SymVar): Add new field Declared. + (PutVarTok): New procedure. + (PutParam): Add typetok parameter. + (PutVarParam): Ditto. + (PutParamName): Ditto. + (GetDeclaredFor): New procedure function. + (AreParametersDefinedInDefinition): Ditto. + (PutParametersDefinedByForward): New procedure. + (GetParametersDefinedByForward): New procedure function. + (PutParametersDefinedByProper): New procedure. + (GetParametersDefinedByProper): New procedure function. + (GetProcedureDeclaredForward): Ditto. + (PutProcedureDeclaredForward): New procedure. + (GetProcedureDeclaredProper): New procedure function. + (PutProcedureDeclaredProper): New procedure. + (GetProcedureDeclaredDefinition): New procedure function. + (PutProcedureDeclaredDefinition): New procedure. + (GetVarDeclTypeTok): Ditto. + (PutVarDeclTypeTok): New procedure. + (GetVarDeclTok): Ditto. + (PutVarDeclTok): New procedure. + (GetVarDeclFullTok): Ditto. + (MakeProcedure): Initialize Declared field. + (MakeVar): Initialize Declared field. + * gm2-libs-log/FileSystem.def (FileNameChar): Add + missing return type. + * m2.flex: Add FORWARD keyword. + 2024-10-04 Gaius Mulley <gaiusmod2@gmail.com> PR modula2/116918 diff --git a/gcc/testsuite/ChangeLog b/gcc/testsuite/ChangeLog index 1119ab5016b4..658829c91dc8 100644 --- a/gcc/testsuite/ChangeLog +++ b/gcc/testsuite/ChangeLog @@ -1,3 +1,212 @@ +2024-10-19 Lewis Hyatt <lhyatt@gmail.com> + + PR preprocessor/114423 + * c-c++-common/cpp/pragma-diagnostic-loc.c: New test. + * c-c++-common/cpp/diagnostic-pragma-1.c: Adjust expected output. + * g++.dg/pch/operator-1.C: Likewise. + +2024-10-19 Andrew Pinski <quic_apinski@quicinc.com> + + PR tree-optimization/112418 + * gcc.dg/tree-ssa/factor_op_phi-1.c: New test. + * gcc.dg/tree-ssa/factor_op_phi-2.c: New test. + * gcc.dg/tree-ssa/factor_op_phi-3.c: New test. + * gcc.dg/tree-ssa/factor_op_phi-4.c: New test. + +2024-10-19 Greg McGary <gkm@rivosinc.com> + + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg-1.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg-2.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg-3.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg-4.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg-5.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg-6.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg-7.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg_run-1.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg_run-2.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg_run-3.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg_run-4.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg_run-5.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg_run-6.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_load_noseg_run-7.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg-1.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg-2.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg-3.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg-4.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg-5.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg-6.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg-7.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg_run-1.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg_run-2.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg_run-3.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg_run-4.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg_run-5.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg_run-6.c: + New test. + * gcc.target/riscv/rvv/autovec/struct/mask_struct_store_noseg_run-7.c: + New test. + * gcc.target/riscv/rvv/autovec/no-segment.c: New test. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-1.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-10.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-11.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-12.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-13.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-14.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-15.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-16.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-17.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-18.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-2.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-3.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-4.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-5.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-6.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-7.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-8.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg-9.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-1.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-10.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-11.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-12.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-13.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-14.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-15.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-16.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-17.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-18.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-2.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-3.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-4.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-5.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-6.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-7.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-8.c: New file. + * gcc.target/riscv/rvv/autovec/struct/struct_vect_noseg_run-9.c: New file. + +2024-10-19 Thomas Koenig <tkoenig@gcc.gnu.org> + + PR fortran/117225 + * gfortran.dg/unsigned_38.f90: Add missing dg-error directive. + +2024-10-19 Craig Blackmore <craig.blackmore@embecosm.com> + + * gcc.target/riscv/rvv/autovec/pr113469.c: Expect mf2 setmem. + * gcc.target/riscv/rvv/base/setmem-2.c: Update f1 to expect + straight-line vector memset. + * gcc.target/riscv/rvv/base/setmem-3.c: Likewise. + +2024-10-19 Craig Blackmore <craig.blackmore@embecosm.com> + + * gcc.target/riscv/rvv/autovec/pr113206-1.c: Add + -mrvv-max-lmul=m8. + * gcc.target/riscv/rvv/autovec/pr113206-2.c: Likewise. + * gcc.target/riscv/rvv/autovec/vls/calling-convention-1.c: Add + -mrvv-max-lmul=m8 and adjust assembly scans. + * gcc.target/riscv/rvv/autovec/vls/calling-convention-2.c: + Likewise. + * gcc.target/riscv/rvv/autovec/vls/calling-convention-3.c: + Likewise. + * gcc.target/riscv/rvv/autovec/vls/calling-convention-4.c: + Likewise. + * gcc.target/riscv/rvv/autovec/vls/calling-convention-5.c: + Likewise. + * gcc.target/riscv/rvv/autovec/vls/calling-convention-6.c: + Likewise. + * gcc.target/riscv/rvv/autovec/vls/calling-convention-7.c: + Likewise. + * gcc.target/riscv/rvv/autovec/vls/spill-4.c: Add + -mrvv-max-lmul=m8. + * gcc.target/riscv/rvv/autovec/vls/spill-7.c: Likewise. + * gcc.target/riscv/rvv/base/cpymem-1.c: Expect m1 in f1 and f2. + * gcc.target/riscv/rvv/base/cpymem-2.c: Add -mrvv-max-lmul=m8. + * gcc.target/riscv/rvv/base/movmem-1.c: Adjust f1 to a length + that will not get vectorized. + * gcc.target/riscv/rvv/base/pr111720-0.c: Add -mrvv-max-lmul=m8. + * gcc.target/riscv/rvv/base/pr111720-1.c: Likewise. + * gcc.target/riscv/rvv/base/pr111720-2.c: Likewise. + * gcc.target/riscv/rvv/base/pr111720-3.c: Likewise. + * gcc.target/riscv/rvv/base/pr111720-4.c: Likewise. + * gcc.target/riscv/rvv/base/pr111720-5.c: Likewise. + * gcc.target/riscv/rvv/base/pr111720-6.c: Likewise. + * gcc.target/riscv/rvv/base/pr111720-7.c: Likewise. + * gcc.target/riscv/rvv/base/pr111720-8.c: Likewise. + * gcc.target/riscv/rvv/base/pr111720-9.c: Likewise. + * gcc.target/riscv/rvv/vsetvl/pr112929-1.c: Expect memcpy m1 + loops. + * gcc.target/riscv/rvv/vsetvl/pr112988-1.c: Likewise. + +2024-10-19 Gaius Mulley <gaiusmod2@gmail.com> + + PR modula2/115328 + * gm2/iso/fail/badparam.def: New test. + * gm2/iso/fail/badparam.mod: New test. + * gm2/iso/fail/badparam2.def: New test. + * gm2/iso/fail/badparam2.mod: New test. + * gm2/iso/fail/badparam3.def: New test. + * gm2/iso/fail/badparam3.mod: New test. + * gm2/iso/fail/badparamarray.def: New test. + * gm2/iso/fail/badparamarray.mod: New test. + * gm2/iso/fail/simpledef1.def: New test. + * gm2/iso/fail/simpledef1.mod: New test. + * gm2/iso/fail/simpleforward.mod: New test. + * gm2/iso/fail/simpleforward2.mod: New test. + * gm2/iso/fail/simpleforward3.mod: New test. + * gm2/iso/fail/simpleforward4.mod: New test. + * gm2/iso/fail/simpleforward5.mod: New test. + * gm2/iso/fail/simpleforward7.mod: New test. + * gm2/iso/pass/simpleforward.mod: New test. + * gm2/iso/pass/simpleforward6.mod: New test. + +2024-10-19 Tobias Burnus <tburnus@baylibre.com> + + * gfortran.dg/bounds_check_25.f90: Update expected column + in the diagnostic. + * gfortran.dg/goacc/pr92793-1.f90: Likewise. + * gfortran.dg/gomp/allocate-14.f90: Likewise. + * gfortran.dg/gomp/polymorphic-mapping.f90: Likewise. + * gfortran.dg/gomp/reduction5.f90: Likewise. + * gfortran.dg/gomp/reduction6.f90: Likewise. + +2024-10-19 Thomas Koenig <tkoenig@gcc.gnu.org> + + PR fortran/117225 + * gfortran.dg/unsigned_38.f90: New test. + +2024-10-19 David Malcolm <dmalcolm@redhat.com> + + * gcc.dg/plugin/diagnostic_plugin_xhtml_format.c + (xhtml_output_format::dump): New. + +2024-10-19 Joseph Myers <josmyers@redhat.com> + + * gcc.dg/wtr-gnu17-1.c, gcc.dg/wtr-gnu23-1.c: New tests. + 2024-10-18 Thomas Koenig <tkoenig@gcc.gnu.org> * gfortran.dg/unsigned_37.f90: New test. diff --git a/libcpp/ChangeLog b/libcpp/ChangeLog index c692f94e3e58..350bac883219 100644 --- a/libcpp/ChangeLog +++ b/libcpp/ChangeLog @@ -1,3 +1,14 @@ +2024-10-19 Lewis Hyatt <lhyatt@gmail.com> + + PR preprocessor/114423 + * internal.h (struct cpp_reader): Add DIAGNOSTIC_OVERRIDE_LOC + field. + * directives.cc (destringize_and_run): Set the new field to the + location of the _Pragma operator. + * errors.cc (cpp_diagnostic_at): Support DIAGNOSTIC_OVERRIDE_LOC to + temporarily issue diagnostics at a different location. + (cpp_diagnostic_with_line): Likewise. + 2024-10-17 Jakub Jelinek <jakub@redhat.com> PR c/117028 -- GitLab