[Bug fortran/20872] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' MODULE TEST INTERFACE sum MODULE PROCEDURE sum_i,sum_r END INTERFACE CONTAINS SUBROUTINE sum_i(i) INTEGER :: I END SUBROUTINE SUBROUTINE sum_r(r) REAL :: r END SUBROUTINE

[Bug fortran/20873] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' FUNCTION L(I,J) ENTRY M(I,*) END FUNCTION L END -- Summary: error needed Product: gcc Version: 4.1.0 Status: UNCONFIRMED Sever

[Bug fortran/20874] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' MODULE Test CONTAINS ELEMENTAL FUNCTION LL(I) INTEGER, INTENT(IN) :: I INTEGER :: LL(2) ! should be scalar END FUNCTION LL END MODULE Test USE Test END -- Su

[Bug fortran/20875] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' MODULE Test CONTAINS ELEMENTAL FUNCTION LL(I) INTEGER, INTENT(IN) :: I INTEGER, POINTER :: LL END FUNCTION LL END MODULE Test USE Test END -- Summary: error n

[Bug fortran/20876] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' MODULE TT TYPE data_type INTEGER :: I END TYPE data_type INTERFACE ASSIGNMENT (=) MODULE PROCEDURE set END INTERFACE CONTAINS SUBROUTINE set(x1,x2) TYPE(data_type), IN

[Bug fortran/20877] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' MODULE TT CONTAINS FUNCTION K(I) RESULT(J) ENTRY J() END FUNCTION K END MODULE END -- Summary: error needed Product: gcc Version: 4.1.0

[Bug fortran/20878] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' MODULE TEST TYPE data_type INTEGER :: I END TYPE data_type INTERFACE SUBROUTINE TRY(X) TYPE(data_type) :: X ! see note 14.10 END SUBROUTINE TRY END INTERFACE END MODULE

[Bug fortran/20879] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' CHARACTER(LEN=10) :: test write(6,*) ICHAR(test) END -- Summary: error needed Product: gcc Version: 4.1.0 Status: UNCONFIRMED

[Bug fortran/20880] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' module test_mod interface subroutine my_sub (a) real a end subroutine end interface end module

[Bug fortran/20881] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' SUBROUTINE TT() CHARACTER(LEN=*), EXTERNAL :: F CHARACTER(LEN=10) :: T T=F() END SUBROUTINE TT

[Bug fortran/20882] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' TYPE T1 INTEGER :: I END TYPE T1 TYPE(T1), POINTER :: a a=>TST(T1(0)) CONTAINS PURE FUNCTION TST(A) RESULT(RES) TYPE(T1), INTENT(IN), TARGET :: A TYPE(T1), POINTER :: RES RE

[Bug fortran/20883] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' write (*,i0)i end -- Summary: error needed Product: gcc Version: 4.1.0 Status: UNCONFIRMED Severity: normal Priority:

[Bug fortran/20884] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' MODULE TEST INTERFACE OPERATOR (.EqualTo.) MODULE PROCEDURE Is_Equal_To_Single END INTERFACE OPERATOR (.EqualTo.) CONTAINS ! should be a function 7.3 SUBROUTINE Is_Equal_

[Bug fortran/20885] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' INTEGER, DIMENSION(2,2) :: D=RESHAPE((/1,2,3,4/),(/2,2/)) CALL TT(D,10) write(6,*) D CALL TT(D,11) write(6,*) D CONTAINS RECURSIVE SUBROUTINE TT (D,I) INTEGER, DIMENSION(2

[Bug fortran/20886] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' MODULE TEST INTERFACE CALCULATION MODULE PROCEDURE C1,C2 END INTERFACE CONTAINS SUBROUTINE C1(r) INTEGER :: r END SUBROUTINE SUBROUTINE C2(r) REAL :: r END SUBROUTINE END MODULE TE

[Bug fortran/20887] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' MODULE TEST INTERFACE CALCULATION MODULE PROCEDURE C1,C2 END INTERFACE CONTAINS SUBROUTINE C1(r) INTEGER :: r END SUBROUTINE SUBROUTINE C2(r) REAL :: r END SUBROUTINE END MODULE TE

[Bug fortran/20888] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' REAL, POINTER :: TEST NULLIFY(TEST) IF (TEST .EQ. NULL(TEST)) TEST=>NULL() END -- Summary: error needed Product: gcc Version: 4.1.0 Stat

[Bug fortran/20889] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' TYPE TEST REAL, POINTER :: A INTEGER, POINTER :: B END TYPE REAL, POINTER :: RP INTEGER, POINTER :: IP TYPE(TEST) :: DD DD=TEST(NULL(IP),NULL(RP)) END -- Summary: error

[Bug fortran/20890] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' BLOCK DATA INTEGER :: I=1,J=2 EQUIVALENCE(I,J) END BLOCK DATA END -- Summary: error needed Product: gcc Version: 4.1.0 Status: UNC

[Bug fortran/20891] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' INTEGER, POINTER :: I INTEGER, DIMENSION(:),ALLOCATABLE :: N ALLOCATE(I,N(I)) END -- Summary: error needed Product: gcc Version: 4.1.0

[Bug fortran/20892] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' SUBROUTINE TEST(S) INTERFACE S REAL FUNCTION S_r(R) REAL :: r END FUNCTION REAL FUNCTION S_i(I) INTEGER :: I END FUNCTION END INTERFACE END SUBROUTINE

[Bug fortran/20893] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' CALL T1(1,2) CONTAINS SUBROUTINE T1(A1,A2,A3) INTEGER :: A1,A2 INTEGER, OPTIONAL :: A3(2) write(6,*) MAX(A1,A2,A3) END SUBROUTINE END -- Summary: error neede

[Bug fortran/20894] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' INTEGER, POINTER :: I,J INTEGER :: K ALLOCATE(I) J=>(I) END -- Summary: error needed Product: gcc Version: 4.1.0 Status: UNCONFIRMED

[Bug fortran/20895] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' CHARACTER(LEN=10), TARGET :: a CHARACTER(LEN=4), POINTER :: b b=>a END -- Summary: error needed Product: gcc Version: 4.1.0 Statu

[Bug fortran/20896] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' INTERFACE g SUBROUTINE s1(p) INTERFACE SUBROUTINE p END END INTERFACE END SUBROUTINE s2(p) INTERFACE REAL FUNCTION p() E

[Bug fortran/20897] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' TYPE doubleprecision REAL x END TYPE END -- Summary: error needed Product: gcc Version: 4.1.0 Status: UNCONFIRMED Sever

[Bug fortran/20898] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' & end -- Summary: error needed

[Bug fortran/20899] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' common /z/ i contains pure integer function test(j) integer, intent(in) :: j common /z/ i integer :: k equivalence(i,k) k=1 test=i*j end function test end --

[Bug fortran/20900] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' MODULE TEST INTEGER :: I END MODULE ! note 11.7 USE TEST, ONLY : K=>I INTEGER :: L EQUIVALENCE(K,L) END -- Summary: error needed Product: gcc Versio

[Bug fortran/20901] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' character(len=4) :: a integer :: i equivalence(a,i) END -- Summary: error needed Product: gcc Version: 4.1.0 Status: UNCONFIRMED

[Bug fortran/20902] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' TYPE T1 sequence integer :: i=1 END TYPE T1 TYPE T2 sequence integer :: i=2 END TYPE T2 TYPE(T1) :: a1 TYPE(T2) :: a2 EQUIVALENCE(a1,a2) write(6,*) a1,a2 END -- Summar

[Bug fortran/20903] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' module test implicit none type functionparams integer :: i end type functionparams contains subroutine sim_mc(func,params) interface function func(fparams) type(f

[Bug fortran/20904] New: error needed

2005-04-08 Thread jv244 at cam dot ac dot uk
The following is non-standard and the compiler should probably generate a warning/error with '-pedantic -std=f95' function testpresent(arg) integer, intent(in), optional :: arg character(len=arg) :: s logical :: testpresent

[Bug fortran/20834] error needed

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 16:16 --- This gives a seg fault for me. This is a dup of bug 18870, really. *** This bug has been marked as a duplicate of 18870 *** -- What|Removed |Added -

[Bug fortran/18870] [g77 regression] Equivalencing two common blocks is not caught

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 16:16 --- *** Bug 20834 has been marked as a duplicate of this bug. *** -- What|Removed |Added

[Bug target/20126] [3.3/3.4/4.0/4.1 Regression] Inlined memcmp makes one argument null on entry

2005-04-08 Thread aoliva at redhat dot com
--- Additional Comments From aoliva at gcc dot gnu dot org 2005-04-08 16:34 --- Subject: Re: [PR target/20126, RFC] loop DEST_ADDR biv replacement may fail On Mar 11, 2005, Alexandre Oliva <[EMAIL PROTECTED]> wrote: > On Mar 10, 2005, Alexandre Oliva <[EMAIL PROTECTED]> wrote: >> + ?

[Bug c++/19404] [4.0 Regression] anonymous types and templates and rejecting valid code

2005-04-08 Thread lars at trolltech dot com
--- Additional Comments From lars at trolltech dot com 2005-04-08 16:35 --- Subject: Re: [4.0 Regression] anonymous types and templates and rejecting valid code On Friday 08 April 2005 17:34, mark at codesourcery dot com wrote: > --- Additional Comments From mark at codesourcery d

[Bug rtl-optimization/20413] VOIDmode LABEL_REFs are generated

2005-04-08 Thread amylaar at gcc dot gnu dot org
--- Additional Comments From amylaar at gcc dot gnu dot org 2005-04-08 16:36 --- (In reply to comment #4) > I have removed the build keyword because I have found an ugly hack - > wildcard splitters - that allow the sh64-elf build to proceed > despite of this bug. Note this workaround do

[Bug middle-end/20815] -fprofile-use barfs with "coverage mismatch for function '...' while reading counter 'arcs'."

2005-04-08 Thread dank at kegel dot com
--- Additional Comments From dank at kegel dot com 2005-04-08 16:38 --- Or should the doc say also that the argument to -frandom-seed should be the same every time anyone compiles the same file? In that case, the relative path of the file within the project would be a better choice. So

[Bug c++/20905] New: confuses unrelated type name with instance name

2005-04-08 Thread boris at kolpackov dot net
$ cat >text.cxx struct name {}; int f (); void g () { if (int name = f ()) { } } $ g++-3.4 -c text.cxx test.cxx: In function `void g()': test.cxx:9: error: expected primary-expression before "int" test.cxx:9: error: expected `)' before "int" -- Summary: confuses unrelated ty

[Bug c++/20905] [3.4/4.0/4.1 Regression] confuses unrelated type name with instance name

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 16:58 --- Confirmed, most reduced testcase: struct name {}; void g () { if (int name = 1) ; } : Search converges between 2002-12-14-trunk (#159) and 2002-12-29-trunk (#160). Looks like it was introduced by the ne

[Bug target/20126] [3.3/3.4/4.0/4.1 Regression] Inlined memcmp makes one argument null on entry

2005-04-08 Thread roger at eyesopen dot com
--- Additional Comments From roger at eyesopen dot com 2005-04-08 17:03 --- Subject: Re: [PR target/20126, RFC] loop DEST_ADDR biv replacement may fail Hi Alex, On 8 Apr 2005, Alexandre Oliva wrote: > Roger suggested some changes in the patch. I've finally completed > bootstrap and t

[Bug middle-end/20396] TRULY_NOOP_TRUNCATION ignored

2005-04-08 Thread amylaar at gcc dot gnu dot org
--- Additional Comments From amylaar at gcc dot gnu dot org 2005-04-08 17:04 --- (In reply to comment #1) :2005-03-09 J"orn Rennecke <[EMAIL PROTECTED]> :Richard Shann <[EMAIL PROTECTED]> : :* emit-rtl.c (gen_lowpart_common): Handle TRUNCATE. Generate :TRUNC

[Bug fortran/13257] Error instead of warning for missing comma in format string

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 17:07 --- Patch here: . -- What|Removed |Added

[Bug fortran/13082] Function entries and entries with alternate returns not implemented

2005-04-08 Thread jakub at gcc dot gnu dot org
--- Additional Comments From jakub at gcc dot gnu dot org 2005-04-08 17:10 --- Patch here: -- What|Removed |Added

[Bug fortran/17758] gfortran_abort should be marked as noreturn

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 17:25 --- I am going to fix this. Is there any other known functions that don't return in fortran? -- What|Removed |Added --

[Bug libstdc++/20806] [3.4/4.0/4.1 Regression] basic_filebuf::xsgetn() fails with text mode and DOS line endings and large buffers

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 17:31 --- Subject: Bug 20806 CVSROOT:/cvs/gcc Module name:gcc Changes by: [EMAIL PROTECTED] 2005-04-08 17:31:34 Modified files: libstdc++-v3 : ChangeLog libstdc++-v3/inclu

[Bug libstdc++/20806] [3.4/4.0/4.1 Regression] basic_filebuf::xsgetn() fails with text mode and DOS line endings and large buffers

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 17:34 --- Subject: Bug 20806 CVSROOT:/cvs/gcc Module name:gcc Branch: gcc-4_0-branch Changes by: [EMAIL PROTECTED] 2005-04-08 17:34:35 Modified files: libstdc++-v3 : Change

[Bug rtl-optimization/20756] Clobbers of deleted insns are processed, but left out

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 17:42 --- Subject: Bug 20756 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 17:41:35 Modified files: gcc/config/sh : crt

[Bug middle-end/20793] allocate_initial_values does not adjust register liveness information

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 17:42 --- Subject: Bug 20793 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 17:41:35 Modified files: gcc/config/sh : crt

[Bug target/20695] sh64-*-* port deos not handle 32 / 64 bit conversions properly

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 17:43 --- Subject: Bug 20695 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 17:41:35 Modified files: gcc/config/sh : crt

[Bug middle-end/20714] emit_no_conflict_block does invalid reordering

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 17:42 --- Subject: Bug 20714 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 17:41:35 Modified files: gcc/config/sh : crt

[Bug rtl-optimization/20769] bt-load.c doesn't take nonlocal gotos into account.

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 17:43 --- Subject: Bug 20769 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 17:41:35 Modified files: gcc/config/sh : crt

[Bug rtl-optimization/20413] VOIDmode LABEL_REFs are generated

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 17:43 --- Subject: Bug 20413 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 17:41:35 Modified files: gcc/config/sh : crt

[Bug middle-end/20396] TRULY_NOOP_TRUNCATION ignored

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 17:43 --- Subject: Bug 20396 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 17:41:35 Modified files: gcc/config/sh : crt

[Bug testsuite/16230] Spurious test failures with --disable-static

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 18:03 --- This effects more than just libgcj, it effects all .exp. -- What|Removed |Added Com

[Bug tree-optimization/19794] [meta-bug] Jump threading related bugs

2005-04-08 Thread law at redhat dot com
--- Additional Comments From law at redhat dot com 2005-04-08 18:19 --- OK. I'm pretty sure the perl improvements are really just an artifact of changes in what objects get spilled onto the stack on the offsets of each particular object. I can with a small amount of work twiddle register

[Bug middle-end/20396] TRULY_NOOP_TRUNCATION ignored

2005-04-08 Thread amylaar at gcc dot gnu dot org
--- Additional Comments From amylaar at gcc dot gnu dot org 2005-04-08 18:23 --- Patch is here: http://gcc.gnu.org/ml/gcc-patches/2005-04/msg00883.html -- What|Removed |Added

[Bug middle-end/20793] allocate_initial_values does not adjust register liveness information

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 18:28 --- Subject: Bug 20793 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 18:28:02 Modified files: gcc: Cha

[Bug middle-end/20714] emit_no_conflict_block does invalid reordering

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 18:28 --- Subject: Bug 20714 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 18:28:02 Modified files: gcc: Cha

[Bug target/20695] sh64-*-* port deos not handle 32 / 64 bit conversions properly

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 18:28 --- Subject: Bug 20695 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 18:28:02 Modified files: gcc: Cha

[Bug rtl-optimization/20756] Clobbers of deleted insns are processed, but left out

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 18:28 --- Subject: Bug 20756 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 18:28:02 Modified files: gcc: Cha

[Bug rtl-optimization/20769] bt-load.c doesn't take nonlocal gotos into account.

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 18:28 --- Subject: Bug 20769 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 18:28:02 Modified files: gcc: Cha

[Bug middle-end/20396] TRULY_NOOP_TRUNCATION ignored

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 18:28 --- Subject: Bug 20396 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 18:28:02 Modified files: gcc: Cha

[Bug rtl-optimization/20413] VOIDmode LABEL_REFs are generated

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 18:28 --- Subject: Bug 20413 CVSROOT:/cvs/gcc Module name:gcc Branch: sh-elf-4_1-branch Changes by: [EMAIL PROTECTED] 2005-04-08 18:28:02 Modified files: gcc: Cha

[Bug rtl-optimization/20756] Clobbers of deleted insns are processed, but left out

2005-04-08 Thread amylaar at gcc dot gnu dot org
--- Additional Comments From amylaar at gcc dot gnu dot org 2005-04-08 18:33 --- The patch has been posted here: http://gcc.gnu.org/ml/gcc-patches/2005-04/msg00895.html -- What|Removed |Added ---

[Bug c++/20906] New: bad diagnostic

2005-04-08 Thread igodard at pacbell dot net
in: template struct bar {}; template struct foo { void pop(bar& b, int j); }; template void foo::pop(bar&, int) {} you get: ~/ootbc/members/src$ g++ foo.cc foo.cc:3: error: variable or field `pop' declared void foo.cc:3: error: `int foo::pop' is not a static member of `struct foo' foo.cc:3: err

[Bug target/20814] [4.1 Regression] ICE in extract_insn for test vmx/varargs-1.c

2005-04-08 Thread dje at watson dot ibm dot com
--- Additional Comments From dje at watson dot ibm dot com 2005-04-08 18:57 --- Subject: Re: New: ICE in extract_insn for test vmx/varargs-1.c In addition to the previous change, altivec_register_operand needs to accept SUBREG. David Index: predicates.md ===

[Bug middle-end/20714] emit_no_conflict_block does invalid reordering

2005-04-08 Thread amylaar at gcc dot gnu dot org
--- Additional Comments From amylaar at gcc dot gnu dot org 2005-04-08 19:07 --- The patch has been posted here: http://gcc.gnu.org/ml/gcc-patches/2005-04/msg00903.html -- What|Removed |Added ---

[Bug rtl-optimization/20769] bt-load.c doesn't take nonlocal gotos into account.

2005-04-08 Thread amylaar at gcc dot gnu dot org
--- Additional Comments From amylaar at gcc dot gnu dot org 2005-04-08 19:09 --- The patch has been posted here: http://gcc.gnu.org/ml/gcc-patches/2005-04/msg00904.html -- What|Removed |Added ---

[Bug middle-end/20793] allocate_initial_values does not adjust register liveness information

2005-04-08 Thread amylaar at gcc dot gnu dot org
--- Additional Comments From amylaar at gcc dot gnu dot org 2005-04-08 19:10 --- The patch has been posted here: http://gcc.gnu.org/ml/gcc-patches/2005-04/msg00905.html -- What|Removed |Added ---

[Bug preprocessor/20907] New: long comments throw off line numbers

2005-04-08 Thread dpatel at apple dot com
It seems that long comment blocks can throw off gcc's notion of the source line number. Here is a sample test case (also attached in case the line breaks get messed up pasting in): /* This is a really long comment. This is a really long comment. This is a really long comment. This is a really

[Bug libfortran/20832] Segfault in SUM

2005-04-08 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-04-08 19:18 --- *** This bug has been marked as a duplicate of 19106 *** -- What|Removed |Added

[Bug libfortran/19106] segfault in executable for print *,sum(a,dim=2,mask=a>0)

2005-04-08 Thread tkoenig at gcc dot gnu dot org
--- Additional Comments From tkoenig at gcc dot gnu dot org 2005-04-08 19:18 --- *** Bug 20832 has been marked as a duplicate of this bug. *** -- What|Removed |Added

[Bug debug/20830] [3.3/3.4 Regression] bad debug info for static nested struct with virtual function

2005-04-08 Thread drow at false dot org
--- Additional Comments From drow at false dot org 2005-04-08 19:33 --- Subject: Re: bad debug info for static nested struct with virtual function On Fri, Apr 08, 2005 at 01:35:59PM -, kjd at duda dot org wrote: > I get identical behavior from both GNU gdb Red Hat Linux (6.1post- >

[Bug libgcj/20908] New: [m68k-linux] libjava testsuite fails about 600 tests

2005-04-08 Thread debian-gcc at lists dot debian dot org
after finishing a CVS 4.0 20050326 bootstrap and testsuite run in real 16653m49.206s the libjava testsuite fails about 600 tests with Running /home/doko/4.0/gcc-4.0-4.0ds9/src/libjava/testsuite/libjava.cni/cni.exp ... byte compile: /home/doko/4.0/gcc-4.0-4.0ds9/build/gcc/gcj -B/home/doko/4.0/g

[Bug c++/20145] [4.0/4.1 Regression] template "class has virtual functions ... " is not suppressed with -isystem

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 19:36 --- Subject: Bug 20145 CVSROOT:/cvs/gcc Module name:gcc Branch: gcc-4_0-branch Changes by: [EMAIL PROTECTED] 2005-04-08 19:36:12 Modified files: gcc/cp : Change

[Bug c++/20906] bad diagnostic

2005-04-08 Thread bangerth at dealii dot org
--- Additional Comments From bangerth at dealii dot org 2005-04-08 19:38 --- This is duplicate of PR 99. *** This bug has been marked as a duplicate of 99 *** -- What|Removed |Added ---

[Bug c++/99] Bug in template type in error message.

2005-04-08 Thread bangerth at dealii dot org
--- Additional Comments From bangerth at dealii dot org 2005-04-08 19:38 --- *** Bug 20906 has been marked as a duplicate of this bug. *** -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=99

[Bug c++/20145] [4.0/4.1 Regression] template "class has virtual functions ... " is not suppressed with -isystem

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 19:40 --- Subject: Bug 20145 CVSROOT:/cvs/gcc Module name:gcc Changes by: [EMAIL PROTECTED] 2005-04-08 19:39:59 Modified files: gcc/cp : ChangeLog cp-tree.def cp-tree.h tree.

[Bug libstdc++/20909] New: incorrect floating point format

2005-04-08 Thread cpp at tempest-sw dot com
In some locales, certain floating point numbers are printed incorrectly. (I think the problem lies with numbers with one significant digits, in scientific format, with a thousands separator and thousands grouping.) For example: #include #include #include int main() { std::wcout.imbue(std::l

[Bug c++/20145] [4.0/4.1 Regression] template "class has virtual functions ... " is not suppressed with -isystem

2005-04-08 Thread mmitchel at gcc dot gnu dot org
--- Additional Comments From mmitchel at gcc dot gnu dot org 2005-04-08 19:41 --- Fixed in 4.0. -- What|Removed |Added Status|REOPENED|RESOLV

[Bug debug/20830] [3.3/3.4 Regression] bad debug info for static nested struct with virtual function

2005-04-08 Thread kjd at duda dot org
--- Additional Comments From kjd at duda dot org 2005-04-08 19:51 --- (In reply to comment #4) > Subject: Re: bad debug info for static nested struct with virtual function > On Fri, Apr 08, 2005 at 01:35:59PM -, kjd at duda dot org wrote: > > I get identical behavior from both GNU gd

[Bug target/18649] terminate called after throwing - IOT/Abort trap (core dumped)

2005-04-08 Thread cmchugh at callixa dot com
--- Additional Comments From cmchugh at callixa dot com 2005-04-08 20:18 --- I downloaded and built 3.4.3 on AIX 5.2, and this bug does still exist; I tried the following program (scarfed from 13391) and it crashes every time. Is there any resolution/fix ? bluetrance:13391$ more a2.cp

[Bug preprocessor/20907] [4.0/4.1 Regression] long comments throw off line numbers

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 20:30 --- Confirmed. This has been broken since at least "gcc version 3.5.0 20040909 (experimental)". -- What|Removed |Added ---

[Bug preprocessor/20907] [4.0/4.1 Regression] long comments throw off line numbers

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 20:34 --- This broke between 20040201 and 20040301. -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=20907

[Bug preprocessor/20907] [4.0/4.1 Regression] long comments throw off line numbers

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 20:36 --- There were quiet a number of cpp patches during that time. -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=20907

[Bug fortran/18824] [g77 regression] ENTRY with alternate return causes compiler segfault

2005-04-08 Thread jakub at gcc dot gnu dot org
--- Additional Comments From jakub at gcc dot gnu dot org 2005-04-08 20:40 --- Patch here: -- What|Removed |Added

[Bug target/20126] [3.3/3.4/4.0/4.1 Regression] Inlined memcmp makes one argument null on entry

2005-04-08 Thread aoliva at redhat dot com
--- Additional Comments From aoliva at gcc dot gnu dot org 2005-04-08 20:51 --- Subject: Re: [PR target/20126, RFC] loop DEST_ADDR biv replacement may fail On Apr 8, 2005, Roger Sayle <[EMAIL PROTECTED]> wrote: > Ahh, I now see the misunderstanding; you changed/fixed the other > "safe

[Bug fortran/20869] error needed

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 20:55 --- *** This bug has been marked as a duplicate of 20373 *** -- What|Removed |Added

[Bug fortran/20373] INTRINSIC symbols can be given the wrong type

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 20:55 --- *** Bug 20869 has been marked as a duplicate of this bug. *** -- What|Removed |Added

[Bug fortran/20898] error needed

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 20:58 --- Question, is the & on the first line? If this is true then this is just PR 19101. -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=20898

[Bug fortran/19260] & not required when splitting a token in continuation

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 21:00 --- Isn't this a dup of bug 19101? -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=19260

[Bug libstdc++/20909] incorrect floating point format

2005-04-08 Thread pcarlini at suse dot de
--- Additional Comments From pcarlini at suse dot de 2005-04-08 21:00 --- Yes, this is actually a very long standing bug, which we hoped didn't trigger in common situations (because the fix probably is rather ugly :( Ok, let's finally work on it. Thanks for your report. --

[Bug fortran/20898] error needed

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 21:01 --- *** This bug has been marked as a duplicate of 19261 *** -- What|Removed |Added

[Bug fortran/19261] continuation character illegal as first non-blank character in statement

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 21:01 --- *** Bug 20898 has been marked as a duplicate of this bug. *** -- What|Removed |Added

[Bug fortran/19261] continuation character illegal as first non-blank character in statement

2005-04-08 Thread pinskia at gcc dot gnu dot org
--- Additional Comments From pinskia at gcc dot gnu dot org 2005-04-08 21:01 --- Isn't this related to or at least a dup of bug 19101? -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=19261

[Bug c++/20905] [3.4/4.0/4.1 Regression] confuses unrelated type name with instance name

2005-04-08 Thread cvs-commit at gcc dot gnu dot org
--- Additional Comments From cvs-commit at gcc dot gnu dot org 2005-04-08 21:14 --- Subject: Bug 20905 CVSROOT:/cvs/gcc Module name:gcc Changes by: [EMAIL PROTECTED] 2005-04-08 21:13:57 Modified files: gcc/cp : ChangeLog parser.c gcc/tests

[Bug java/20910] New: gcc-4_0-brach GCJ ICE

2005-04-08 Thread steve at netfuel dot com
When building gcc-4.0-brach Using [EMAIL PROTECTED] obj]$ gcc -v Using built-in specs. Target: i686-pc-linux-gnu Configured with: ../gcc/configure --prefix=/opt/gcc-4.0.0-cvs --enable-languages=c,c++,java Thread model: posix gcc version 4.0.0 20050331 (prerelease) export PATH=/home/steve/cross-to

[Bug java/20910] gcc-4_0-brach GCJ ICE

2005-04-08 Thread pinskia at gcc dot gnu dot org
-- What|Removed |Added Severity|critical|normal Keywords||build, ice-on-valid-code http://gcc.gnu.org/bugzilla/s

<    1   2   3   >