[Bug fortran/30883] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: MODULE M1 IMPLICIT NONE CONTAINS SUBROUTINE S1(F1) INTERFACE FUNCTION F1() END FUNCTION F1 END INTERFACE END SUBROUTINE S1 END MODULE END -- Summary: incorrect error message

[Bug fortran/30882] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: SUBROUTINE S1(a) INTEGER :: a(*) IF(SIZE(a(1:10),1).NE.10) CALL ABORT() END SUBROUTINE S1 INTEGER :: a(10) CALL S1(a) END -- Summary: incorrect error message for valid code Product

[Bug fortran/30881] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: INTEGER, PARAMETER :: K=1 INTEGER :: I I=TRANSFER(.TRUE.,K) SELECT CASE(I) CASE(TRANSFER(.TRUE.,K)) CASE(TRANSFER(.FALSE.,K)) CALL ABORT() CASE DEFAULT CALL ABORT() END SELECT I=TRANSFER(.FALSE.,K) SELECT

[Bug fortran/30880] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: MODULE M1 TYPE T1 INTEGER :: i=7 END TYPE T1 CONTAINS FUNCTION F1(d1) RESULT(res) INTEGER :: res TYPE(T1), INTENT(OUT) :: d1 TYPE(T1), INTENT(INOUT) :: d2 res=d1%i d1%i=0 RETURN ENTRY E1

[Bug fortran/30879] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: TYPE T1 INTEGER :: I END TYPE T1 TYPE(T1), PARAMETER :: D1=T1(2) INTEGER :: a(2) DATA (a(i),i=1,D1%I) /D1%I*D1%I/ END -- Summary: incorrect error message for valid code

[Bug fortran/30878] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: MODULE M1 CONTAINS INTEGER FUNCTION F1() NAMELIST /NML/ F1 F1=1 END FUNCTION INTEGER FUNCTION F2() F2=1 END FUNCTION END MODULE END -- Summary: incorrect error me

[Bug fortran/30877] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: MODULE M1 INTERFACE OPERATOR(*) MODULE PROCEDURE F1 END INTERFACE CONTAINS FUNCTION F1(a,b) RESULT (c) COMPLEX, dimension(2,2), INTENT(IN) :: a COMPLEX, dimension(2), INTENT(IN) :: b COMPLEX, di

[Bug fortran/30876] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: MODULE M1 CONTAINS FUNCTION correct_input(i) INTEGER :: i,correct_input(5) IF (i<1) correct_input=test(1) IF (i>5) correct_input=test(5) END FUNCTION correct_input RECURSIVE FUNCTION test(i) I

[Bug fortran/30875] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: TYPE T1 sequence integer :: i=1 END TYPE T1 TYPE T2 sequence integer :: i=1 END TYPE T2 TYPE(T1) :: a1 TYPE(T2) :: a2 EQUIVALENCE(a1,a2) write(6,*) a1,a2 END -- Summary: incorrect error mes

[Bug fortran/30874] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: program forall_9 real, dimension (5, 5, 5, 5) :: a, b, c, d a (:, :, :, :) = 4 forall (i = 1:5) a (i, i, 6 - i, i) = 7 end forall forall (i = 1:5) a (i, 6 - i, i, i) = 7 end forall for

[Bug fortran/30873] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: MODULE M1 CONTAINS FUNCTION F2(K) INTEGER :: F2,K F2=E1(K) END FUNCTION F2 RECURSIVE FUNCTION F1(I) INTEGER :: F1,I,E1 F1=F2(I) RETURN ENTRY E1(I) E1=-I RETURN END FUNCTION F1 END MODULE M1 USE M1 I

[Bug fortran/30872] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: MODULE MOD1 IMPLICIT NONE INTEGER, PARAMETER :: dp=KIND(0.0D0) CONTAINS SUBROUTINE pw_compose_stripe(weights,in_val,in_val_first,in_val_last,& out_val,n_el) REAL(kind=dp), DIMENSION(0:2), &

[Bug fortran/30871] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: TYPE data CHARACTER(LEN=3) :: A END TYPE TYPE(data), DIMENSION(10), TARGET :: Z CHARACTER(LEN=1), DIMENSION(:), POINTER :: ptr Z(:)%A="123" ptr=>Z(:)%A(2:2) write(6,*) ptr END -- Summary: inco

[Bug fortran/30870] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: MODULE TEST INTERFACE xx MODULE PROCEDURE xx END INTERFACE public :: xx CONTAINS SUBROUTINE xx(i) INTEGER :: I I=7 END SUBROUTINE END MODULE TOO CONTAINS SUBROUTINE SUB(xx,I) INTERFACE SUB

[Bug fortran/30869] New: incorrect error message for valid code

2007-02-19 Thread jv244 at cam dot ac dot uk
With recent trunk, gfortran incorrectly generates an error for the following standard code: INTEGER, POINTER :: i ALLOCATE(i) DO i=1,10 ENDDO DEALLOCATE(i) END -- Summary: incorrect error message for valid code Product: gcc Version: 4.3.0 Status: UNC

[Bug target/30868] can't compile empty main in c on hppa 11iv1 (11.11)

2007-02-19 Thread pinskia at gcc dot gnu dot org
--- Comment #2 from pinskia at gcc dot gnu dot org 2007-02-20 06:38 --- Is this a precompiled GCC? If so are you sure that the program is compiled for the OS version you are using as it looks like it is not. -- pinskia at gcc dot gnu dot org changed: What|Removed

[Bug c/30868] can't compile empty main in c on hppa 11iv1 (11.11)

2007-02-19 Thread r dot ford at cox dot net
--- Comment #1 from r dot ford at cox dot net 2007-02-20 06:13 --- HP-UX hpux B.11.11 U 9000/785 2011004178 -- r dot ford at cox dot net changed: What|Removed |Added

[Bug c/30868] New: can't compile empty main in c on hppa 11iv1 (11.11)

2007-02-19 Thread r dot ford at cox dot net
# gcc -o main.out main.c /usr/lib/dld.sl: Unresolved symbol: pthread_mutex_lock (code) from /usr/local/libexec/gcc/hppa2.0w-hp-hpux11.11/4.1.1/cc1 gcc: Internal error: Aborted (program cc1) Please submit a full bug report. See http://gcc.gnu.org/bugs.html> for instructions. # cc -o main.out main.c

[Bug middle-end/30856] [4.1/4.2/4.3 Regression] Missing "warning: '$FOO' may be used uninitialized in this function" in trivial case

2007-02-19 Thread christoph dot mallon at gmx dot de
--- Comment #10 from christoph dot mallon at gmx dot de 2007-02-20 06:02 --- (In reply to comment #9) > Note SSA CCP usually (this is how it is done in the papers and almost always > done in all comericial compilers too) does PHI<1, UNDEFINED> as just being 1. > > This is still a dup b

[Bug preprocessor/30867] Can we have a new __DATE__ which is sortable, eg YYYY-MM-DD

2007-02-19 Thread pinskia at gcc dot gnu dot org
--- Comment #1 from pinskia at gcc dot gnu dot org 2007-02-20 05:54 --- You should note that __DATE__ and __TIME__ are actually part of the C89 (ANSI) and C90 (ISO) standards. > This is probably a question for the steering committee Really if you up to implementing it, I would say go a

[Bug fortran/30865] optional argument passed on to size(...,dim=)

2007-02-19 Thread pault at gcc dot gnu dot org
-- pault at gcc dot gnu dot org changed: What|Removed |Added Status|UNCONFIRMED |NEW Ever Confirmed|0 |1 Last reconfirm

[Bug fortran/30865] optional argument passed on to size(...,dim=)

2007-02-19 Thread pault at gcc dot gnu dot org
--- Comment #1 from pault at gcc dot gnu dot org 2007-02-20 05:34 --- Confirmed: The first call to checkv produces checkv (&ires, &parm.10, 0B); With prototype: checkv (ires, a1, opt1), the call to size1 is *ires = _gfortran_size1 (&parm.6, *opt1); with the obvious consequences.

[Bug java/30844] invalid "Can't find method" error

2007-02-19 Thread rizzolo at gmail dot com
--- Comment #3 from rizzolo at gmail dot com 2007-02-20 03:25 --- Subject: Re: invalid "Can't find method" error Ya gotta do what ya gotta do. Thanks, - Nick On 20 Feb 2007 02:16:12 -, tromey at gcc dot gnu dot org <[EMAIL PROTECTED]> wrote: > > > --- Comment #2 from tromey

[Bug java/30844] invalid "Can't find method" error

2007-02-19 Thread tromey at gcc dot gnu dot org
--- Comment #2 from tromey at gcc dot gnu dot org 2007-02-20 02:16 --- FWIW we've basically stopped fixing bugs in the older gcj front end and instead we've switched to using ecj. I would close this as "wontfix" but that seems a bit harsh to do unannounced... so with your permission I'd

[Bug preprocessor/30867] New: Can we have a new __DATE__ which is sortable, eg YYYY-MM-DD

2007-02-19 Thread alf dot lacis at aiscientific dot com
Several times now in different jobs, I have come across the need for a better __DATE__ and __TIME__, and always had to use a function such as that listed below. This is probably a question for the steering committee, but can I suggest the following. In particular, some formats which are sortable

[Bug middle-end/29943] [4.2/4.3 Regression] gcc generate incorrect alias symbols for PPC

2007-02-19 Thread amodra at bigpond dot net dot au
--- Comment #14 from amodra at bigpond dot net dot au 2007-02-20 01:29 --- Patch applied -- amodra at bigpond dot net dot au changed: What|Removed |Added Sta

[Bug middle-end/29943] [4.2/4.3 Regression] gcc generate incorrect alias symbols for PPC

2007-02-19 Thread amodra at bigpond dot net dot au
-- amodra at bigpond dot net dot au changed: What|Removed |Added AssignedTo|unassigned at gcc dot gnu |amodra at bigpond dot net |dot org

[Bug middle-end/29943] [4.2/4.3 Regression] gcc generate incorrect alias symbols for PPC

2007-02-19 Thread amodra at gcc dot gnu dot org
--- Comment #13 from amodra at gcc dot gnu dot org 2007-02-20 01:28 --- Subject: Bug 29943 Author: amodra Date: Tue Feb 20 01:28:01 2007 New Revision: 122149 URL: http://gcc.gnu.org/viewcvs?root=gcc&view=rev&rev=122149 Log: PR target/29943 * varasm.c (use_blocks_for_dec

[Bug middle-end/29943] [4.2/4.3 Regression] gcc generate incorrect alias symbols for PPC

2007-02-19 Thread amodra at gcc dot gnu dot org
--- Comment #12 from amodra at gcc dot gnu dot org 2007-02-20 01:25 --- Subject: Bug 29943 Author: amodra Date: Tue Feb 20 01:25:41 2007 New Revision: 122148 URL: http://gcc.gnu.org/viewcvs?root=gcc&view=rev&rev=122148 Log: PR target/29943 * varasm.c (use_blocks_for_dec

[Bug debug/29558] [4.2/4.3 Regression] ICE in set_variable_part, at var-tracking.c:2140

2007-02-19 Thread rth at gcc dot gnu dot org
--- Comment #10 from rth at gcc dot gnu dot org 2007-02-19 23:45 --- Fixed. -- rth at gcc dot gnu dot org changed: What|Removed |Added Status|ASSIGNED

[Bug tree-optimization/28544] [4.2 regression] ICE in add_virtual_operand, at tree-ssa-operands.c:1309

2007-02-19 Thread dberlin at gcc dot gnu dot org
--- Comment #21 from dberlin at gcc dot gnu dot org 2007-02-19 23:41 --- (In reply to comment #20) > Is there a backport of the mainline patch that I could review, or ask another > maintainer to review for inclusion in 4.2? > > Thanks, > > -- Mark > The attached patch named "access_

[Bug tree-optimization/28544] [4.2 regression] ICE in add_virtual_operand, at tree-ssa-operands.c:1309

2007-02-19 Thread mmitchel at gcc dot gnu dot org
--- Comment #20 from mmitchel at gcc dot gnu dot org 2007-02-19 23:33 --- Is there a backport of the mainline patch that I could review, or ask another maintainer to review for inclusion in 4.2? Thanks, -- Mark -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=28544

[Bug tree-optimization/29718] [4.2 Regression] ice in add_virtual_operand with some C++ code

2007-02-19 Thread moshevds at gmail dot com
--- Comment #8 from moshevds at gmail dot com 2007-02-19 22:58 --- I'll update my gcc and try sometime this week. -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=29718

[Bug c++/30866] [4.3 regression] Another ICE in calc_dfs_tree()

2007-02-19 Thread martin at mpa-garching dot mpg dot de
--- Comment #2 from martin at mpa-garching dot mpg dot de 2007-02-19 22:39 --- Created an attachment (id=13071) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=13071&action=view) preprocessed, unreduced test case -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30866

[Bug c++/30866] [4.3 regression] Another ICE in calc_dfs_tree()

2007-02-19 Thread martin at mpa-garching dot mpg dot de
--- Comment #1 from martin at mpa-garching dot mpg dot de 2007-02-19 22:32 --- Sorry, I meant PR25874. -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30866

[Bug c++/30866] New: [4.3 regression] Another ICE in calc_dfs_tree()

2007-02-19 Thread martin at mpa-garching dot mpg dot de
ran --enable-checking=release Thread model: posix gcc version 4.3.0 20070219 (experimental) /home/martin/software/ugcc/libexec/gcc/x86_64-unknown-linux-gnu/4.3.0/cc1plus -fpreprocessed bug.ii -quiet -dumpbase bug.ii -mtune=generic -auxbase bug -O -version -o /tmp/ccpih7d1.s GNU C++ version 4.

[Bug preprocessor/30805] [4.1/4.2/4.3 Regression] Internal compiler error when using "x##,##__VA_ARGS__" in macro

2007-02-19 Thread joseph at codesourcery dot com
--- Comment #3 from joseph at codesourcery dot com 2007-02-19 22:20 --- Subject: Re: [4.1/4.2/4.3 Regression] Internal compiler error when using "x##,##__VA_ARGS__" in macro The order of evaluation of ## operators is unspecified. If the left ## is evaluated first, it tries to concate

[Bug fortran/30865] New: optional argument passed on to size(...,dim=)

2007-02-19 Thread tkoenig at gcc dot gnu dot org
The following is legal (see <[EMAIL PROTECTED]>), but we segfault on execution: $ cat size.f90 module foo contains subroutine checkv(ires,a1,opt1) integer :: a1(:,:) integer, optional :: opt1 ires = size (a1, dim=opt1) end subroutine checkv end module foo program main use foo

[Bug fortran/30834] ICE with kind=8 exponentiaton

2007-02-19 Thread sgk at troutmask dot apl dot washington dot edu
--- Comment #8 from sgk at troutmask dot apl dot washington dot edu 2007-02-19 21:49 --- Subject: Re: ICE with kind=8 exponentiaton On Mon, Feb 19, 2007 at 09:11:45PM -, tkoenig at gcc dot gnu dot org wrote: > > >Feel free to create a gfc_extract_long_long and document that > > e

Re: Bugzilla administrator

2007-02-19 Thread Jim Wilson
Jarl Friis wrote: Can anyone here tell me who is (and the email of) the GCC bugzilla administrator gcc-bugs is mainly a list for output from our bug database. Posting here isn't very useful. Better to file a bug report, or send email to the gcc list. If you really need to reach an admini

[Bug libfortran/30765] [4.2, 4.1 only] generating files from m4

2007-02-19 Thread tkoenig at gcc dot gnu dot org
--- Comment #4 from tkoenig at gcc dot gnu dot org 2007-02-19 21:44 --- The file generation issue still needs to be fixed on 4.2. -- tkoenig at gcc dot gnu dot org changed: What|Removed |Added ---

[Bug ada/30684] [4.1 regression] boostrap failed with undefined reference to system__pure_exceptions_*

2007-02-19 Thread ebotcazou at gcc dot gnu dot org
-- ebotcazou at gcc dot gnu dot org changed: What|Removed |Added Summary|[4.2 regression] boostrap |[4.1 regression] boostrap |failed with undefined

[Bug c++/30852] [4.1/4.2/4.3 regression] Trouble with __builtin_offsetof and volatile

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P2 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30852

[Bug c++/30851] [4.1/4.2/4.3 regression] ICE with invalid asm statement

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P4 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30851

[Bug c++/30849] [4.1/4.2/4.3 regression] ICE with invalid asm statement

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P4 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30849

[Bug target/30848] [4.1/4.2/4.3 regression] ICE with invalid constraint in asm statement

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P2 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30848

[Bug c++/30847] [4.1/4.2/4.3 regression] ICE with invalid statement expression

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P2 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30847

[Bug fortran/30834] ICE with kind=8 exponentiaton

2007-02-19 Thread tkoenig at gcc dot gnu dot org
--- Comment #7 from tkoenig at gcc dot gnu dot org 2007-02-19 21:11 --- (In reply to comment #6) >Feel free to create a gfc_extract_long_long and document that > e is constrained to be within [LONG_LONG_MIN, LONG_LONG_MAX]. Suppose we don't simplify if gfc_extract_int fails. Would tha

[Bug preprocessor/30805] [4.1/4.2/4.3 Regression] Internal compiler error when using "x##,##__VA_ARGS__" in macro

2007-02-19 Thread mmitchel at gcc dot gnu dot org
--- Comment #2 from mmitchel at gcc dot gnu dot org 2007-02-19 21:09 --- Joseph -- Is this valid code? Thanks, -- Mark -- mmitchel at gcc dot gnu dot org changed: What|Removed |Added -

[Bug preprocessor/30786] [4.1/4.2/4.3 Regression] ICE on _Pragma at end of file

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P2 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30786

[Bug c/30762] [4.2/4.3 Regression] IMA messes up with inlining

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P2 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30762

[Bug middle-end/30761] [4.1/4.2/4.3 regression] Error: unsupported relocation against sfp

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P1 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30761

[Bug c++/30759] [4.1/4.2/4.3 Regression] initializer-list accepted for object of non-POD type

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P2 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30759

[Bug middle-end/30744] [4.2/4.3 Regression] ICE in compare_values, at tree-vrp.c:466

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P1 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30744

[Bug middle-end/30729] [4.1/4.2 Regression] value computed is not used warning with unused result of va_arg

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P2 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30729

[Bug middle-end/30704] [4.2/4.3 Regression] Incorrect constant generation for long long

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P1 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30704

[Bug middle-end/30700] [4.2/4.3 Regression] YA bogus undefined reference error to static func with -g and -O

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P1 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30700

[Bug ada/30684] [4.2 regression] boostrap failed with undefined reference to system__pure_exceptions_*

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P5 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30684

[Bug libstdc++/30675] [4.2/4.3 Regression] libstdc++ testsuite hardcodes "ar" and "ranlib"

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P2 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30675

[Bug fortran/30660] [4.2 and 4.1 only] Allocatable components of a derived type "require" the SAVE attribute.

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P5 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30660

[Bug c++/30535] [4.2/4.3 regression] ICE with invalid template operator

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P4 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30535

[Bug inline-asm/30505] [4.2 regression] asm operand has impossible constraints.

2007-02-19 Thread mmitchel at gcc dot gnu dot org
--- Comment #3 from mmitchel at gcc dot gnu dot org 2007-02-19 21:01 --- Jan -- Would you please comment as to whether or not the error message is valid? Thanks, -- Mark -- mmitchel at gcc dot gnu dot org changed: What|Removed |Added --

[Bug c++/30328] [4.2/4.3 Regression] bit-field: unassemblable assembly code

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P1 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30328

[Bug c++/30303] [4.2/4.3 regression] ICE with invalid constructor definition

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P4 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30303

[Bug c++/30299] [4.2/4.3 regression] ICE with broken template and inheritance

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P4 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30299

[Bug c++/30298] [4.2/4.3 regression] ICE with duplicate broken inheritance

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P4 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30298

[Bug c++/30274] [4.2/4.3 Regression] bool bit-field: wrong increment and decremenet

2007-02-19 Thread mmitchel at gcc dot gnu dot org
--- Comment #6 from mmitchel at gcc dot gnu dot org 2007-02-19 20:57 --- This is not a bug. The C++ standard says: [expr.post.incr] the value of the object is modified by adding 1 to it, unless the object is of type bool, in which case it is set to true -- mmitchel at gcc dot gnu

[Bug tree-optimization/30252] [4.2 regression] miscompilation of sigc++-2.0 based code with -fstrict-aliasing

2007-02-19 Thread mmitchel at gcc dot gnu dot org
--- Comment #6 from mmitchel at gcc dot gnu dot org 2007-02-19 20:52 --- Before we can prioritize this problem, we need to establish that it doesn't violate the aliasing rules. As Andrew says in Comment #2, this looks likely to be a problem in the input program. -- mmitchel at gcc

[Bug middle-end/30864] [4.3 Regression] ice for legal code with -O3

2007-02-19 Thread pinskia at gcc dot gnu dot org
--- Comment #2 from pinskia at gcc dot gnu dot org 2007-02-19 20:50 --- Reducing ... -- pinskia at gcc dot gnu dot org changed: What|Removed |Added CC|

[Bug c++/30860] Should warn about boolean constant false used in pointer context

2007-02-19 Thread manu at gcc dot gnu dot org
--- Comment #8 from manu at gcc dot gnu dot org 2007-02-19 20:50 --- (In reply to comment #6) > there is an implicit value conversion, boolean "false" to address "0". I think > that is the definition of -Wconversion, no? > > anyway, I'll work on a patch. > Take a look at http://gcc.g

[Bug libfortran/30765] [4.3 regression] generating files from m4

2007-02-19 Thread tkoenig at gcc dot gnu dot org
--- Comment #3 from tkoenig at gcc dot gnu dot org 2007-02-19 20:49 --- Subject: Bug 30765 Author: tkoenig Date: Mon Feb 19 20:49:10 2007 New Revision: 122137 URL: http://gcc.gnu.org/viewcvs?root=gcc&view=rev&rev=122137 Log: 2007-02-19 Thomas Koenig <[EMAIL PROTECTED]> PR li

[Bug libfortran/30533] minval, maxval missing for kind=1 and kind=2

2007-02-19 Thread tkoenig at gcc dot gnu dot org
--- Comment #11 from tkoenig at gcc dot gnu dot org 2007-02-19 20:49 --- Subject: Bug 30533 Author: tkoenig Date: Mon Feb 19 20:49:10 2007 New Revision: 122137 URL: http://gcc.gnu.org/viewcvs?root=gcc&view=rev&rev=122137 Log: 2007-02-19 Thomas Koenig <[EMAIL PROTECTED]> PR

[Bug c++/30860] Should warn about boolean constant false used in pointer context

2007-02-19 Thread gdr at cs dot tamu dot edu
--- Comment #7 from gdr at cs dot tamu dot edu 2007-02-19 20:49 --- Subject: Re: Should warn about boolean constant false used in pointer context "mueller at gcc dot gnu dot org" <[EMAIL PROTECTED]> writes: | there is an implicit value conversion, boolean "false" to address "0". I thi

[Bug middle-end/30143] [4.2 only] OpenMP can produce invalid gimple

2007-02-19 Thread mmitchel at gcc dot gnu dot org
--- Comment #11 from mmitchel at gcc dot gnu dot org 2007-02-19 20:49 --- Jakub -- This patch is OK for 4.2 if tested there. Thanks, -- Mark -- mmitchel at gcc dot gnu dot org changed: What|Removed |Added ---

[Bug c++/30864] ice for legal code with -O3

2007-02-19 Thread dcb314 at hotmail dot com
--- Comment #1 from dcb314 at hotmail dot com 2007-02-19 20:45 --- Created an attachment (id=13070) --> (http://gcc.gnu.org/bugzilla/attachment.cgi?id=13070&action=view) gzipped C++ source code -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=30864

[Bug middle-end/29943] [4.2/4.3 Regression] gcc generate incorrect alias symbols for PPC

2007-02-19 Thread mmitchel at gcc dot gnu dot org
--- Comment #11 from mmitchel at gcc dot gnu dot org 2007-02-19 20:45 --- Alan -- This patch is OK. Would you please apply to 4.2 and mainline? Thanks, -- Mark -- mmitchel at gcc dot gnu dot org changed: What|Removed |Added ---

[Bug c++/30864] New: ice for legal code with -O3

2007-02-19 Thread dcb314 at hotmail dot com
I just tried to compile Suse Linux package vym-1.8.1-39 with the GNU C++ compiler version 4.3 snapshot 20070216. The compiler said main.cpp: In function 'void __tcf_8(void*)': main.cpp:123: internal compiler error: in alloc_aux_for_block, at cfg.c:665 Please submit a full bug report, with preproc

[Bug tree-optimization/29902] [4.2 Regression] ICE in coalesce_abnormal_edges, at tree-outof-ssa.c:644

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P1 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=29902

[Bug tree-optimization/29902] [4.2 Regression] ICE in coalesce_abnormal_edges, at tree-outof-ssa.c:644

2007-02-19 Thread mmitchel at gcc dot gnu dot org
--- Comment #9 from mmitchel at gcc dot gnu dot org 2007-02-19 20:43 --- Zdenek -- Can this patch be backported to 4.2? Thanks, -- Mark -- http://gcc.gnu.org/bugzilla/show_bug.cgi?id=29902

[Bug rtl-optimization/29841] [4.2/4.3 regression] ICE with scheduling and __builtin_trap

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P1 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=29841

[Bug libgcj/30862] Installation error

2007-02-19 Thread pinskia at gcc dot gnu dot org
-- pinskia at gcc dot gnu dot org changed: What|Removed |Added Severity|blocker |normal Component|other |libgcj http:

[Bug tree-optimization/29718] [4.2 Regression] ice in add_virtual_operand with some C++ code

2007-02-19 Thread mmitchel at gcc dot gnu dot org
--- Comment #7 from mmitchel at gcc dot gnu dot org 2007-02-19 20:40 --- Moshe -- Do you still see the failure? Richard Guenther believes it to be fixed. -- Mark -- mmitchel at gcc dot gnu dot org changed: What|Removed |Added --

[Bug c++/30863] [4.1/4.2/4.3 Regression] Unsigned templatized struct treated as unsigned int

2007-02-19 Thread pinskia at gcc dot gnu dot org
--- Comment #1 from pinskia at gcc dot gnu dot org 2007-02-19 20:39 --- Confirmed. -- pinskia at gcc dot gnu dot org changed: What|Removed |Added Status|UNCON

[Bug debug/29614] [4.2/4.3 Regression] DWARF information for function static variable is missing after unrelated code addition

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P2 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=29614

[Bug tree-optimization/29585] [4.2 Regression] tree check: expected ssa_name, have var_decl in is_old_name, at tree-into-ssa.c:558

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P1 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=29585

[Bug c++/29571] [4.2/4.3 regression] ICE with invalid static const member

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P4 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=29571

[Bug debug/29558] [4.2/4.3 Regression] ICE in set_variable_part, at var-tracking.c:2140

2007-02-19 Thread mmitchel at gcc dot gnu dot org
--- Comment #9 from mmitchel at gcc dot gnu dot org 2007-02-19 20:34 --- RTH -- You checked in a patch for this on the 4.2 branch; should this issue be closed now? Thanks, -- Mark -- mmitchel at gcc dot gnu dot org changed: What|Removed |Added

[Bug target/29524] [4.2/4.3 Regression] Too much RAM used: __clz_tab[] linked

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P5 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=29524

[Bug target/29255] [4.2/4.3 regression] ICE on valid code

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P1 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=29255

[Bug target/29206] [4.2/4.3 regression] gcj-dbtool segfaults

2007-02-19 Thread mmitchel at gcc dot gnu dot org
-- mmitchel at gcc dot gnu dot org changed: What|Removed |Added Priority|P3 |P5 http://gcc.gnu.org/bugzilla/show_bug.cgi?id=29206

[Bug c++/30863] New: Unsigned templatized struct treated as unsigned int

2007-02-19 Thread stonebone at planetunreal dot com
test.cc: #include template struct s { s() { printf("Print me, please!\n"); } }; int main(){ s x; unsigned s y; } % g++ -Wall test.cc -o test &&./test test.cc: In function 'int main()': test.cc:12: warning: unused variable 'y' Print me, please!

[Bug c++/30860] Should warn about boolean constant false used in pointer context

2007-02-19 Thread mueller at gcc dot gnu dot org
--- Comment #6 from mueller at gcc dot gnu dot org 2007-02-19 20:23 --- there is an implicit value conversion, boolean "false" to address "0". I think that is the definition of -Wconversion, no? anyway, I'll work on a patch. -- mueller at gcc dot gnu dot org changed: Wh

[Bug c++/30860] Should warn about boolean constant false used in pointer context

2007-02-19 Thread mueller at gcc dot gnu dot org
-- mueller at gcc dot gnu dot org changed: What|Removed |Added Status|UNCONFIRMED |NEW Ever Confirmed|0 |1 Last reconfi

[Bug other/30862] New: Installation error

2007-02-19 Thread rperini at email dot it
After correct bootstrapping of the compiler (C, C++ and Java), make install gives the following error, leaving the Java installation in a broken state: Making install in midi-alsa make[6]: Entering directory `/root/gccbuild/i686-pc-linux-gnu/libjava/classpath/native/jni/midi-alsa' make[7]: Enterin

[Bug c++/30860] Should warn about boolean constant false used in pointer context

2007-02-19 Thread gdr at cs dot tamu dot edu
--- Comment #5 from gdr at cs dot tamu dot edu 2007-02-19 19:59 --- Subject: Re: Should warn about boolean constant false used in pointer context "manu at gcc dot gnu dot org" <[EMAIL PROTECTED]> writes: | No, it is not. And I don't think it should be warned by -Wconversion. After | a

[Bug other/30824] -Werror -Wfatal-errors should stop after the first warning

2007-02-19 Thread patchapp at dberlin dot org
--- Comment #2 from patchapp at dberlin dot org 2007-02-19 19:55 --- Subject: Bug number PR 30824 A patch for this bug has been added to the patch tracker. The mailing list url for the patch is http://gcc.gnu.org/ml/gcc-patches/2007-02/msg01640.html -- http://gcc.gnu.org/bugzilla/s

[Bug fortran/29975] [meta-bugs] ICEs with CP2K

2007-02-19 Thread jv244 at cam dot ac dot uk
--- Comment #72 from jv244 at cam dot ac dot uk 2007-02-19 19:51 --- I checked that gfortran yields correct results for the CP2K testsuite with the options: -O0 -g -fbounds-check and -O3 -ffast-math -funroll-loops -ftree-vectorize -fomit-frame-pointer -msse2 -march=native I've added the

[Bug c++/30860] Should warn about boolean constant false used in pointer context

2007-02-19 Thread gdr at cs dot tamu dot edu
--- Comment #4 from gdr at cs dot tamu dot edu 2007-02-19 19:48 --- Subject: Re: Should warn about boolean constant false used in pointer context "pinskia at gcc dot gnu dot org" <[EMAIL PROTECTED]> writes: | I don't see why we should warn about a very valid and well defined and will

[Bug tree-optimization/30559] [4.3 Regression] compiler loops forever with flag -O3

2007-02-19 Thread dberlin at gcc dot gnu dot org
--- Comment #7 from dberlin at gcc dot gnu dot org 2007-02-19 19:34 --- Sorry, the fix was committed before the bug report was filed (IE ~5 minutes before). I forgot to mark this one closed. -- dberlin at gcc dot gnu dot org changed: What|Removed |

[Bug c++/30860] Should warn about boolean constant false used in pointer context

2007-02-19 Thread manu at gcc dot gnu dot org
--- Comment #3 from manu at gcc dot gnu dot org 2007-02-19 19:14 --- (In reply to comment #1) > manu, is this something already covered by your pending -Wconversion fixes? > No, it is not. And I don't think it should be warned by -Wconversion. After all, no value is changed during the

  1   2   >