Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With option -fdec and versions 7 to 9 :
$ cat z1.f90
program p
open (1, carriagecontrol=char(1000,4))
open (2, share=char(1000,4))
end
$ gfortran-9-20181104 -c z1
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=56423
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #2 from G
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Changed recently :
$ cat z1.f90
program p
character :: a, b
data a%len /1/
data b%kind /'b'/
end
$ gfortran-9-20181104 -c z
: normal
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Affects versions 7 to 9.
Compiles with "type(t), allocatable :: u(:)" instead of class...
$ cat z1.f90
module m
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=78492
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #4 from G
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With (presumably) invalid code down to at least gfortran-5 :
$ cat z1.f90
program p
type t
character(:), pointer :: c
end type
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Changed between 20180909 and 20180916 :
$ cat z1.f90
subroutine s(x)
class(*), allocatable :: x
x = ''
end
$ gfortran-9-20180909 -c z1.f90
$
$ gfortran-
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=87945
--- Comment #2 from G. Steinmetz ---
z1.90 above should be _invalid_ code, because a type parameter
inquiry can never be assigned a value, and should not be on LHS.
An aequivalent example :
$ cat z4.f90
program p
character :: a, b
a%len =
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Should be valid code, according to F2018 9.4.5 a type-param-inquiry
is scalar even if the designator is an array.
$ cat z1.f90
program p
integer
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Should be valid code, thematically related to pr87993.
$ cat z1.f90
program p
real :: a, b
data b /a%kind/
end
$ gfortran-9-2018 -c z1.f90
f951: internal compiler
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=87994
--- Comment #1 from G. Steinmetz ---
> Should be valid code, ...
Whoops, suboptimal. Better examples :
$ cat z3.f90
program p
real, parameter :: a = 1.0
data b /a%kind/
end
$ cat z4.f90
program p
integer, parameter :: a = 1
integer
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=87993
--- Comment #1 from G. Steinmetz ---
Changed between 20181028 and 20181104 (ICE).
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79440
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #3 from G
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=87994
--- Comment #3 from G. Steinmetz ---
Sure ...
: normal
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Changed between 20181028 and 20181104 :
$ cat z1.f90
module m
type t
integer, pointer :: z
contains
procedure
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Changed between 20180909 and 20180916 :
$ cat z1.f90
module m
class(*), allocatable :: z
end
block data
use m
z = 'z
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79440
--- Comment #4 from G. Steinmetz ---
Reduced test case from comment 0 :
$ cat z3.f90
module m
type t
end type
type t2
class(t), pointer :: a
end type
type, extends(t2) :: t3
end type
type t4
class(t2), pointer
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79426
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #5 from G
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79426
--- Comment #6 from G. Steinmetz ---
In all za* examples above reduce the type by an integer variable.
Now type "t" contains one integer and one class(*) :
$ cat zb2.f90
program p
type t
integer :: a
class(*), pointer :: u(:)
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79426
--- Comment #7 from G. Steinmetz ---
And with type "t" stripped down to a class only, respectively.
Case analogous to the one in comment 3.
$ cat zc2.f90
program p
type t
class(*), pointer :: u(:)
end type
type(t) :: z
select
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=79426
--- Comment #8 from G. Steinmetz ---
And to make the picture complete, if you _add_ another integer
(regarding comment 5), it compiles silently (but breaks at run time).
$ cat z2.f90
program p
type t
integer :: a
integer :: b
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
This invalid code affects versions down to gfortran-5 :
$ cat z1.f90
program p
type t
character(('')) :: c = 'c
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77412
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #3 from G
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Changed between 20180909 and 20180916 :
$ cat z1.f90
program p
type t
end type
class(t) :: x(2)
class(t), parameter :: a(2) = t()
x
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With invalid code :
$ cat z1.f90
program p
integer, parameter :: a(2) = 1
data a(2) /a(1)/
print *, a
end
$ gfortran-7 -g
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=88048
--- Comment #1 from G. Steinmetz ---
Invalid code nearby, down to at least gcc-5 :
$ cat z4.f90
subroutine s(x)
integer, allocatable :: x(:)
data x(1:2) /3, 4/
end
$ gfortran-9-2018 -c z4.f90
f951: internal compiler error: Segmenta
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=66695
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #6 from G
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77382
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #5 from G
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With -fsanitize=undefined or a test version (--enable-checking=yes) :
(n2 is not a function reference due to missing "()", and not initialized)
$ cat z1.f90
module
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=65381
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #4 from G
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=65381
--- Comment #5 from G. Steinmetz ---
Further simplified, z3 without character :
$ cat z2.f90
module m
type t
end type
contains
pure function g(x) result(z)
class(t), intent(in) :: x(:)
character :: z(size(x))
end
fun
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With invalid code for versions 8/9, silently accepted with 5/6/7 :
$ cat z1.f90
program p
print *, [integer :: 1, [integer(8) :: 2, [
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=88116
--- Comment #1 from G. Steinmetz ---
Some older issues :
$ cat z3.f90
program p
print *, [real :: 1, [integer :: (real(k), k=2,1), 2]]
end
$ cat z4.f90
program p
print *, [real :: [integer :: (dble(k), k=1,0), 2]]
end
$ gfortran-9-20
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Changed between 20180923 and 20180930 :
$ cat z1.f90
program p
character(:), pointer :: z(:)
z = [character :: 'a',
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=83953
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #2 from G
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With invalid code down to at least gcc-5 :
$ cat z1.f90
program p
type t
character :: c = 'c'
end type
type(t), parameter :: x = 1e1
print *,
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Since version 8 with option -fc-prototypes :
$ cat z1.f90
module m
contains
subroutine s(*) bind(c, name='f')
end
end
$ gfortran-
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=77604
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #3 from G
Severity: normal
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Since gfortran-8 with new F2018 intrinsic :
$ cat z1.f90
program p
print *, get_team()
end
$ gfortran-9-20181118
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=49802
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #10 from G
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With a typo, down to at least gcc-5 :
$ cat z1.f90
program p
type t
integer :: a
end type
type(t) :: x
data x /t()1/
print *, x
end
$ gfortran-9-20181118
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=66681
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #12 from G
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With a non-scalar-default-char-expr, down to at least gcc-5 :
$ cat z1.f90
subroutine s
real, parameter :: status = 0
open (newunit=n, status=status)
end
$ cat z2
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=70817
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #2 from G
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=78892
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #2 from G
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Affects versions 7,8,9 :
$ cat z1.f90
program p
integer, parameter :: z(4) = [1,2,3,4]
integer :: k = 2
print *, [real(z(k
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=80467
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #8 from G
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With -m32 down to at least gfortran-5 :
$ cat z1.f90
program p
print *, dble(b'1010101001101')
end
$ cat z2.f90
program p
print *, real(b'1010
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With option -fdec since gfortran-7 :
$ cat z1.f90
program p
integer :: n = .not. 1
end
$ cat z2.f90
program p
integer :: j = .true. .or. 1
end
$ gfortran-9-20181125 -c z1.f90
: normal
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With valid code at -O[s123] :
$ cat z1.f90
program p
call s
contains
subroutine s
character(:), allocatable :: y
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=88229
--- Comment #1 from G. Steinmetz ---
This variant compiles and works :
$ cat z3.f90
program p
call s
contains
subroutine s
character(:), allocatable :: y
allocate (y, source=f('abcdefff'))
print *, len(y), y
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=85953
--- Comment #4 from G. Steinmetz ---
Changed in gcc-9 between 20180916 (ICE) and 20180923 (ok).
$ gfortran-9-20181125 z1.f90 -static-libgfortran
$ a.out
abc
$
: normal
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Affects version 8/9, but also struggles with older versions :
$ cat z1.f90
program p
type t
character(:), allocatable
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=88247
--- Comment #1 from G. Steinmetz ---
This variant compiles and works :
$ cat z2.f90
program p
type t
character(:), allocatable :: c
end type
type(t), allocatable :: x
x = t('abc')
associate (y => x%c(:))
print *, y
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=88248
--- Comment #1 from G. Steinmetz ---
For completeness, similar with outdated return labels :
$ cat z3.f90
program p
do
call sub (*98, *99)
end do
98 continue
99 continue
end
$ gfortran-9-20181125 -c z3.f90 -std=f2008
z3.f90:3:24:
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Branching out via END=, ERR= or EOR= specifier in combination with
CONTINUE is interpreted as a labeled DO loop. Option -std=f2018
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With a missing file-unit-number, down to at least gcc-5 :
$ cat z1.f90
program p
backspace (err=1)
endfile (err=1)
flush (err=1)
rewind (err=1)
end
$ gfortran-9
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=87751
--- Comment #2 from G. Steinmetz ---
Changed in gcc-9 between 2018 (ICE) and 20181118 (ok=error),
presumably due to pr70260.
$ gfortran-9-20181125 -c z1.f90
z1.f90:8:3:
8 |g = 1
| 1
Error: Illegal assignment to external pr
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Version 8/9 with option -Wextra or -Wdo-subscript gives an additional
warning for some valid code sections. Undesirable, but can be ignored.
Not recommendable to change a much more
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With invalid code, down to at least gcc-5 :
$ cat z1.f90
program p
write (end=1e1)
write (end=1d1)
write (end=1q1)
end
$ gfortran-9-20181125 -c z1.f90
0x619a5e
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Affects versions down to at least gcc-5 :
$ cat z1.f90
program p
character, parameter :: x(3) = ['a','b',
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=88326
--- Comment #1 from G. Steinmetz ---
This variant compiles and runs :
$ cat z4.f90
program p
character, parameter :: x(3) = ['a','b','c']
character :: y(1) = transfer('x', x)
print *, y
end
$ gfortran-9-20181202 z4.f90 -static-libgf
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Affects versions down to at least gcc-5 :
$ cat z1.f90
program p
character(3), parameter :: a(0) = [character(3)::]
print a
end
$ gfortran-9-20181202 -c z1.f90
f951
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=71703
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #10 from G
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=84007
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #2 from G
Severity: normal
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
A combination of -Werror with some options like -Wundef, -Wswitch
or others gives ICEs. This changed between 20180624
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=88356
--- Comment #1 from G. Steinmetz ---
$ cat z2.f90
program p
integer :: z(1) = reshape([nint([2.0])], [1])
end
$ cat z3.f90
program p
integer, parameter :: z(2) = [1,2]
print *, any(abs(bessel_jn(z, 1.0) - bessel_jn(z, 1.0)) > epsilon(
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=83865
--- Comment #3 from G. Steinmetz ---
Update :
$ gfortran-9-20181202 -c z1.f90
z1.f90:3:0:
3 |allocate (z, source=[''])
|
internal compiler error: in wide_int_to_tree_1, at tree.c:1561
0xd6bd72 wide_int_to_tree_1
../../gc
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With invalid code, down to at least gcc-5 :
$ cat z1.f90
program p
type t
end type
class(t) :: x[*]
associate (y => x)
end associate
end
$ gfortran-9-20181202
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=88357
--- Comment #1 from G. Steinmetz ---
Related non-coarray version :
$ cat z3.f90
program p
type t
end type
class(t) :: x
associate (y => x)
end associate
end
$ gfortran-9-20181202 -c z3.f90
z3.f90:4:16:
4 |class(t) ::
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=88357
--- Comment #4 from G. Steinmetz ---
Thanks for working on these issues.
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With invalid code down to gfortran-6 :
$ cat z1.f90
module m
integer :: n
contains
subroutine s
character(n(3)) :: c
end
end
$ gfortran-5 -c z1.f90
z1.f90
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Affects versions down to at least gfortran-5 :
$ cat z1.f90
program p
call s(3)
contains
subroutine s(n)
integer :: n
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Extracted from pr88357 :
$ cat z2.f90
program p
type t
end type
class(t), allocatable :: x[:]
associate (y => x)
end associate
end
$ gfortran-9-20181202 -c
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=88357
--- Comment #6 from G. Steinmetz ---
Sure, this is now pr88379.
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
I recently did some tests with the very new PDT feature
to generate some tiny, disruptive test cases :
$ cat z1.f90
module m
type t(a)
end type
end
$ gfortran-8-20171015 -c z1.f90
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82586
--- Comment #1 from G. Steinmetz ---
Other invalid snippets :
$ cat z2.f90
program p
type t(a
integer, kind :: a
real(a) :: x
end type
end
$ cat z3.f90
program p
type t(a, a)
integer, kind :: a
integer, len :
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Another piece of invalid code :
$ cat z1.f90
program p
type t(a)
integer(kind=t()) :: x
end type
end
$ gfortran-8-20171015 -c z1.f90
f951: internal compiler
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
A combination of type-param-attr-spec LEN or KIND with another
attribute like PRIVATE conflicts with f2008 4.5.3.1 :
$ cat z1.f90
module m
type t(a)
integer, len
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82589
--- Comment #1 from G. Steinmetz ---
These variants are processed without any complaints :
$ cat z2.f90
module m
type t(a)
integer, len, private :: a
end type
end
program p
use m
type(t(:)), allocatable :: x
print *, x
end
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With a missing attribute allocatable or pointer :
$ cat z1.f90
program p
type t(a, b)
integer, kind :: a
integer, len :: b
real(a) :: r(b)
end type
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With reversed declaration order :
$ cat z1.f90
program p
type t(a, b)
integer, len :: b
integer, kind :: a
real(a) :: r(b)
end type
type(t(8
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82606
--- Comment #1 from G. Steinmetz ---
BTW, with an invalid modification (--> fortran/decl.c:3244) :
$ cat z4.f90
program p
type t(a, b, *)
integer, kind :: a
integer, len :: b
real(a) :: r(b)
end type
type(t(8, 3)) ::
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82606
G. Steinmetz changed:
What|Removed |Added
Blocks||82173
Summary|ICE in gfc_extra
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Tracking an issue due to a typo (in lack of a better example) :
$ cat z1.f90
program p
type t(a)
integer, len :: a
end type
type
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
This one is an interesting case ...
(... and the last PR derived from this search)
$ cat z1.f90
program p
type t(a)
integer, len
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82622
G. Steinmetz changed:
What|Removed |Added
Blocks||82173
--- Comment #1 from G. Steinmetz -
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82622
--- Comment #3 from G. Steinmetz ---
Backtrace for example z2 from comment 1 :
(with new snapshot, configured with --enable-checking=yes)
$ gfortran-8-20171022 -c z2.f90
z2.f90:1:0:
program p
internal compiler error: tree check: expected arr
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82622
--- Comment #6 from G. Steinmetz ---
(In reply to kargl from comment #5)
> Is this valid code and should compile
It should be legal, IMO. Note that "a" in z1.f90 is effectively unused
(the type parameters need not be used anywhere in the DT).
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
While experimenting :
$ cat z1.f90
program p
type t(a)
integer, len :: a
character(len=a) :: c
end type
type(t(2)) :: x
x = t(2,'ab')
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82719
G. Steinmetz changed:
What|Removed |Added
Blocks||82173
--- Comment #1 from G. Steinmetz -
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Another test case :
$ cat z1.f90
program p
type t(a)
integer, len :: a
character(len=a) :: c
end type
type(t
: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
This snippet (clearly invalid) gives a second error message
with randomly corrupted text :
$ cat z1.f90
program p
real :: a, b(4)
character(len(c)) :: b
end
$ gfortran-8
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82721
--- Comment #1 from G. Steinmetz ---
With a test version (configured with --enable-checking=yes)
sometimes a backtrace is produced, like :
f951: internal compiler error: Segmentation fault
0xca7e1f crash_signal
../../gcc/toplev.c:326
0x
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=56496
G. Steinmetz changed:
What|Removed |Added
CC||gs...@t-online.de
--- Comment #2 from G
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=56496
--- Comment #3 from G. Steinmetz ---
Further reduced :
$ cat z1.f90
program p
class(*), allocatable :: a[:]
allocate (integer :: a[*])
select type (a)
type is (integer)
end select
end
$ gfortran-8-20171105 -c z1.f90 -fcoarray=
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
Several testsuite files ./gcc/testsuite/gfortran.dg/pdt_*
are producing extra error messages when combined with option -fdec.
One short example :
$ cat z1.f90
program p
type t(a)
integer
Priority: P3
Component: fortran
Assignee: unassigned at gcc dot gnu.org
Reporter: gs...@t-online.de
Target Milestone: ---
With invalid code similar to pr82586 :
$ cat z1.f90
module m
type t(*)
end type
end
$ /gfortran-8-20171105 -c z1.f90
f951: internal
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82866
G. Steinmetz changed:
What|Removed |Added
Blocks||82173
--- Comment #1 from G. Steinmetz -
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=82866
--- Comment #2 from G. Steinmetz ---
Slightly different :
$ cat z7.f90
module m
type t(a, :, *)
end type
end
$ cat z7s.f90
subroutine s
type t(a, :, *)
end type
end
$ cat z8.f90
module m
type t(*, a, :)
end type
end
$ c
601 - 700 of 746 matches
Mail list logo