[Bug fortran/49278] ICE (segfault) when combining DATA with default initialization

2021-03-01 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=49278 --- Comment #28 from anlauf at gcc dot gnu.org --- Patch for accepts-invalid / ice-on-invalid-code (parameter + data) part: https://gcc.gnu.org/pipermail/fortran/2021-March/055768.html

[Bug fortran/99368] ICE in build_function_decl, at fortran/trans-decl.c:2381

2021-03-03 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99368 anlauf at gcc dot gnu.org changed: What|Removed |Added Keywords||diagnostic Last reconfirmed

[Bug libfortran/99218] [8/9/10/11 Regression] matmul on temporary array accesses invalid memory (segfault)

2021-03-07 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99218 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|ASSIGNED|RESOLVED Resolution|-

[Bug fortran/99345] [11 Regression] ICE in doloop_contained_procedure_code, at fortran/frontend-passes.c:2464 since r11-2578-g27eac9ee6137a6b5

2021-03-08 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99345 --- Comment #10 from anlauf at gcc dot gnu.org --- Further reduced: DO iq = 1, nq CALL calc_upper_fan (iq) ENDDO CONTAINS SUBROUTINE calc_upper_fan (iq) INTEGER :: iq INTEGER :: recl INQUIRE(IOLENGTH=recl) iq END END

[Bug fortran/99205] [10/11 Regression] Out of memory with undefined character length

2021-03-08 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99205 anlauf at gcc dot gnu.org changed: What|Removed |Added Last reconfirmed||2021-03-08 Status

[Bug fortran/99205] [10/11 Regression] Out of memory with undefined character length

2021-03-08 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99205 --- Comment #2 from anlauf at gcc dot gnu.org --- This fixes the testcase and passes regtesting: diff --git a/gcc/fortran/data.c b/gcc/fortran/data.c index 25e97930169..71e2552025d 100644 --- a/gcc/fortran/data.c +++ b/gcc/fortran/data.c @@ -595,

[Bug fortran/99205] [10/11 Regression] Out of memory with undefined character length

2021-03-09 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99205 anlauf at gcc dot gnu.org changed: What|Removed |Added Assignee|unassigned at gcc dot gnu.org |anlauf at gcc dot gnu.

[Bug fortran/99506] internal compiler error: in record_reference, at cgraphbuild.c:64

2021-03-10 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99506 --- Comment #6 from anlauf at gcc dot gnu.org --- (In reply to Richard Biener from comment #4) > I don't know fortran enough for what 'parameter' means in this context: > >real(double), parameter:: latt(jmax) = [(latt100(i)/100.d0, j=1,jmax)

[Bug fortran/99112] [11 Regression] ICE in gfc_conv_component_ref, at fortran/trans-expr.c:2646

2021-03-11 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99112 --- Comment #3 from anlauf at gcc dot gnu.org --- (In reply to Paul Thomas from comment #2) > For whatever reason, the chunk in gfc_conv_intrinsic_size doesn't quite work > correctly because the wrong message is selected. Thus a bit more work is >

[Bug fortran/99112] [11 Regression] ICE in gfc_conv_component_ref, at fortran/trans-expr.c:2646

2021-03-12 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99112 --- Comment #4 from anlauf at gcc dot gnu.org --- A simple one-liner on top of Paul's patch fixes it: diff --git a/gcc/fortran/trans-intrinsic.c b/gcc/fortran/trans-intrinsic.c index 9cf3642f694..5e53d1162fa 100644 --- a/gcc/fortran/trans-intrins

[Bug fortran/99585] New: ICE with SIZE intrinsic on nested derived type components

2021-03-14 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99585 Bug ID: 99585 Summary: ICE with SIZE intrinsic on nested derived type components Product: gcc Version: 11.0 Status: UNCONFIRMED Severity: normal Prior

[Bug fortran/99585] ICE with SIZE intrinsic on nested derived type components

2021-03-14 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99585 anlauf at gcc dot gnu.org changed: What|Removed |Added Priority|P3 |P4 Keywords|

[Bug fortran/99112] [11 Regression] ICE in gfc_conv_component_ref, at fortran/trans-expr.c:2646

2021-03-14 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99112 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|NEW |RESOLVED Resolution|-

[Bug fortran/99585] ICE with SIZE intrinsic on nested derived type components

2021-03-14 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99585 --- Comment #1 from anlauf at gcc dot gnu.org --- Reduced example: module m type t end type type t2 type(t), allocatable :: my(:) end type t2 contains function h (x) result(z) class(t2) :: x(:) type(t) :: z(size(x(1)%my))

[Bug fortran/99585] ICE with SIZE intrinsic on nested derived type components

2021-03-14 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99585 --- Comment #2 from anlauf at gcc dot gnu.org --- Actually the SIZE intrinsic might be a red herring, as the following variant does also ICE: module m type t end type type t2 integer :: n end type t2 contains function h (x) result(

[Bug fortran/99138] ICE in gfc_match_rvalue, at fortran/primary.c:3738

2021-03-15 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99138 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug fortran/99602] [11 regression] runtime error: pointer actual argument not associated

2021-03-16 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99602 --- Comment #14 from anlauf at gcc dot gnu.org --- (In reply to Jürgen Reuter from comment #13) > Cool, thanks for the quick reaction, Paul. Maybe Harald can have a look at > it as well :D LGTM. It's by Paul. He simply needs to get the testcase

[Bug fortran/99138] ICE in gfc_match_rvalue, at fortran/primary.c:3738

2021-03-16 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99138 --- Comment #7 from anlauf at gcc dot gnu.org --- The patch in comment#6 generates an unexpected error: pr99138.f90:11:2: 11 | module function f(x) | 1 Error: Type mismatch in function result (CLASS(STAR)/CLASS(*)) between the MODULE

[Bug fortran/99138] ICE in gfc_match_rvalue, at fortran/primary.c:3738

2021-03-16 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99138 --- Comment #8 from anlauf at gcc dot gnu.org --- The check in interface.c:gfc_check_result_characteristics has an asymmetry coming from symbol.c:gfc_type_compatible that could be evaded by swapping arguments: diff --git a/gcc/fortran/interface.c

[Bug fortran/99602] [11 regression] runtime error: pointer actual argument not associated

2021-03-17 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99602 --- Comment #16 from anlauf at gcc dot gnu.org --- (In reply to Jürgen Reuter from comment #15) > > LGTM. It's by Paul. He simply needs to get the testcase's dg-foo right... > > ;-) > > Now I'm confused. So you consider the fix ok? Will it then

[Bug fortran/99609] Pure Function that has a Variable with Value Attribute that is modified

2021-03-18 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99609 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug fortran/99205] [10/11 Regression] Out of memory with undefined character length

2021-03-19 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99205 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|ASSIGNED|RESOLVED Resolution|-

[Bug fortran/99688] AddressSanitizer: stack-buffer-overflow on address at gfc_match_name(char*) gcc/fortran/match.c:685

2021-03-20 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99688 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug fortran/99709] [PDT] VALUE attribute for an object with nonconstant length parameter

2021-03-22 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99709 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|UNCONFIRMED |NEW Summary|VALUE

[Bug fortran/99369] [10/11 Regression] ICE in gfc_resolve_expr, at fortran/resolve.c:7167

2021-03-22 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99369 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug libfortran/99740] floating point exception in rand() in gfortran

2021-03-23 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99740 anlauf at gcc dot gnu.org changed: What|Removed |Added Last reconfirmed||2021-03-23 Ever confirmed

[Bug fortran/96859] Wrong answer with intrinsic merge_bits

2021-03-26 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=96859 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|ASSIGNED|WAITING --- Comment #13 from

[Bug fortran/96012] [9/10/11 Regression] ICE in fold_convert_loc, at fold-const.c:2558

2021-03-26 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=96012 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|NEW |WAITING --- Comment #6 from a

[Bug fortran/99348] ICE in resolve_structure_cons, at fortran/resolve.c:1286

2021-03-26 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99348 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug fortran/99798] ICE when compiling a variant of pr87907

2021-03-27 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99798 anlauf at gcc dot gnu.org changed: What|Removed |Added Ever confirmed|0 |1 Keywords|

[Bug fortran/99817] [10/11 Regression] ICE in create_function_arglist, at fortran/trans-decl.c:2838 (etc.)

2021-03-30 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99817 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org,

[Bug fortran/99819] [9/10/11 Regression] ICE in gfc_defer_symbol_init, at fortran/trans-decl.c:841

2021-03-30 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99819 anlauf at gcc dot gnu.org changed: What|Removed |Added Ever confirmed|0 |1 Last reconfirmed|

[Bug fortran/99840] [9/10/11 Regression] ICE in gfc_simplify_matmul, at fortran/simplify.c:4777

2021-03-30 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99840 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|UNCONFIRMED |NEW Ever confirmed|0

[Bug fortran/99839] ICE in inline_matmul_assign, at fortran/frontend-passes.c:4234

2021-03-30 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99839 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|UNCONFIRMED |NEW CC|

[Bug fortran/99839] [8/9/10/11 Regression] ICE in inline_matmul_assign, at fortran/frontend-passes.c:4234

2021-03-30 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99839 anlauf at gcc dot gnu.org changed: What|Removed |Added Target Milestone|--- |8.5 Summary|ICE in

[Bug fortran/99840] [9/10/11 Regression] ICE in gfc_simplify_matmul, at fortran/simplify.c:4777

2021-03-31 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99840 --- Comment #4 from anlauf at gcc dot gnu.org --- For reasons I do not understand, Breakpoint 1, gfc_simplify_matmul (matrix_a=0x292bbf0, matrix_b=0x292c550) at ../../gcc-trunk/gcc/fortran/simplify.c:4777 4777 result_columns = mpz_ge

[Bug fortran/99840] [9/10/11 Regression] ICE in gfc_simplify_matmul, at fortran/simplify.c:4777

2021-03-31 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99840 --- Comment #5 from anlauf at gcc dot gnu.org --- OK, now I see it. gfc_get_shape does not init the resulting shape. The following simpler patch does the job: diff --git a/gcc/fortran/simplify.c b/gcc/fortran/simplify.c index 388aca7c38c..c27b47

[Bug fortran/99840] [9/10/11 Regression] ICE in gfc_simplify_matmul, at fortran/simplify.c:4777

2021-03-31 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99840 --- Comment #8 from anlauf at gcc dot gnu.org --- Patch: https://gcc.gnu.org/pipermail/fortran/2021-March/055897.html

[Bug fortran/99840] [9/10/11 Regression] ICE in gfc_simplify_matmul, at fortran/simplify.c:4777

2021-04-02 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99840 anlauf at gcc dot gnu.org changed: What|Removed |Added Resolution|--- |FIXED Status|NEW

[Bug fortran/63797] Bogus ambiguous reference to 'sqrt'

2021-04-13 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=63797 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug fortran/63797] Bogus ambiguous reference to 'sqrt'

2021-04-13 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=63797 --- Comment #4 from anlauf at gcc dot gnu.org --- The following patch regtests ok and fixes the testcase: diff --git a/gcc/fortran/module.c b/gcc/fortran/module.c index 4db0a3ac76d..b4b7b437f86 100644 --- a/gcc/fortran/module.c +++ b/gcc/fortran/

[Bug fortran/63797] Bogus ambiguous reference to 'sqrt'

2021-04-14 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=63797 --- Comment #6 from anlauf at gcc dot gnu.org --- Steve, can you give an example for the procedure pointer case you mentioned? I played a bit, but the only valid code that I can think of did not produce a reference to sqrt in such a way that it ne

[Bug fortran/63797] Bogus ambiguous reference to 'sqrt'

2021-04-15 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=63797 --- Comment #8 from anlauf at gcc dot gnu.org --- (In reply to Steve Kargl from comment #7) > which looks like a default initialization. Does sqrt need to be > recorded into the module? If not, then your patch is probably ok. My patch actually

[Bug fortran/63797] Bogus ambiguous reference to 'sqrt'

2021-04-15 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=63797 --- Comment #9 from anlauf at gcc dot gnu.org --- Patch: https://gcc.gnu.org/pipermail/fortran/2021-April/055935.html

[Bug fortran/63797] Bogus ambiguous reference to 'sqrt'

2021-04-18 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=63797 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|NEW |RESOLVED Resolution|-

[Bug fortran/99255] ICE in gfc_dt_upper_string, at fortran/module.c:441

2021-04-18 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99255 --- Comment #2 from anlauf at gcc dot gnu.org --- Replacing class(t) :: x by class(t), allocatable :: x avoids the ICE. Could be an error recovery issue.

[Bug fortran/100136] [11 Regression] ICE, regression, using flag -fcheck=pointer

2021-04-19 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100136 --- Comment #2 from anlauf at gcc dot gnu.org --- We do not properly handle the VALUE attribute. Reduced testcase: program p implicit none class(*), allocatable :: d call add_class (d) contains subroutine add_class (d) class(*), val

[Bug fortran/100154] [9/10/11 Regression] ICE in gfc_conv_procedure_call, at fortran/trans-expr.c:6131

2021-04-20 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100154 anlauf at gcc dot gnu.org changed: What|Removed |Added Ever confirmed|0 |1 CC|

[Bug fortran/100154] [9/10/11 Regression] ICE in gfc_conv_procedure_call, at fortran/trans-expr.c:6131

2021-04-20 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100154 --- Comment #2 from anlauf at gcc dot gnu.org --- Untested patch: diff --git a/gcc/fortran/check.c b/gcc/fortran/check.c index 82db8e4e1b2..df4409840d5 100644 --- a/gcc/fortran/check.c +++ b/gcc/fortran/check.c @@ -5730,6 +5731,15 @@ gfc_check_f

[Bug fortran/100154] [9/10/11/12 Regression] ICE in gfc_conv_procedure_call, at fortran/trans-expr.c:6131

2021-04-21 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100154 --- Comment #5 from anlauf at gcc dot gnu.org --- Created attachment 50651 --> https://gcc.gnu.org/bugzilla/attachment.cgi?id=50651&action=edit WIP patch This patch reuses variable_check() and as a bonus fixes the declarations of the subroutin

[Bug fortran/100154] [9/10/11/12 Regression] ICE in gfc_conv_procedure_call, at fortran/trans-expr.c:6131

2021-04-21 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100154 anlauf at gcc dot gnu.org changed: What|Removed |Added Attachment #50651|0 |1 is obsolete|

[Bug fortran/100154] [9/10/11/12 Regression] ICE in gfc_conv_procedure_call, at fortran/trans-expr.c:6131

2021-04-21 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100154 --- Comment #7 from anlauf at gcc dot gnu.org --- (In reply to Tobias Burnus from comment #4) > as ptr_returning_func() (a function reference with data pointer result) is a > variable in the sense of the Fortran standard (F2018:R902)? Do you thi

[Bug fortran/100154] [9/10/11/12 Regression] ICE in gfc_conv_procedure_call, at fortran/trans-expr.c:6131

2021-04-21 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100154 --- Comment #8 from anlauf at gcc dot gnu.org --- (In reply to anlauf from comment #7) > Do you think the following is the right thing? Correction: diff --git a/gcc/fortran/check.c b/gcc/fortran/check.c index 82db8e4e1b2..e1ec1c610e8 100644 ---

[Bug fortran/100183] Segmentation fault at runtime when passing an internal procedure as argument

2021-04-21 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100183 --- Comment #1 from anlauf at gcc dot gnu.org --- Cannot reproduce either with GNU Fortran (SUSE Linux) 10.2.1 20200825 [revision c0746a1beb1ba073c7981eb09f55b3d993b32e5c] nor with GNU Fortran (GCC) 10.3.1 20210420 May need narrowing down to

[Bug fortran/100218] New: Allow target of the pointer resulting from the evaluation of function-reference in a variable definition context

2021-04-22 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100218 Bug ID: 100218 Summary: Allow target of the pointer resulting from the evaluation of function-reference in a variable definition context Product: gcc Version: 12

[Bug fortran/100218] Allow target of the pointer resulting from the evaluation of function-reference in a variable definition context

2021-04-22 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100218 --- Comment #1 from anlauf at gcc dot gnu.org --- Submitted: https://gcc.gnu.org/pipermail/fortran/2021-April/055976.html

[Bug fortran/100154] [9/10/11/12 Regression] ICE in gfc_conv_procedure_call, at fortran/trans-expr.c:6131

2021-04-22 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100154 anlauf at gcc dot gnu.org changed: What|Removed |Added Keywords||rejects-valid --- Comment #9

[Bug fortran/97571] long parsing phase for simple array constructor

2021-04-23 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97571 --- Comment #6 from anlauf at gcc dot gnu.org --- (In reply to Mark J Olah from comment #5) > Whatever is happening inside the AST evaluation in this case is not only > extraordinarily inefficient, but also apparently exponential with the size > o

[Bug fortran/100227] [8/9/10/11/12 Regression] write with implicit loop

2021-04-23 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100227 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org --

[Bug fortran/100154] [9/10/11/12 Regression] ICE in gfc_conv_procedure_call, at fortran/trans-expr.c:6131

2021-04-24 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100154 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|NEW |ASSIGNED Assignee|

[Bug fortran/100218] Allow target of the pointer resulting from the evaluation of function-reference in a variable definition context

2021-04-24 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100218 anlauf at gcc dot gnu.org changed: What|Removed |Added Assignee|unassigned at gcc dot gnu.org |anlauf at gcc dot gnu

[Bug fortran/100158] Some issues with fortran testsuite files

2021-04-24 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100158 --- Comment #1 from anlauf at gcc dot gnu.org --- The files testsuite/substr_{9,10}.f90 were moved by Tobias: r12-68-gac456fd981db6b0c2f7ee1ab0d17d36087a74dc2

[Bug fortran/82721] [8/9/10/11 Regression] Error message with corrupted text, sometimes ICE

2020-10-09 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82721 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug libfortran/97063] [ MATMUL intrinsic] The value of result is wrong when vector (step size is negative) * matrix

2020-10-11 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97063 anlauf at gcc dot gnu.org changed: What|Removed |Added Assignee|unassigned at gcc dot gnu.org |anlauf at gcc dot gnu.

[Bug libfortran/97063] [ MATMUL intrinsic] The value of result is wrong when vector (step size is negative) * matrix

2020-10-11 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97063 --- Comment #6 from anlauf at gcc dot gnu.org --- Patch: https://gcc.gnu.org/pipermail/fortran/2020-October/055169.html

[Bug fortran/92422] [9 Regression] Warning with character and optimisation flags

2020-10-13 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=92422 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|NEW |WAITING Known to work|

[Bug fortran/97408] New: Diagnose non-constant KIND argument to intrinsics

2020-10-13 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97408 Bug ID: 97408 Summary: Diagnose non-constant KIND argument to intrinsics Product: gcc Version: unknown Status: UNCONFIRMED Severity: normal Priority: P3 Componen

[Bug fortran/97408] Diagnose non-constant KIND argument to intrinsics

2020-10-13 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97408 anlauf at gcc dot gnu.org changed: What|Removed |Added Last reconfirmed||2020-10-13 Status

[Bug fortran/97408] Handle ac-do-variable KIND argument to intrinsics

2020-10-15 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97408 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|ASSIGNED|NEW Assignee|anlauf

[Bug fortran/97039] -fbounds-check misses violation with slice of array but not an element

2020-10-16 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97039 anlauf at gcc dot gnu.org changed: What|Removed |Added Keywords||diagnostic Last reconfirmed

[Bug fortran/97491] Wrong restriction for VALUE arguments of pure procedures

2020-10-19 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97491 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org L

[Bug fortran/95979] [10/11 Regression] ICE in get_kind, at fortran/simplify.c:129

2020-10-23 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=95979 anlauf at gcc dot gnu.org changed: What|Removed |Added Resolution|--- |FIXED Status|ASSI

[Bug libfortran/97063] [ MATMUL intrinsic] The value of result is wrong when vector (step size is negative) * matrix

2020-10-24 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97063 anlauf at gcc dot gnu.org changed: What|Removed |Added Resolution|--- |FIXED Status|ASSI

[Bug fortran/97547] How to fix problem causing warning?

2020-10-24 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97547 anlauf at gcc dot gnu.org changed: What|Removed |Added Resolution|--- |MOVED CC|

[Bug fortran/97491] Wrong restriction for VALUE arguments of pure procedures

2020-10-24 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97491 --- Comment #2 from anlauf at gcc dot gnu.org --- The patch diff --git a/gcc/fortran/resolve.c b/gcc/fortran/resolve.c index a210f9aad43..096108f4317 100644 --- a/gcc/fortran/resolve.c +++ b/gcc/fortran/resolve.c @@ -16476,6 +16507,7 @@ gfc_impur

[Bug fortran/97571] long parsing phase for simple array constructor

2020-10-26 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97571 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug libfortran/97581] libgfortran/intrinsics/random.c:754: bad array size ?

2020-10-26 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97581 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug libfortran/97581] libgfortran/intrinsics/random.c:754: bad array size ?

2020-10-26 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97581 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|UNCONFIRMED |WAITING Last reconfirmed|

[Bug fortran/97491] Wrong restriction for VALUE arguments of pure procedures

2020-10-26 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97491 --- Comment #3 from anlauf at gcc dot gnu.org --- Submitted here: https://gcc.gnu.org/pipermail/fortran/2020-October/055235.html

[Bug fortran/97592] Incorrectly set pointer remapping with array pointer argument to CONTIGUOUS dummy

2020-10-27 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97592 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug fortran/97491] Wrong restriction for VALUE arguments of pure procedures

2020-10-27 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97491 anlauf at gcc dot gnu.org changed: What|Removed |Added Assignee|unassigned at gcc dot gnu.org |anlauf at gcc dot gnu.

[Bug libfortran/97581] libgfortran/intrinsics/random.c:754: bad array size ?

2020-10-27 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97581 anlauf at gcc dot gnu.org changed: What|Removed |Added Assignee|unassigned at gcc dot gnu.org |anlauf at gcc dot gnu.

[Bug fortran/30802] out of bounds error array I/O not picked up with -fbounds-check

2020-10-28 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=30802 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org

[Bug libfortran/97581] libgfortran/intrinsics/random.c:754: bad array size ?

2020-10-30 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97581 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|ASSIGNED|RESOLVED Resolution|-

[Bug fortran/93678] [8/9/10/11 Regression] ICE with TRANSFER and typebound procedures

2020-10-30 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=93678 --- Comment #7 from anlauf at gcc dot gnu.org --- (In reply to Thomas Koenig from comment #5) > A somewhat smaller test case, which of course does nothing useful, > but still reproduces the ICE: Further reduced / simplified: module mo_a implic

[Bug fortran/93678] [8/9/10/11 Regression] ICE with TRANSFER and typebound procedures

2020-10-30 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=93678 --- Comment #8 from anlauf at gcc dot gnu.org --- Further reduced: module mo_a implicit none type t_b contains procedure :: unpackbytes => b_unpackbytes end type t_b contains function b_unpackbytes (me) result (res) class(t_b)

[Bug fortran/93678] [8/9/10/11 Regression] ICE with TRANSFER and typebound procedures

2020-10-30 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=93678 --- Comment #9 from anlauf at gcc dot gnu.org --- Another data point: comparing the -fdump-fortran-original of res = b_unpackbytes (me) ! ok vs. res = me% unpackbytes () ! ICE I see: ASSIGN b_unpackint:res(FULL) b_unpackbytes[[((b

[Bug fortran/97320] False positive "Array reference out of bounds in loop" in a protecting if block

2020-11-02 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97320 anlauf at gcc dot gnu.org changed: What|Removed |Added Resolution|--- |DUPLICATE Status|

[Bug fortran/94978] [8/9/10/11 Regression] Bogus warning "Array reference at (1) out of bounds in loop beginning at (2)"

2020-11-02 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=94978 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||trnka at scm dot com --- Comm

[Bug fortran/97491] Wrong restriction for VALUE arguments of pure procedures

2020-11-03 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97491 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|ASSIGNED|RESOLVED Resolution|-

[Bug fortran/97768] [10/11 Regression] 32-bit f951 ICE on code from OpenMolcas

2020-11-09 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97768 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|UNCONFIRMED |NEW Last reconfirmed|

[Bug fortran/97799] Passing CHARACTER*(*) var(*) through ENTRY causes segfaults

2020-11-11 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97799 --- Comment #6 from anlauf at gcc dot gnu.org --- I couldn't find any current 11-master, 10-, 9- and 8-branch version that fails on x86_64-pc-linux-gnu, under valgrind, and with -m32 and -m64. So it looks very likely that Dominique is right that

[Bug fortran/82314] internal compiler error: in gfc_conv_expr_descriptor, at fortran/trans-array.c:6972

2020-11-12 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82314 --- Comment #7 from anlauf at gcc dot gnu.org --- The ICE in comment#0 vanishes when one replaces integer,parameter::iarray(merge(2,3,.true.)) = 1 with integer,parameter::iarray(merge(2,3,.true.)) = [ 1, 1 ]

[Bug fortran/85796] ICE: Floating point exception

2020-11-12 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=85796 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug libfortran/48958] Add runtime diagnostics for SIZE intrinsic function

2020-11-14 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=48958 anlauf at gcc dot gnu.org changed: What|Removed |Added CC||anlauf at gcc dot gnu.org ---

[Bug fortran/48958] Add runtime diagnostics for SIZE intrinsic function

2020-11-16 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=48958 anlauf at gcc dot gnu.org changed: What|Removed |Added Priority|P3 |P5 Status|SUSPEND

[Bug fortran/97896] [11 Regression] ICE in gfc_trans_assignment_1, at fortran/trans-expr.c:11156

2020-11-18 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97896 anlauf at gcc dot gnu.org changed: What|Removed |Added Status|WAITING |NEW CC|

[Bug fortran/97896] [11 Regression] ICE in gfc_trans_assignment_1, at fortran/trans-expr.c:11156

2020-11-19 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97896 --- Comment #3 from anlauf at gcc dot gnu.org --- (In reply to anlauf from comment #2) > Reverting the following snippet from my fix attempt for pr91651: That snippet is necessary for the scalarizer during simplification. The original ICE is comi

[Bug fortran/97896] [11 Regression] ICE in gfc_trans_assignment_1, at fortran/trans-expr.c:11156

2020-11-20 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97896 --- Comment #5 from anlauf at gcc dot gnu.org --- (In reply to Mikael Morin from comment #4) > Elemental actual arguments are some of those arrays involved. > Obviously one should not remove some of them in the middle of code > generation. > It sh

[Bug fortran/85796] ICE: Floating point exception

2020-11-23 Thread anlauf at gcc dot gnu.org via Gcc-bugs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=85796 anlauf at gcc dot gnu.org changed: What|Removed |Added Assignee|unassigned at gcc dot gnu.org |anlauf at gcc dot gnu.

  1   2   3   4   5   6   7   8   9   10   >