[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-12-10 Thread rguenth at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

Richard Biener rguenth at gcc dot gnu.org changed:

   What|Removed |Added

   Priority|P3  |P4


[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-05-22 Thread rguenth at gcc dot gnu.org
https://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

Richard Biener rguenth at gcc dot gnu.org changed:

   What|Removed |Added

   Target Milestone|4.8.3   |4.8.4

--- Comment #17 from Richard Biener rguenth at gcc dot gnu.org ---
GCC 4.8.3 is being released, adjusting target milestone.


[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-03-30 Thread mikael at gcc dot gnu.org
http://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

Mikael Morin mikael at gcc dot gnu.org changed:

   What|Removed |Added

 Status|RESOLVED|REOPENED
 Resolution|FIXED   |---

--- Comment #16 from Mikael Morin mikael at gcc dot gnu.org ---
(In reply to Dominique d'Humieres from comment #14)
 gfortran.dg/assumed_rank_7.f90 still aborts when compiled with
 -fsanitize=address as in comment 3.

Reopening then.


[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-03-29 Thread dominiq at lps dot ens.fr
http://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

--- Comment #15 from Dominique d'Humieres dominiq at lps dot ens.fr ---
Reduced test case failing on x86_64-apple-darwin13 r208927 with -m64 (4.9.0 and
4.8.3, it succeeds with -m32 as well as the original test).

[Book15] f90/bug% cat assumed_rank_7_red.f90
implicit none
type t
  integer :: i
end type

class(T), allocatable :: ac(:,:)
type(T), allocatable :: at(:,:)

allocate(ac(2:3,2:4))
allocate(at(2:3,2:4))

call bar(ac)

contains
  subroutine bar(x)
type(t) :: x(..)
call foo(x)
  end subroutine
  subroutine foo(x)
class(t) :: x(..)
  end subroutine
end 
[Book15] f90/bug% gfc assumed_rank_7_red.f90 -fsanitize=address
[Book15] f90/bug% a.out
=
==40254==ERROR: AddressSanitizer: stack-buffer-underflow on address
0x7fff587043c0 at pc 0x10751d678 bp 0x7fff58704230 sp 0x7fff58704208
READ of size 192 at 0x7fff587043c0 thread T0
#0 0x10751d677 (/opt/gcc/gcc4.9w/lib/libasan.1.dylib+0x1a677)
#1 0x1074fc968
(/Users/dominiq/Documents/Fortran/g95bench/win/f90/bug/a.out+0x11968)
#2 0x1074fc6c7
(/Users/dominiq/Documents/Fortran/g95bench/win/f90/bug/a.out+0x116c7)
#3 0x1074fc9af
(/Users/dominiq/Documents/Fortran/g95bench/win/f90/bug/a.out+0x119af)
#4 0x7fff960745fc (/usr/lib/system/libdyld.dylib+0x35fc)
#5 0x0

Address 0x7fff587043c0 is located in stack of thread T0 at offset 0 in frame
#0 0x1074fc1fe
(/Users/dominiq/Documents/Fortran/g95bench/win/f90/bug/a.out+0x111fe)

  This frame has 1 object(s):
[32, 104) 'at' == Memory access at offset 0 partially underflows this
variable
HINT: this may be a false positive if your program uses some custom stack
unwind mechanism or swapcontext
  (longjmp and C++ exceptions *are* supported)
SUMMARY: AddressSanitizer: stack-buffer-underflow ??:0 ??
Shadow bytes around the buggy address:
  0x1fffeb0e0820: 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
  0x1fffeb0e0830: 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
  0x1fffeb0e0840: 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
  0x1fffeb0e0850: 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
  0x1fffeb0e0860: 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
=0x1fffeb0e0870: 00 00 00 00 00 00 00 00[f1]f1 f1 f1 00 00 00 00
  0x1fffeb0e0880: 00 00 00 00 00 f4 f4 f4 f3 f3 f3 f3 00 00 00 00
  0x1fffeb0e0890: 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
  0x1fffeb0e08a0: 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
  0x1fffeb0e08b0: 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
  0x1fffeb0e08c0: 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00 00
Shadow byte legend (one shadow byte represents 8 application bytes):
  Addressable:   00
  Partially addressable: 01 02 03 04 05 06 07 
  Heap left redzone:   fa
  Heap right redzone:  fb
  Freed heap region:   fd
  Stack left redzone:  f1
  Stack mid redzone:   f2
  Stack right redzone: f3
  Stack partial redzone:   f4
  Stack after return:  f5
  Stack use after scope:   f8
  Global redzone:  f9
  Global init order:   f6
  Poisoned by user:f7
  Contiguous container OOB:fc
  ASan internal:   fe
==40254==ABORTING

The code executes without error if I comment the line

allocate(at(2:3,2:4))


[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-03-28 Thread jakub at gcc dot gnu.org
http://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

Jakub Jelinek jakub at gcc dot gnu.org changed:

   What|Removed |Added

Summary|[4.8/4.9 Regression] FAIL:  |[4.8 Regression] FAIL:
   |gfortran.dg/assumed_rank_7. |gfortran.dg/assumed_rank_7.
   |f90 |f90

--- Comment #8 from Jakub Jelinek jakub at gcc dot gnu.org ---
Author: burnus
Date: Fri Mar 28 20:04:01 2014
New Revision: 208918

URL: http://gcc.gnu.org/viewcvs?rev=208918root=gccview=rev
Log:
2014-03-28  Mikael Morin  mik...@gcc.gnu.org
Tobias Burnus  bur...@net-b.de

PR fortran/
* trans-expr.c (gfc_conv_derived_to_class): Avoid
generation of out-of-bounds range expr.


Modified:
trunk/gcc/fortran/ChangeLog
trunk/gcc/fortran/trans-expr.c


[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-03-28 Thread burnus at gcc dot gnu.org
http://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

--- Comment #9 from Tobias Burnus burnus at gcc dot gnu.org ---
Author: burnus
Revision: 208918
Modified property: svn:log

Modified: svn:log at Fri Mar 28 20:34:48 2014
--
--- svn:log (original)
+++ svn:log Fri Mar 28 20:34:48 2014
@@ -1,7 +1,7 @@
 2014-03-28  Mikael Morin  mik...@gcc.gnu.org
 Tobias Burnus  bur...@net-b.de

-PR fortran/
+PR fortran/60576
 * trans-expr.c (gfc_conv_derived_to_class): Avoid
 generation of out-of-bounds range expr.


[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-03-28 Thread burnus at gcc dot gnu.org
http://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

--- Comment #10 from Tobias Burnus burnus at gcc dot gnu.org ---
Author: burnus
Date: Fri Mar 28 20:56:28 2014
New Revision: 208923

URL: http://gcc.gnu.org/viewcvs?rev=208923root=gccview=rev
Log:
2014-03-28  Mikael Morin  mik...@gcc.gnu.org
Tobias Burnus  bur...@net-b.de

PR fortran/60576
* trans-expr.c (gfc_conv_derived_to_class): Avoid
generation of out-of-bounds range expr.


Modified:
branches/gcc-4_8-branch/gcc/fortran/ChangeLog
branches/gcc-4_8-branch/gcc/fortran/trans-expr.c


[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-03-28 Thread burnus at gcc dot gnu.org
http://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

--- Comment #11 from Tobias Burnus burnus at gcc dot gnu.org ---
(In reply to H.J. Lu from comment #0)
 It only happens when running
 make check-gfortran RUNTESTFLAGS=dg.exp=assumed_rank_7.f90
 --target_board='unix{-march=corei7\ -fno-backtrace}'

Can you confirm that it is now fixed? Not that we only fixed part of the
problem.


[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-03-28 Thread hjl.tools at gmail dot com
http://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

--- Comment #12 from H.J. Lu hjl.tools at gmail dot com ---
(In reply to Tobias Burnus from comment #11)
 (In reply to H.J. Lu from comment #0)
  It only happens when running
  make check-gfortran RUNTESTFLAGS=dg.exp=assumed_rank_7.f90
  --target_board='unix{-march=corei7\ -fno-backtrace}'
 
 Can you confirm that it is now fixed? Not that we only fixed part of the
 problem.

gfortran.dg/assumed_rank_7.f90 has been changed by r208668
and I can't reproduce it anymore.


[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-03-28 Thread burnus at gcc dot gnu.org
http://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

Tobias Burnus burnus at gcc dot gnu.org changed:

   What|Removed |Added

 Status|NEW |RESOLVED
 Resolution|--- |FIXED

--- Comment #13 from Tobias Burnus burnus at gcc dot gnu.org ---
(In reply to H.J. Lu from comment #12)
 gfortran.dg/assumed_rank_7.f90 has been changed by r208668
 and I can't reproduce it anymore.

I close it as FIXED and hope the best.


[Bug fortran/60576] [4.8 Regression] FAIL: gfortran.dg/assumed_rank_7.f90

2014-03-28 Thread dominiq at lps dot ens.fr
http://gcc.gnu.org/bugzilla/show_bug.cgi?id=60576

--- Comment #14 from Dominique d'Humieres dominiq at lps dot ens.fr ---
gfortran.dg/assumed_rank_7.f90 still aborts when compiled with
-fsanitize=address as in comment 3.