: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With some "empty" openmp constructs :
$ cat z1.f90
real function f()
!$omp barrier
end
$ gfortran-6 -fopenmp -c z1.f90
f951: internal comp
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With a missing save attribute :
$ cat z1.f90
subroutine s
real :: x
x = 0.0
!$omp target update to(x)
!$omp target
x = x + 1.0
!$omp end target
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71705
--- Comment #1 from Gerhard Steinmetz
---
Compiles with save status :
$ cat z2.f90
subroutine s
real, save :: x
!!$omp declare target(x)
x = 0.0
!$omp target update to(x)
!$omp target
x = x + 1.0
!$omp end target
end
FIRMED
Severity: normal
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Together with -fcheck=bounds or -fcheck=all :
$ cat z1.f90
program p
integer ::
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71706
--- Comment #1 from Gerhard Steinmetz
---
$ cat z2.f90
program p
sync images (1_1)
sync images (1_2)
sync images (1_4)
sync images (1_8)
sync images (1_16)
end
$ gfortran-7-20160626 -fcoarray=single -fcheck=all -c z2.f90
$ gfor
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=68566
--- Comment #11 from Gerhard Steinmetz
---
Another constellation (appearing legal) :
$ cat zz1.f90
program p
integer :: n(2) = [2,1]
print *, reshape ([1,2,3,4,5,6], [2,4], [0,0], [2,1])
print *, reshape ([1,2,3,4,5,6], [2,4], [0,0],
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=66244
--- Comment #4 from Gerhard Steinmetz
---
Compiling slightly modified example from comment 0 :
$ cat z4.f90
program p
integer, target :: a(3)[*]
integer, pointer :: z => a(3)
z = 0
print *, z
end
$ gfortran-7-20160703 -fcoarray=s
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=67883
--- Comment #2 from Gerhard Steinmetz
---
Another group of examples.
First case is working in a sufficient manner.
Concatenating two empty hulls (zero len and size, respectivly)
gives an empty hull as result again.
$ cat zz1.f90
program p
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=67883
--- Comment #3 from Gerhard Steinmetz
---
For the following cases, every line produces an ICE :
$ cat zz5.f90
program p
character(*), parameter :: x1(*) = [character(*) ::] // [character(0) ::]
character(*), parameter :: x2(*) = [charac
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=65173
Gerhard Steinmetz changed:
What|Removed |Added
CC||gerhard.steinmetz.fortran@t
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=47425
Gerhard Steinmetz changed:
What|Removed |Added
CC||gerhard.steinmetz.fortran@t
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=47425
--- Comment #4 from Gerhard Steinmetz
---
Some simplifications :
$ cat z1.f90
program p
character(3) :: x
integer :: n = 3
print *, [character(len(x(1:n))) :: 'a']
end
$ gfortran-7-20160703 z1.f90
z1.f90:4:0:
print *, [characte
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With example .../libgomp/testsuite/libgomp.fortran/examples-4/device-2.f90 :
$ gfortran-7-20160703 -fdefault-integer-8 -fopenmp device-2.f90
device-2.f90:5:0
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Typo, e.g. for intrinsic functions with a non-scalar argument :
$ cat z1.f90
program p
print *, abs([real(1)/9., real(2
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71759
--- Comment #1 from Gerhard Steinmetz
---
Another typo :
$ cat z2.f90
program p
print *, [character((100)) :: 'x']
print *, [character((1,0)) :: 'x']
end
$ gfortran-6 z2.f90
z2.f90:3:23:
print *, [character((1,0)) :: 'x']
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71758
--- Comment #2 from Gerhard Steinmetz
---
Reduced to mismatch in device(.), without option -fdefault* :
$ cat z1.f90
program p
use omp_lib, only: omp_is_initial_device
integer(8), parameter :: n = 10
integer(8) :: i
logical(8) :: offlo
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71764
Gerhard Steinmetz changed:
What|Removed |Added
CC||gerhard.steinmetz.fortran@t
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71764
--- Comment #5 from Gerhard Steinmetz
---
Some other variants :
$ cat zz1.f90
program p
use iso_c_binding, only: c_ptr, c_null_ptr, c_ptr
type(c_ptr) :: c
c = c_null_ptr
end
$ cat zz3.f90
program p
use iso_c_binding, only: c_ptr
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=70914
--- Comment #3 from Gerhard Steinmetz
---
Indeed, I can confirm that all examples from comment 0 are now working
(and compiling without an ICE) when using gfortran-7-20160703.
Though, if not covered elsewhere, only one remaining problem :
$
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
When using the same name for a variable and a subroutine (invalid),
experimental (--enable-checking=yes) versions 7, 6 and maybe
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71859
--- Comment #1 from Gerhard Steinmetz
---
Somehow detected when being a bit more explicit :
$ cat z3.f90
program p
implicit none
real :: s = 1.0
real :: x
call s(1)
x = abs(s)
print *, x
end
subroutine s(n)
implicit none
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71859
--- Comment #2 from Gerhard Steinmetz
---
For completeness another ICE, only with dedicated option -ff2c.
$ gfortran-6 -ff2c z1.f90
z1.f90:2:0:
call s(1)
internal compiler error: in fold_convert_loc, at fold-const.c:2292
$ gfortran-7-
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
ICE with experimental (--enable-checking=yes) versions 7, 6,
and maybe older.
$ cat z1.f90
program p
class(*), pointer :: z
z => null(z)
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=70842
Gerhard Steinmetz changed:
What|Removed |Added
CC||gerhard.steinmetz.fortran@t
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
An interface with an alienated intrinsic name (or any other) :
$ cat z1.f90
module m
intrinsic abs
abstract interface
function abs(x)
real :: abs
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71861
--- Comment #1 from Gerhard Steinmetz
---
Side note :
$ cat z0.f90
module m
abstract interface
function abs(x)
real :: abs, x
end
end interface
end
$ gfortran-6 -Wall z0.f90
z0.f90:3:6:
function abs(x)
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Release versions (5, 6, 7) are bailed out, with no backtrace.
Experimental versions (6, 7 tested) give a backtrace.
$ cat z1.f90
program p
type t
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71862
--- Comment #1 from Gerhard Steinmetz
---
Works when "class" is changed to "type" ...
$ cat z2.f90
program p
type t
integer :: n = 0
integer, pointer :: q => null()
end type
type(t) :: x
print *, associated(x%q)
x =
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
ICE on rank mismatch or typo with experimental (--enable-checking=yes)
versions 7, 6, and maybe older. No ICE for release versions
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With these snippets :
$ cat z1.f90
program p
class(*), allocatable :: x
allocate (x, source=null())
end
$ cat z2
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71884
--- Comment #1 from Gerhard Steinmetz
---
Another source position with obviously invalid code :
$ cat za.f90
program p
character(:), allocatable :: z
allocate (character(*) :: z)
end
$ gfortran-7-20160710 za.f90
za.f90:3:0:
alloca
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71883
--- Comment #2 from Gerhard Steinmetz
---
Runtime behavior :
$ cat y1.f90
program p
character(3), allocatable :: z(:,:)
z(1:2,1:2) = 'abc'
z(2,1) = z(1,2)
z(2,1) = z(1,2)
end
$ gfortran-6 -g -O0 -Wall -fcheck=all -fno-frontend-
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71883
--- Comment #1 from Gerhard Steinmetz
---
Backup tests, analogous backtrace :
$ cat z2.f90
program p
character(:), allocatable :: z(:,:)
z(1:2,1:2) = 'abc'
z(2,1) = z(12)
z(21) = z(1,2)
end
$ cat z3.f90
program p
character(3)
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71862
--- Comment #5 from Gerhard Steinmetz
---
More test files :
$ cat z5.f90
program p
type t
integer :: n = 0
integer, pointer :: q => null()
end type
type(t) :: x
print *, associated(x%q)
x = f()
print *, associated
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Should also been taken into account, in addition to pr71862 :
$ cat z1.f90
program p
type t
integer :: n
end type
type(t) :: x
class(t
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71894
--- Comment #1 from Gerhard Steinmetz
---
A variation :
$ cat za1.f90
program p
type t
end type
class(t) :: x
class(t), allocatable :: y
select type (y)
type is (t)
y = x
end select
end
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Eventually cross-linked with pr71862, pr71894 :
$ cat z1.f90
program p
type t
integer :: n
end type
type(t
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With an out of bounds error : (no ICE with 4.8.3)
$ cat z1.f90
program p
use iso_c_binding
character(len=1, kind=c_char), parameter :: z(2) =
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Looking at "class" and 4 combinations allocatable|pointer, the following
cases give an ICE with gfortran 7 and 6 (not with 5, 4.9, 4.8).
$ cat z1.f90
program
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71936
--- Comment #1 from Gerhard Steinmetz
---
These other two cases produce an related ICE :
$ cat z3.f90
program p
type t
end type
class(t), pointer :: x(:)
allocate (x, mold=f())
deallocate (x)
allocate (x, source=f())
contains
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71936
--- Comment #2 from Gerhard Steinmetz
---
To get the whole picture it's necessary to take a look at four
analogous cases with "type" instead of "class". They compile without
an error (v6/v7), but occationally run for a long time (y3/y4).
$ ca
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=72698
--- Comment #1 from Gerhard Steinmetz
---
This variant seems to work :
$ cat z3.f90
program p
character(:), allocatable :: z
allocate (z, source=repeat('', 4))
print *, len(z), ' >>' // z // '<<'
end
$ gfortran-7-20160724 z3.f90
$
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=72699
--- Comment #1 from Gerhard Steinmetz
---
No ICE without explicit "implicit none".
But of course again with added option -fimplicit-none.
$ cat z2.f90
function f() result(z)
character(:), allocatable :: z
h = z(1)
z(1) = h
end
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
ICE with 7, 6 (releases bailout), not with 5.4, 4.9 and 4.8.
Invalid code, with "implicit none" :
$ cat z1.f90
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
ICE with 7, 6, 5 (bailout with official releases).
Working with 4.9 and 4.8.
Valid code with a zero-length input string :
$ cat z1.f90
module m
contains
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Invalid with a missing lower bound :
$ cat z1.f90
program p
integer, allocatable :: z(:)[:,:]
allocate (z(2)[:3,*])
end
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=72714
--- Comment #1 from Gerhard Steinmetz
---
Correct variants, for completeness :
$ cat z2.f90
program p
integer, allocatable :: z(:)[:,:]
allocate (z(2)[3,*])
end
$ cat z3.f90
program p
integer, allocatable :: z(:)[:,:]
allocate (z(
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With this combination :
$ cat z1.f90
program p
integer :: i
!$acc loop
do concurrent (i=1:3)
end do
end
$ gfortran-7
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
The error message tells the story :
$ cat z1.f90
block data
!$omp declare simd (z)
end block data
$ gfortran-7-20160724
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Not with -O1, but with optimization level -Os, -O2 or higher.
Seen with 6 an 7.
$ cat z1.f90
program p
integer
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Using -fopenmp together with -O2|-O3 and -fstack-arrays
or with -Ofast alone for a test similar to pr49792 and pr71687
hits 7 and older (also related to pr69281).
$ cat
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=72744
--- Comment #1 from Gerhard Steinmetz
---
As known, case above works with "workshare" :
$ cat z2.f90
program p
integer, parameter :: n = 20
integer :: i, z(n), h(n)
z = [(i, i=1,n)]
h = [(i, i=n,1,-1)]
call sub (n, h)
if ( a
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
ICE with valid examples and experimental (--enable-checking=yes)
version 7 from 20160731 at -Os, -O1 or higher.
$ cat z1.f90
program p
type t
class
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=72770
--- Comment #1 from Gerhard Steinmetz
---
Compiles and works without character branch (type is).
$ cat z3.f90
program p
type t
class(*), allocatable :: q(:)
end type
type(t) :: z
integer :: a(3) = [1, 2, 3]
real :: c(3) =
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=67542
Gerhard Steinmetz changed:
What|Removed |Added
Summary|ICE on initializing type|ICE in
|variable w
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=68439
--- Comment #2 from Gerhard Steinmetz
---
ICE is completely gone for all tested constellations with
gcc-Version 7.0.0 20160821 (experimental) (GCC)
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=68567
--- Comment #3 from Gerhard Steinmetz
---
ICE is gone for all tested constellations with
gcc-Version 7.0.0 20160821 (experimental) (GCC)
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=68225
--- Comment #6 from Gerhard Steinmetz
---
ICE seems to be gone, z1 now and z2 still aborting at runtime.
Program received signal SIGSEGV: Segmentation fault - invalid memory reference.
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=69859
Gerhard Steinmetz changed:
What|Removed |Added
Version|6.0 |7.0
--- Comment #6 from Gerhard Stei
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=65173
--- Comment #5 from Gerhard Steinmetz
---
On my environment the ICE is gone only for z1.f90 and z8.f90.
$ gfortran-7-20160821 z7.f90
z7.f90:5:20:
character x(:)
1
Error: Array component of structure at (1) must have
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=69860
Gerhard Steinmetz changed:
What|Removed |Added
Status|RESOLVED|REOPENED
Version|6.0
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
For versions down to at least 4.8 :
$ cat z1.f90
program p
character(1), parameter :: c(3) = ['a', 'b', 'c']
characte
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77325
--- Comment #1 from Gerhard Steinmetz
---
Slightly simplified, indicating an uninitialized variable :
$ cat z3.f90
program p
character(1), parameter :: c(3) = ['a', 'b', 'c']
character(:), allocatable :: z(:)
z = c(1)
print *, z
e
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=69860
--- Comment #11 from Gerhard Steinmetz
---
And with "kind=4" instead of "kind=1", i.e. with testfile z1.f90 ?
for n in `seq 1 1000`
do
gfortran-7-20160821 -O2 -mavx -c z1.f90
done > list 2>&1
grep 'internal compiler' list | wc
9465
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=70853
--- Comment #3 from Gerhard Steinmetz
---
Another testcase :
$ cat z7.f90
program p
integer, parameter :: m = 2, n = 3
real, target :: a(m*n)
real, pointer :: z(:,:) => null()
z(1:m,1:n) => null()
end
$ gfortran-7-20160821 z7.f90
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=68567
--- Comment #5 from Gerhard Steinmetz
---
> We must be using drastically different compilers.
No, I've simply forgotten to include a subcatalog with testfiles zz*.
Sorry for my blotchiness. The patch looks good and works.
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
For versions down to at least 4.8, with invalid code :
$ cat z1.f90
function f() result(g)
contains
logical function g()
end
end
$ gfortran-7
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With invalid code, and configured with --enable-checking=yes :
$ cat z1.f90
program p
integer :: z(4) = [1, 2, 3, 4]
print *, any(shape(z) /= [4,1])
end
: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Needs options -fopenmp -fopenacc -Ofast (or -Os|1|2|3 -fstack-arrays) :
$ cat z1.f90
program p
real, allocatable :: a(:,:), b(:)
integer :: m=4, n=2
allocate (a(m,n), b(m
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Some snippets with allocatable scalars (valid code) combined with
OpenACC. Similar issue for "pointer" instead of &q
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77371
--- Comment #1 from Gerhard Steinmetz
---
$ cat z2.f90
program p
integer, allocatable :: z
!$acc parallel
z = 1
!$acc end parallel
print *, z
end
$ gfortran-7-20160821 -fopenacc z2.f90
z2.f90:2:0:
integer, allocatable :: z
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77371
--- Comment #2 from Gerhard Steinmetz
---
Related :
$ cat z6.f90
program p
integer, allocatable :: n
!$acc parallel reduction (+:n) private(n)
!$acc end parallel
end
$ gfortran-7-20160821 -fopenacc z6.f90
z6.f90:3:0:
!$acc parallel redu
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Affects gfortran 7, 6, 5 (not implemented before 5).
$ cat z1.f90
program p
use ieee_arithmetic
real(kind
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Invalid code with a displaced OpenMP directive.
Configured with --enable-checking=yes.
$ cat z1.f90
subroutine s1 (a, b)
integer :: a, b
!$omp atomic
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Invalid code, compiled at level -Og, -Os, -O1 or higher,
with debugging compiler (--enable-checking=yes) :
$ cat z1.f90
program
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77380
--- Comment #1 from Gerhard Steinmetz
---
No ICE with -fcoarray=single :
$ gfortran-7-20160821 -O2 -fcoarray=single z1.f90
z1.f90:3:14:
z(:)[1] = z(:)[*]
1
Error: Coindex of codimension 1 must be a scalar at (1)
Bailed ou
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
For versions down to at least 4.8 :
$ cat z1.f90
module m
character(3) :: a(2), b(2)
equivalence (a(2)(1:2), b(1)(2:3))
end
program p
use m
end
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77382
--- Comment #1 from Gerhard Steinmetz
---
With official releases (configured with --enable-checking=release),
down to at least 4.8 :
$ gfortran-6 z1.f90
z1.f90:4:0:
call s
internal compiler error: in expand_expr_real_1, at expr.c:9651
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With invalid code, and configured with --enable-checking=yes :
$ cat z1.f90
subroutine s
entry f(s)
end
call s
end
$ cat
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=66493
--- Comment #9 from Gerhard Steinmetz
---
Update, backtraces added :
$ gfortran-7-20160828 pr66493.f90
f951: internal compiler error: in resolve_typebound_procedure, at
fortran/resolve.c:12603
0x6e31ac resolve_typebound_procedure
../..
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With invalid code, down to at least 4.8 :
$ cat z1.f90
module m
interface s
subroutine s1(*)
end
subroutine
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=44348
--- Comment #12 from Gerhard Steinmetz
---
Slightly modified variant :
$ cat z7.f90
subroutine s(x)
contains
subroutine s(x)
end
end
$ gfortran-7-20160828 z7.f90
z7.f90:3:0:
subroutine s(x)
internal compiler error: in gfc_generat
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With invalid code, down to at least 4.8, related to pr44348 :
$ cat z1.f90
subroutine s(x)
character(*) :: x
contains
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77414
--- Comment #1 from Gerhard Steinmetz
---
Backup tests, more variants :
$ cat z2.f90
subroutine s(x)
real :: x
contains
subroutine s(x)
character(*) :: x
end
end
$ cat z3.f90
subroutine s(x)
real :: x
contains
subroutine
Version: 7.0
Status: UNCONFIRMED
Severity: normal
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
With invalid code :
$ cat z1.f90
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77415
--- Comment #1 from Gerhard Steinmetz
---
With official releases (configured with --enable-checking=release),
down to at least 4.8 :
$ gfortran-6 z1.f90
z1.f90:1:0:
integer function f()
internal compiler error: in make_decl_rtl, at varasm.
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gerhard.steinmetz.fort...@t-online.de
Target Milestone: ---
Affects version 6, 7 at optimization level -Og, -Os, -O1 or higher.
ICE/backtrace when configured with --enable-checking=yes
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77429
--- Comment #1 from Gerhard Steinmetz
---
Whereas :
$ cat z3.f90
program p
shape(1,2,3) = 0
end
$ gfortran-7-20160828 z3.f90
z3.f90:2:3:
shape(1,2,3) = 0
1
Error: Too many arguments in call to 'shape' at (1)
---
Some other case
501 - 588 of 588 matches
Mail list logo