[Bug fortran/31067] MINLOC should sometimes be inlined (gas_dyn is sooooo sloooow)

2007-06-15 Thread tkoenig at gcc dot gnu dot org
--- Comment #18 from tkoenig at gcc dot gnu dot org 2007-06-15 20:35 --- Too little time right now. Unassigning myself. -- tkoenig at gcc dot gnu dot org changed: What|Removed |Added

[Bug fortran/32217] segfaults (at runtime) on UNPACK with zero-sized arrays

2007-06-16 Thread tkoenig at gcc dot gnu dot org
--- Comment #1 from tkoenig at gcc dot gnu dot org 2007-06-16 08:09 --- This one should be relatively easy. I'll take it. -- tkoenig at gcc dot gnu dot org changed: What|Removed |

[Bug fortran/32217] segfaults (at runtime) on UNPACK with zero-sized arrays

2007-06-22 Thread tkoenig at gcc dot gnu dot org
--- Comment #2 from tkoenig at gcc dot gnu dot org 2007-06-22 22:16 --- Created an attachment (id=13765) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=13765&action=view) proposed patch This fixes the test case. It'll be a while before I can regression-test and

[Bug libfortran/32336] matmul: flag runtime- instead of assertation error

2007-07-08 Thread tkoenig at gcc dot gnu dot org
--- Comment #3 from tkoenig at gcc dot gnu dot org 2007-07-08 22:08 --- Here's an example: $ cat mm.f90 program main real, dimension(:,:), allocatable :: a real, dimension(:), allocatable :: b allocate (a(2,2), b(3)) call random_number(a) call random_number(b)

[Bug fortran/32217] segfaults (at runtime) on UNPACK with zero-sized arrays

2007-07-08 Thread tkoenig at gcc dot gnu dot org
--- Comment #5 from tkoenig at gcc dot gnu dot org 2007-07-08 22:20 --- Subject: Bug 32217 Author: tkoenig Date: Sun Jul 8 22:20:04 2007 New Revision: 126469 URL: http://gcc.gnu.org/viewcvs?root=gcc&view=rev&rev=126469 Log: 2007-07-08 Thomas Koenig <[EMAIL PROTECTED]&g

[Bug fortran/32217] segfaults (at runtime) on UNPACK with zero-sized arrays

2007-07-08 Thread tkoenig at gcc dot gnu dot org
--- Comment #6 from tkoenig at gcc dot gnu dot org 2007-07-08 22:23 --- Fixed on mainline. No plans to backport this to 4.2. -- tkoenig at gcc dot gnu dot org changed: What|Removed |Added

[Bug libfortran/32336] matmul: flag runtime- instead of assertation error

2007-07-09 Thread tkoenig at gcc dot gnu dot org
--- Comment #4 from tkoenig at gcc dot gnu dot org 2007-07-09 22:35 --- Subject: Bug 32336 Author: tkoenig Date: Mon Jul 9 22:34:43 2007 New Revision: 126498 URL: http://gcc.gnu.org/viewcvs?root=gcc&view=rev&rev=126498 Log: 2007-07-09 Thomas Koenig <[EMAIL PROTECTED]&g

[Bug libfortran/32336] matmul: flag runtime- instead of assertation error

2007-07-09 Thread tkoenig at gcc dot gnu dot org
--- Comment #5 from tkoenig at gcc dot gnu dot org 2007-07-09 22:35 --- Fixed on trunk. Closing. -- tkoenig at gcc dot gnu dot org changed: What|Removed |Added

[Bug fortran/29804] segfault with -fbounds-check on allocatable derived type components

2007-07-10 Thread tkoenig at gcc dot gnu dot org
--- Comment #7 from tkoenig at gcc dot gnu dot org 2007-07-10 13:20 --- (In reply to comment #6) > Salvatore, could you please recheck this one? I can not observe any problems, > neither on dt_bnd.f90 nor on the reduced testcase. Neither can I, it seems to have fixed itself.

[Bug fortran/30814] non-conforming array sizes in PACK should raise an error

2007-07-10 Thread tkoenig at gcc dot gnu dot org
--- Comment #1 from tkoenig at gcc dot gnu dot org 2007-07-10 19:16 --- A nice m4 project :-) I'll do this. -- tkoenig at gcc dot gnu dot org changed: What|Removed |

[Bug libfortran/32731] New: pack/unpack with kind=1 or kind=2 mask

2007-07-11 Thread tkoenig at gcc dot gnu dot org
Keywords: wrong-code Severity: normal Priority: P3 Component: libfortran AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org http://gcc.gnu.org/bugzilla/show_bug.cgi?id=32731

[Bug libfortran/32731] pack/unpack with kind=1 or kind=2 mask

2007-07-11 Thread tkoenig at gcc dot gnu dot org
-- tkoenig at gcc dot gnu dot org changed: What|Removed |Added AssignedTo|unassigned at gcc dot gnu |tkoenig at gcc dot gnu dot |dot org

[Bug libfortran/32731] pack/unpack with kind=1 or kind=2 mask

2007-07-11 Thread tkoenig at gcc dot gnu dot org
--- Comment #1 from tkoenig at gcc dot gnu dot org 2007-07-11 21:41 --- Created an attachment (id=13890) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=13890&action=view) proposed patch -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=32731

[Bug libfortran/23321] Direct unformatted read beyond EOF cores

2005-09-04 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-04 20:50 --- Fixed on mainline and 4.0. -- What|Removed |Added Status|NEW

[Bug libfortran/23770] New: unaligned buffers in i/o library force use of memcpy()

2005-09-07 Thread tkoenig at gcc dot gnu dot org
ReportedBy: tkoenig at gcc dot gnu dot org CC: gcc-bugs at gcc dot gnu dot org http://gcc.gnu.org/bugzilla/show_bug.cgi?id=23770

[Bug libfortran/23419] unformatted complex I/O with kind=10

2005-09-07 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-07 20:58 --- Even with the committed patch, there is still something wrong on i686: $ cat compl.f program main complex (kind=10) a, b integer(kind=1), dimension(32) :: ea, eb equivalence (ea, a

[Bug fortran/20848] PARAMETER and SAVE attribute conflict

2005-09-07 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-07 21:20 --- Fixed on mainline and 4.0. -- What|Removed |Added Status|NEW

[Bug libfortran/23784] New: close doesn't reset ioparm on error exit

2005-09-08 Thread tkoenig at gcc dot gnu dot org
Keywords: wrong-code Severity: normal Priority: P2 Component: libfortran AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org CC: gcc-bugs at gcc dot gnu dot org http://gcc.gnu.org/bugzilla/show_bug.cgi?id=23784

[Bug libfortran/23770] unaligned buffers in i/o library force use of memcpy()

2005-09-09 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-09 19:38 --- (In reply to comment #2) > Did you by any chance mean PR 23556? That looks more like it. Yes, I did. Sorry for the confusion. -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=23770

[Bug fortran/12366] [4.0 only] array assignment fails

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 09:51 --- This is not fixed in 4.0.2: $ cat pr12366.f90 program testg real, dimension(5) :: a=(/ 1.5,2.1,3.2,4.6,5.3 /) integer,dimension(3) :: i i=(/ 2,3,1 /) print *, a((/ 2,3,1 /)) ! ICEs ! print

[Bug fortran/18960] [4.0 only] compiler segfault on shifting character array constants

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 09:54 --- Not fixed in 4.0: $ cat pr18960.f90 print *,eoshift((/'h', 'e', 'l', 'l', 'o'/), 3) end $ gfortran pr18960.f90 pr18960.f90: In function 'MAIN__

[Bug fortran/19269] transpose(reshape(...)) of character array segfaults.

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 19269 depends on bug 18960, which changed state. Bug 18960 Summary: [4.0 only] compiler segfault on shifting character array constants http://gcc.gnu.org/bugzilla/show_bug.cgi?id=18960 What|Old Value |New Value --

[Bug fortran/19282] [4.0 only] ICE in gfc_conv_array_initializer

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 15:44 --- Not fixed in 4.0: $ cat > pr19282.f90 IMPLICIT NONE INTEGER,PARAMETER ::count=10 CHARACTER,PARAMETER::digits*(count+1) = '01234567890' INTEGER i CHARACTER,PARAMETER:: chardum

[Bug fortran/20387] [4.0 only] ICE in gfc_conv_array_initializer

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 15:51 --- Still doesn't work in 4.0: $ cat > pr20387.f90 module bug04 integer, dimension(101), parameter, private :: a = (/ & 2,3,5,7, 11, 13, 17, 19, 23, 29, &

[Bug fortran/23373] [4.0 only] Functions returning pointers with pointer argument

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 19:50 --- Not fixed in 4.0: $ cat pointer_function.f90 program Realloc IMPLICIT NONE REAL, DIMENSION(:), POINTER :: x INTEGER :: i x => NULL() x => myallocate(x) contains FUNCTION myallocate(p)

[Bug fortran/15326] [4.0 only] ICE with assumed length character strings

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 19:52 --- Not fixed in 4.0: $ cat > reduced.f90 program Decapitation implicit none integer, parameter :: STRING_LENGTH = 80 character (len = STRING_LENGTH) :: Text_1, Text_2 Text_2 = Decap (Tex

[Bug fortran/19242] internal compiler error: in gfc_conv_function_call, at fortran/trans-expr.c:1106

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 19242 depends on bug 15326, which changed state. Bug 15326 Summary: [4.0 only] ICE with assumed length character strings http://gcc.gnu.org/bugzilla/show_bug.cgi?id=15326 What|Old Value |New Value -

[Bug fortran/19276] [meta-bug] CHARACTER related bugs in gfortran

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 19276 depends on bug 15326, which changed state. Bug 15326 Summary: [4.0 only] ICE with assumed length character strings http://gcc.gnu.org/bugzilla/show_bug.cgi?id=15326 What|Old Value |New Value -

[Bug fortran/22518] ICE in gfc_conv_function_call for character function with LEN=length(arg)

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 22518 depends on bug 15326, which changed state. Bug 15326 Summary: [4.0 only] ICE with assumed length character strings http://gcc.gnu.org/bugzilla/show_bug.cgi?id=15326 What|Old Value |New Value -

[Bug fortran/19292] [meta-bug] g77 features lacking in gfortran

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 19292 depends on bug 15326, which changed state. Bug 15326 Summary: [4.0 only] ICE with assumed length character strings http://gcc.gnu.org/bugzilla/show_bug.cgi?id=15326 What|Old Value |New Value -

[Bug fortran/15809] ICE Using Pointer Functions

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 15809 depends on bug 15326, which changed state. Bug 15326 Summary: [4.0 only] ICE with assumed length character strings http://gcc.gnu.org/bugzilla/show_bug.cgi?id=15326 What|Old Value |New Value -

[Bug fortran/19276] [meta-bug] CHARACTER related bugs in gfortran

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 19276 depends on bug 22518, which changed state. Bug 22518 Summary: [4.0 only] ICE in gfc_conv_function_call for character function with LEN=length(arg) http://gcc.gnu.org/bugzilla/show_bug.cgi?id=22518 What|Old Value |New Value

[Bug fortran/22518] [4.0 only] ICE in gfc_conv_function_call for character function with LEN=length(arg)

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 19:56 --- Not fixed on 4.0: $ cat > clen.f90 program main implicit none character(len=2) :: a a = 'xy' print *,fun(a) contains function fun(arg) character(len=*) :: arg characte

[Bug fortran/23379] compiler segfault with internal write

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 23379 depends on bug 23364, which changed state. Bug 23364 Summary: missing format reversion for internal write http://gcc.gnu.org/bugzilla/show_bug.cgi?id=23364 What|Old Value |New Value --

[Bug libfortran/23364] missing format reversion for internal write

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 19:58 --- Not fixed in 4.0: $ cat > internal-reversion.f90 character(len=20), dimension(2) :: line(2) integer, dimension(2) :: a a = 2 write (unit=line,fmt='("a",I4)') a print *,l

[Bug fortran/21825] [4.0/4.1 Regression] 2D array initialization with reshape

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 20:00 --- Not fixed in 4.0: $ cat > tst.f90 PROGRAM TST CHARACTER(2), PARAMETER :: ETYPE(2,2) = & RESHAPE((/ 'a1','b1','a2','b2' /),(/2,2/)) END PROGRAM TST

[Bug fortran/19276] [meta-bug] CHARACTER related bugs in gfortran

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 19276 depends on bug 21825, which changed state. Bug 21825 Summary: [4.0/4.1 Regression] 2D array initialization with reshape http://gcc.gnu.org/bugzilla/show_bug.cgi?id=21825 What|Old Value |New Value

[Bug fortran/19269] transpose(reshape(...)) of character array segfaults.

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 19269 depends on bug 21825, which changed state. Bug 21825 Summary: [4.0/4.1 Regression] 2D array initialization with reshape http://gcc.gnu.org/bugzilla/show_bug.cgi?id=21825 What|Old Value |New Value

[Bug fortran/12840] Unable to find scalarization loop specifier

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 20:02 --- Not fixed in 4.0: $ cat > pz_lsd.f90 SUBROUTINE pz_lsd ( order ) INTEGER :: order,m m = SUM((/ (m+1,m=0,order) /)) END SUBROUTINE pz_lsd END $ gfortran pz_lsd.f90 pz_lsd.f90: In funct

[Bug fortran/15502] [meta-bug] bugs needed for SPEC CPU 2K and 2K5/6 and 95

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 15502 depends on bug 12840, which changed state. Bug 12840 Summary: Unable to find scalarization loop specifier http://gcc.gnu.org/bugzilla/show_bug.cgi?id=12840 What|Old Value |New Value --

[Bug fortran/19239] gfortran ICE on vector subscript expressions

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 20:06 --- Not yet fixed for 4.0: $ cat > pr19239.f90 program dummy integer,dimension(2) :: index=(/1,1/) real,dimension(2) :: A=1.0 print*,A(index+1) end program dummy $ gfortran pr19239.f90 pr19239.f90:

[Bug fortran/21730] Character length incorrect.

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 20:08 --- Not fixed in 4.0: $ cat pr21730.f ! PR fortran/21730 ! { dg-do run } character*2 a character*4 b character*6 c parameter (a="12") parameter (b = a) write

[Bug fortran/19276] [meta-bug] CHARACTER related bugs in gfortran

2005-09-18 Thread tkoenig at gcc dot gnu dot org
-- Bug 19276 depends on bug 21730, which changed state. Bug 21730 Summary: Character length incorrect. http://gcc.gnu.org/bugzilla/show_bug.cgi?id=21730 What|Old Value |New Value

[Bug fortran/19242] [4.0 only] internal compiler error: in gfc_conv_function_call, at fortran/trans-expr.c:1106

2005-09-18 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-09-18 20:10 --- Not yet fixed in 4.0: $ cat gfortran.f95 # 1 "gfortran.F95" # 1 "" # 1 "" # 1 "gfortran.F95" module gfortrantest contains function int2str(i) resu

[Bug libfortran/24174] real(10) array output broken

2005-10-07 Thread tkoenig at gcc dot gnu dot org
--- Comment #5 from tkoenig at gcc dot gnu dot org 2005-10-07 20:12 --- > It should be noted that the patch assumes that the padding for real(10) is 10 > bytes data + 2 bytes padding. This works on i686-Linux, might not work on > other > targets (big endian?). Itanium ha

[Bug fortran/23815] Add -byteswapio flag

2005-10-11 Thread tkoenig at gcc dot gnu dot org
--- Comment #4 from tkoenig at gcc dot gnu dot org 2005-10-11 18:40 --- I'm trying to work on this. I would prefer a syntax "open(...,convert="little_endian") or something like that. -- tkoenig at gcc dot gnu dot org changed: What|Removed

[Bug fortran/23815] Add -byteswapio flag

2005-10-11 Thread tkoenig at gcc dot gnu dot org
--- Comment #7 from tkoenig at gcc dot gnu dot org 2005-10-11 19:37 --- (In reply to comment #6) > Many compilers, like the Intel and PGI ones for instance, simply have a > -byteswap flag that is set at compile time. ifort actually uses -convert big_endian or -convert little_end

[Bug fortran/24526] New: variables from modules not visible in gdb

2005-10-25 Thread tkoenig at gcc dot gnu dot org
Version: 4.1.0 Status: UNCONFIRMED Keywords: wrong-debug Severity: normal Priority: P2 Component: fortran AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org http://gcc.gnu.org/bugzilla/show_bug.cgi?id=24526

[Bug fortran/24527] New: derived types not displayed correctly

2005-10-25 Thread tkoenig at gcc dot gnu dot org
ONFIRMED Keywords: wrong-debug Severity: normal Priority: P2 Component: fortran AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org http://gcc.gnu.org/bugzilla/show_bug.cgi?id=24527

[Bug fortran/24546] New: [meta-bug] gfortran debugging problems

2005-10-26 Thread tkoenig at gcc dot gnu dot org
: P2 Component: fortran AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org BugsThisDependsOn: 10220,17905,22244,23057,23280,24526,24527 OtherBugsDependingO 19292 nThis: http://gcc.gnu.org/bugzilla/show_bug.cgi?id=24546

[Bug rtl-optimization/22509] [4.1 regression] elemental.f90 testsuite failure (-fweb)

2005-10-30 Thread tkoenig at gcc dot gnu dot org
--- Comment #14 from tkoenig at gcc dot gnu dot org 2005-10-31 07:52 --- Can we disable -fweb for 4.1.0 for fortran? -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=22509

[Bug fortran/24643] Unclassifiable statement on implicitly typed character substring

2005-11-02 Thread tkoenig at gcc dot gnu dot org
--- Comment #4 from tkoenig at gcc dot gnu dot org 2005-11-02 21:13 --- g77 groks this: $ cat grg.f PROGRAM TABLES IMPLICIT CHARACTER*8(Y) WRITE(YLOCAL,'(I2.2)') ILOCAL YBTABLE=Ylocal(1:2) END $ g77 grg.f $ -- tkoenig at gcc dot gnu dot o

[Bug fortran/23538] gfortran hangs on old cray fortran 66 program

2005-11-02 Thread tkoenig at gcc dot gnu dot org
--- Comment #7 from tkoenig at gcc dot gnu dot org 2005-11-02 21:17 --- g77 gets confused by the errors, then bails out: $ g77 d2ds.f $ g77 d2ds.f 2>&1 | tail 2 Argument #4 of `maxval' is one type at (2) but is some other type at (1) [info -f g77 M GLOBALS

[Bug fortran/23815] Add -byteswapio flag

2005-11-02 Thread tkoenig at gcc dot gnu dot org
--- Comment #10 from tkoenig at gcc dot gnu dot org 2005-11-02 21:20 --- (In reply to comment #9) > I imagine code from g95 could be leveraged to support this feature couldn't > it? Rather not. The libraries have diverged pretty much so it is probably easier to writ

[Bug fortran/20867] statement function args not given implicit type early enough

2005-11-02 Thread tkoenig at gcc dot gnu dot org
--- Comment #1 from tkoenig at gcc dot gnu dot org 2005-11-02 21:24 --- $ cat foo.f REAL :: st1 st1(I)=I**2 ! I implicitly typed to integer REAL :: I END $ g77 foo.f foo.f: In program `MAIN__': foo.f:2: st1(I)=I**2

[Bug fortran/24640] ice with invalid label

2005-11-02 Thread tkoenig at gcc dot gnu dot org
--- Comment #1 from tkoenig at gcc dot gnu dot org 2005-11-02 21:28 --- This is only in free-form: $ cat tst.f 10: a=10 end $ gfortran tst.f In file tst.f:1 10: a=10 1 Error: Non-numeric character in statement label at (1) Confirmed. -- tkoenig at gcc dot gnu dot

[Bug fortran/23151] print (buf, format), expression should be invalid

2005-11-02 Thread tkoenig at gcc dot gnu dot org
--- Comment #1 from tkoenig at gcc dot gnu dot org 2005-11-02 21:59 --- g77 groks this: $ cat prt.f program main character*80 line print (line,'(A)'), 'hello' end $ g77 prt.f prt.f: In program `main': prt.f:3: p

[Bug fortran/43042] [-fwhole-file] ICE in gfc_conv_structure for c_ptr_tests_14.f90

2010-02-14 Thread tkoenig at gcc dot gnu dot org
--- Comment #1 from tkoenig at gcc dot gnu dot org 2010-02-14 11:49 --- Reduced test case: odule m use iso_c_binding type, public :: fgsl_file type(c_ptr):: gsl_file = c_null_ptr end type fgsl_file contains subroutine sub(aaa,bbb) type(fgsl_file), intent(out

[Bug fortran/43039] [lto/-fwhole-file] ICE in gfc_conv_component_ref dynamic_dispatch_5.f03

2010-02-14 Thread tkoenig at gcc dot gnu dot org
--- Comment #2 from tkoenig at gcc dot gnu dot org 2010-02-14 12:38 --- The problem appears to be a lack of a backend_decl with -fwhole-file: Breakpoint 1, fancy_abort (file=0xd474a0 "../../trunk/gcc/fortran/trans-expr.c", line=466, function=0xd47e40 "gfc_conv_com

[Bug fortran/43173] [4.5 Regression] Unnecessary array temporary: Passing contiguous array as actual argument

2010-02-27 Thread tkoenig at gcc dot gnu dot org
--- Comment #5 from tkoenig at gcc dot gnu dot org 2010-02-27 11:35 --- I do not see the temporaries with gcc-Version 4.5.0 20100214 (experimental) (GCC) but I see this with gcc-Version 4.5.0 20100227 (experimental) (GCC) on x86_64-unknown-linux-gnu This makes this a regression

[Bug rtl-optimization/40761] [4.4/4.5 Regression] IRA memory hog for insanely nested loops

2010-03-01 Thread tkoenig at gcc dot gnu dot org
--- Comment #4 from tkoenig at gcc dot gnu dot org 2010-03-01 19:27 --- This now causes an ICE: i...@linux-fd1f:/tmp> cat haha.c #define ONE while (b()) #define TEN ONE ONE ONE ONE ONE ONE ONE ONE ONE ONE #define HUN TEN TEN TEN TEN TEN TEN TEN TEN TEN TEN #define T

[Bug libfortran/32972] performance of pack/unpack

2010-03-01 Thread tkoenig at gcc dot gnu dot org
--- Comment #26 from tkoenig at gcc dot gnu dot org 2010-03-01 22:53 --- I think pack and unpack are OK now. Closing. -- tkoenig at gcc dot gnu dot org changed: What|Removed |Added

[Bug rtl-optimization/40761] [4.4/4.5 Regression] IRA memory hog for insanely nested loops

2010-03-04 Thread tkoenig at gcc dot gnu dot org
--- Comment #9 from tkoenig at gcc dot gnu dot org 2010-03-04 19:40 --- Should we also commit the test case from #4 ? -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=40761

[Bug bootstrap/43583] New: [4.5 Regression] "value computed not used" in parallel.c:121:4

2010-03-29 Thread tkoenig at gcc dot gnu dot org
ct: gcc Version: 4.5.0 Status: UNCONFIRMED Severity: normal Priority: P3 Component: bootstrap AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org GCC host triplet: x86_64-unknown-linux-gnu http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43583

[Bug bootstrap/43583] [4.5 Regression] "value computed not used" in parallel.c:121:4

2010-03-29 Thread tkoenig at gcc dot gnu dot org
--- Comment #1 from tkoenig at gcc dot gnu dot org 2010-03-29 18:54 --- Created an attachment (id=20253) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=20253&action=view) config.log in the libgomp directory -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43583

[Bug bootstrap/43583] [4.5 Regression] "value computed not used" in parallel.c:121:4

2010-03-29 Thread tkoenig at gcc dot gnu dot org
--- Comment #2 from tkoenig at gcc dot gnu dot org 2010-03-29 18:57 --- Trying to get this onto the regression radar.. -- tkoenig at gcc dot gnu dot org changed: What|Removed |Added

[Bug bootstrap/43583] [4.5 Regression] "value computed not used" in parallel.c:121:4

2010-03-29 Thread tkoenig at gcc dot gnu dot org
--- Comment #3 from tkoenig at gcc dot gnu dot org 2010-03-29 18:58 --- ... which of course works better if I get the "Known to work" and "Known to fail" fields correct. -- tkoenig at gcc dot gnu dot org changed: What|Removed

[Bug bootstrap/43583] [4.5 Regression] "value computed not used" in parallel.c:121:4

2010-03-29 Thread tkoenig at gcc dot gnu dot org
--- Comment #5 from tkoenig at gcc dot gnu dot org 2010-03-29 22:01 --- Created an attachment (id=20254) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=20254&action=view) Preprocessed source This is from ~/Gcc/trunk-bin/x86_64-unknown-linux-gnu/32/libgomp the 32 bit subdi

[Bug bootstrap/43583] [4.5 Regression] "value computed not used" in parallel.c:121:4

2010-03-29 Thread tkoenig at gcc dot gnu dot org
--- Comment #6 from tkoenig at gcc dot gnu dot org 2010-03-29 22:06 --- Created an attachment (id=20255) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=20255&action=view) Preprocessed source where the problem occurs for the first time team.c also shows the problem, this

[Bug bootstrap/43583] [4.5 Regression] "value computed not used" in parallel.c:121:4

2010-03-30 Thread tkoenig at gcc dot gnu dot org
--- Comment #9 from tkoenig at gcc dot gnu dot org 2010-03-30 15:10 --- Created an attachment (id=20257) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=20257&action=view) Output obtained from adding '-v" to the 32/libgomp Makefile Here's the output of &qu

[Bug bootstrap/43583] [4.5 Regression] "value computed not used" in parallel.c:121:4

2010-03-30 Thread tkoenig at gcc dot gnu dot org
--- Comment #11 from tkoenig at gcc dot gnu dot org 2010-03-30 15:49 --- (In reply to comment #10) > Err, > > cc1: error: unrecognized command line option "-fsave-temps" > > but - still works for me. How did you configure? Sorry, that should have been -sav

[Bug bootstrap/43583] [4.5 Regression] "value computed not used" in parallel.c:121:4

2010-03-30 Thread tkoenig at gcc dot gnu dot org
--- Comment #12 from tkoenig at gcc dot gnu dot org 2010-03-30 15:54 --- Please forget the second half of my previous comment (I copied / pasted the wrong part). Here's the actual output, probably not very useful: i...@linux-fd1f:~/Gcc/trunk-bin> gcc/cc1 -quiet -o /dev/null -

[Bug bootstrap/43583] [4.5 Regression] "value computed not used" in parallel.c:121:4

2010-03-30 Thread tkoenig at gcc dot gnu dot org
--- Comment #15 from tkoenig at gcc dot gnu dot org 2010-03-30 17:30 --- This was caused by a local modification on my tree. Sorry for the noise :-( Closing as invalid. -- tkoenig at gcc dot gnu dot org changed: What|Removed |Added

[Bug bootstrap/43699] [4.6 regression] "variable set but not used" error during bootstrap

2010-04-10 Thread tkoenig at gcc dot gnu dot org
--- Comment #6 from tkoenig at gcc dot gnu dot org 2010-04-10 11:53 --- Seen on x86_64-unknown-linux-gnu too. -- tkoenig at gcc dot gnu dot org changed: What|Removed |Added

[Bug fortran/40728] Bogus error "Error: Can't convert UNKNOWN to REAL(8) at (1)"

2010-04-22 Thread tkoenig at gcc dot gnu dot org
-- tkoenig at gcc dot gnu dot org changed: What|Removed |Added Status|UNCONFIRMED |NEW Ever Confirmed|0 |1 Last

[Bug bootstrap/43885] New: [4.6 Regression] Ada bootstrap fails with STORAGE_ERROR

2010-04-25 Thread tkoenig at gcc dot gnu dot org
cc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43885

[Bug bootstrap/43885] [4.6 Regression] Ada bootstrap fails with STORAGE_ERROR

2010-04-25 Thread tkoenig at gcc dot gnu dot org
--- Comment #1 from tkoenig at gcc dot gnu dot org 2010-04-25 11:16 --- Created an attachment (id=20481) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=20481&action=view) Build log (with script) -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=43885

[Bug bootstrap/43885] [4.6 Regression] Ada bootstrap fails with STORAGE_ERROR

2010-04-25 Thread tkoenig at gcc dot gnu dot org
--- Comment #2 from tkoenig at gcc dot gnu dot org 2010-04-25 12:51 --- Bootstrap succeeds when the first-stage compiler is 4.4.0. -- tkoenig at gcc dot gnu dot org changed: What|Removed |Added

[Bug libfortran/22142] New: eoshift: boundary not filled in correctly

2005-06-22 Thread tkoenig at gcc dot gnu dot org
IRMED Keywords: wrong-code Severity: normal Priority: P2 Component: libfortran AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org CC: gcc-bugs at gcc dot gnu dot org http://gcc.gnu.org/bug

[Bug fortran/21594] FAIL: gfortran.dg/eoshift.f90 -O0 execution test

2005-06-22 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-22 11:41 --- This can be made to fail on any architecture by increasing the amount of shifting: $ cat eoshift-really-fails.f90 program main character(len=20) line write (line,'(I4)') eoshift((/1, 3/),

[Bug libfortran/22124] eoshift with dim=2 fails

2005-06-22 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-22 11:42 --- This is a duplicate of 21592. The problem is that we are really running off the end here, as Andrew suggested. *** This bug has been marked as a duplicate of 21592 *** -- What|Removed

[Bug c++/21592] [3.4/4.0/4.1 Regression] ICE in resolve_overloaded_unification/arg_assoc

2005-06-22 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-22 11:42 --- *** Bug 22124 has been marked as a duplicate of this bug. *** -- What|Removed |Added

[Bug libfortran/22143] New: missing kinds 1 and 2 for eoshift and cshift

2005-06-22 Thread tkoenig at gcc dot gnu dot org
ortran AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org CC: gcc-bugs at gcc dot gnu dot org http://gcc.gnu.org/bugzilla/show_bug.cgi?id=22143

[Bug libfortran/22144] New: eoshift1, eoshift3, cshift1 lack memory allocation

2005-06-22 Thread tkoenig at gcc dot gnu dot org
Status: UNCONFIRMED Severity: normal Priority: P2 Component: libfortran AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org CC: gcc-bugs at gcc dot gnu dot org http://gcc.gnu.org/bugzilla/show_bug.cgi?id=22144

[Bug libfortran/22124] eoshift with dim=2 fails

2005-06-22 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-22 20:18 --- (In reply to comment #3) > Um, Thomas, PR 21592 which you claim this is a duplicate of, is a C++ front > end bug. Did you mean that? No, I meant 21594. Thomas -- http://gcc.gnu.org/bu

[Bug libfortran/22144] [4.0 only] eoshift1, eoshift3, cshift1 lack memory allocation

2005-06-25 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-25 09:59 --- Fixed on mainline, waiting for 4.0 to reopen. -- What|Removed |Added Keywords

[Bug libfortran/22142] eoshift: boundary not filled in correctly

2005-06-27 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-27 09:49 --- Created an attachment (id=9156) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=9156&action=view) Proposed patch. -- What|Removed

[Bug libfortran/22142] eoshift: boundary not filled in correctly

2005-06-27 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-27 09:51 --- (From update of attachment 9156) The patch was for the wrong bug report *sigh*. -- What|Removed |Added

[Bug fortran/21594] FAIL: gfortran.dg/eoshift.f90 -O0 execution test

2005-06-27 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-27 09:53 --- Created an attachment (id=9157) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=9157&action=view) Patch fixing the issue with overwriting the target array. -- What|

[Bug libfortran/22142] eoshift: boundary not filled in correctly

2005-06-27 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-27 12:02 --- This is missing: *** eoshift3.m4 2005-06-27 14:05:51.0 +0200 --- /home/zfkts/gcc-maint/libgfortran/m4/eoshift3.m42005-06-27 11:47:13.0 +0200 *** *** 136,142

[Bug libfortran/22142] eoshift: boundary not filled in correctly

2005-06-27 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-27 12:11 --- Actually, the patch should be the other way around. -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=22142

[Bug tree-optimization/22199] New: Unnecessary casts for comparison

2005-06-27 Thread tkoenig at gcc dot gnu dot org
n Severity: enhancement Priority: P2 Component: tree-optimization AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org CC: gcc-bugs at gcc dot gnu dot org http://gcc.gnu.org/bugzilla/show_bug.cgi?id=22199

[Bug libfortran/22217] New: Z edit descriptor with negative numbers

2005-06-28 Thread tkoenig at gcc dot gnu dot org
iority: P2 Component: libfortran AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org CC: gcc-bugs at gcc dot gnu dot org http://gcc.gnu.org/bugzilla/show_bug.cgi?id=22217

[Bug libfortran/22142] [4.0 only] eoshift: boundary not filled in correctly

2005-06-28 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-28 23:11 --- Fixed on 4.1, waiting for 4.0 to reopen. -- What|Removed |Added Known to fail

[Bug libfortran/22217] Z edit descriptor with negative numbers

2005-06-30 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-30 08:29 --- It's probably easiest to have xtoa() and friends extract the integer for themselves. If you do this, don't forget to increase the size of buffer[] so it can hold largest_integer_kind*8+1 char

[Bug libfortran/20406] SIZE() matters?

2005-06-30 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-30 08:34 --- Do we really want to fix this? It doesn't really work with ifort, and it is a dubious feature, too. I'm in favor of marking this WONTFIX. -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=20406

[Bug fortran/22244] dimension information is lost for multi-dimension array

2005-06-30 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-30 08:42 --- Confirmed. -- What|Removed |Added Keywords||wrong

[Bug fortran/22244] dimension information is lost for multi-dimension array

2005-06-30 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-06-30 13:29 --- g77 gets this right: $ g77 -g array2.f $ gdb ./a.out GNU gdb Red Hat Linux (6.3.0.0-0.30.1rh) Copyright 2004 Free Software Foundation, Inc. GDB is free software, covered by the GNU General Public License

[Bug libfortran/22307] New: Missing tests for actual library functions

2005-07-05 Thread tkoenig at gcc dot gnu dot org
Product: gcc Version: 4.1.0 Status: UNCONFIRMED Severity: critical Priority: P2 Component: libfortran AssignedTo: unassigned at gcc dot gnu dot org ReportedBy: tkoenig at gcc dot gnu dot org CC: gcc-bugs at gcc dot g

[Bug fortran/22304] gfortran silently changes values in equilvanence'd variables

2005-07-06 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-07-06 11:32 --- In this case, we forget the common block name. >From the .t02.original: MAIN__ () { static union { int4 o[30]; } equiv.0; equiv.0.o[8] = 1; mysub (); } mysub () { static un

<    3   4   5   6   7   8   9   10   11   12   >