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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99368
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Keywords||diagnostic
Last reconfirmed
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99218
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Status|ASSIGNED|RESOLVED
Resolution|-
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
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
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,
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.
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)
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
>
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
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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99585
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Priority|P3 |P4
Keywords|
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99112
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Status|NEW |RESOLVED
Resolution|-
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))
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(
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
---
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
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
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
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
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
---
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99205
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Status|ASSIGNED|RESOLVED
Resolution|-
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
---
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
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
---
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
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
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
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
---
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|
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,
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|
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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99839
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Status|UNCONFIRMED |NEW
CC|
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
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
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
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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=99840
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Resolution|--- |FIXED
Status|NEW
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
---
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/
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
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
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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=63797
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Status|NEW |RESOLVED
Resolution|-
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.
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
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|
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
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
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|
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
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
---
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
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
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
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
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
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
--
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=100154
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Status|NEW |ASSIGNED
Assignee|
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
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
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
---
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.
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
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|
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
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
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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97039
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Keywords||diagnostic
Last reconfirmed
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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=95979
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Resolution|--- |FIXED
Status|ASSI
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97063
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Resolution|--- |FIXED
Status|ASSI
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97547
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Resolution|--- |MOVED
CC|
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
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
---
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
---
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|
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
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
---
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.
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.
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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97581
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Status|ASSIGNED|RESOLVED
Resolution|-
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
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)
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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97320
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Resolution|--- |DUPLICATE
Status|
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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97491
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Status|ASSIGNED|RESOLVED
Resolution|-
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|
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
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 ]
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
---
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
---
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
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=97896
anlauf at gcc dot gnu.org changed:
What|Removed |Added
Status|WAITING |NEW
CC|
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
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
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 - 100 of 2658 matches
Mail list logo