[Bug tree-optimization/37242] missed FRE opportunity because of signedness of addition

2008-08-27 Thread bonzini at gnu dot org


--- Comment #13 from bonzini at gnu dot org  2008-08-28 06:16 ---
Answering to your comment #11, one is a sizetype and one is not.  But it is
enough to extend my fold-const.c patch to MULT_EXPRs in order to catch it.

Also, the problem with the full testcase is that PRE is not cascading "enough".
 Adding another PRE pass right after the first catches it.


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37242



[Bug middle-end/37243] [4.4 Regression] Revision 139590 caused many regressions

2008-08-27 Thread Joey dot ye at intel dot com


--- Comment #11 from Joey dot ye at intel dot com  2008-08-28 06:14 ---
(In reply to comment #4)
> We got
>   Running 416.gamess ref base lnx32-gcc default
> 416.gamess: copy #0 non-zero return code (rc=0, signal=11)
> 416.gamess: copy #0 non-zero return code (rc=0, signal=11)
> 416.gamess: copy #0 non-zero return code (rc=0, signal=11)
> We will try to find a small testcase.
Small case available:
$ cat case.f
  SUBROUTINE SCHMD(V,M,N,LDV)
  IMPLICIT DOUBLE PRECISION(A-H,O-Z)
  LOGICAL GOPARR,DSKWRK,MASWRK
  DIMENSION V(LDV,N)
  COMMON /IOFILE/ IR,IW,IP,IS,IPK,IDAF,NAV,IODA(400)
  COMMON /PAR   / ME,MASTER,NPROC,IBTYP,IPTIM,GOPARR,DSKWRK,MASWRK
  PARAMETER (ZERO=0.0D+00, ONE=1.0D+00, TOL=1.0D-10)
  IF (M .EQ. 0) GO TO 180
  DO 160 I = 1,M
  DUMI = ZERO
  DO 100 K = 1,N
  100 DUMI = DUMI+V(K,I)*V(K,I)
  DUMI = ONE/ SQRT(DUMI)
  DO 120 K = 1,N
  120 V(K,I) = V(K,I)*DUMI
  IF (I .EQ. M) GO TO 160
  I1 = I+1
  DO 140 J = I1,M
  DUM = -DDOT(N,V(1,J),1,V(1,I),1)
  CALL DAXPY(N,DUM,V(1,I),1,V(1,J),1)
  140 CONTINUE
  160 CONTINUE
  IF (M .EQ. N) RETURN
  180 CONTINUE
  I = M
  J = 0
  200 I0 = I
  I = I+1
  IF (I .GT. N) RETURN
  220 J = J+1
  IF (J .GT. N) GO TO 320
  DO 240 K = 1,N
  240 V(K,I) = ZERO
  CALL DAXPY(N,DUM,V(1,II),1,V(1,I),1)
  260 CONTINUE
  DUMI = ZERO
  DO 280 K = 1,N
  280 DUMI = DUMI+V(K,I)*V(K,I)
  IF ( ABS(DUMI) .LT. TOL) GO TO 220
  DO 300 K = 1,N
  300 V(K,I) = V(K,I)*DUMI
  GO TO 200
  320 END
  program main
  DOUBLE PRECISION V
  DIMENSION V(18, 18)
  common // v

  call schmd(V, 1, 18, 18)
  end

  subroutine DAXPY
  end

  FUNCTION DDOT ()
  DOUBLE PRECISION DDOT
  DDOT = 1
  end

$ gfortran -v
Using built-in specs.
Target: x86_64-unknown-linux-gnu
Configured with: ../src/configure --disable-bootstrap
--enable-languages=c,c++,fortran --enable-checking=assert
Thread model: posix
gcc version 4.4.0 20080826 (experimental) [trunk revision 139590] (GCC) 
$ gfortran -O2 -o case.exe case.f -m32
$ ./case.exe
Segmentation fault

$ gfortran -v
Using built-in specs.
Target: x86_64-unknown-linux-gnu
Configured with: ../src/configure --disable-bootstrap
--enable-languages=c,c++,fortran --enable-checking=assert
Thread model: posix
gcc version 4.4.0 20080826 (experimental) [trunk revision 139589] (GCC) 
$ gfortran -O2 -o case.exe case.f -m32
$ ./case.exe
$


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37243



[Bug tree-optimization/37242] missed FRE opportunity because of signedness of addition

2008-08-27 Thread bonzini at gnu dot org


--- Comment #12 from bonzini at gnu dot org  2008-08-28 06:09 ---
I have a patch for the minimal testcase, but not for the full PRE testcase.


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37242



[Bug target/27619] wrong code for mixed-mode division with -mpowerpc64 -O1

2008-08-27 Thread bergner at gcc dot gnu dot org


--- Comment #13 from bergner at gcc dot gnu dot org  2008-08-28 03:52 
---
There are actually a subset of TARGET_POWERP64 instructions that are safe to
use in 32-bit mode regardless of whether OS_MISSING_POWERPC64 is set or not
(eg, fcfid).  For example, given the code below:

double
di2df (long long *di)
{
  return *di;
}

It should be safe to generate:

  lfd 0,0(3)
  fcfid 1,0
  blr

when compiling with -m32 as long as we are targeting a 64-bit processor (eg,
-mcpu=power6).  However, the floatdidf2 pattern is guarded with
TARGET_POWERPC64, so we end up generating a call to __floatdidf instead.


-- 

bergner at gcc dot gnu dot org changed:

   What|Removed |Added

 CC||bergner at gcc dot gnu dot
   ||org


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=27619



[Bug c++/37217] [4.4 Regression] -Wconversion causes ICE with __builtin_strcmp with one char compare

2008-08-27 Thread mckelvey at maskull dot com


--- Comment #17 from mckelvey at maskull dot com  2008-08-28 02:41 ---
(In reply to comment #12)
> Patch: http://gcc.gnu.org/ml/gcc-patches/2008-08/msg01913.html
> 
> Please test that it fixes the ICE in i686-pc-cygwin. Thanks.
> 

Yes! Thanks!


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37217



[Bug rtl-optimization/37263] [4.3/4.4 Regression] extra code for doloop with unsigned 32bit types on LP64

2008-08-27 Thread pinskia at gcc dot gnu dot org


-- 

pinskia at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|--- |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37263



[Bug rtl-optimization/37263] New: [4.3/4.4 Regression] extra code for doloop with unsigned 32bit types on LP64

2008-08-27 Thread pinskia at gcc dot gnu dot org
Take (again):
unsigned ReverseBits (unsigned index, unsigned NumBits)
{
  unsigned i, rev;

  for (i = rev = 0; i < NumBits; i++)
  {
rev = (rev << 1) | (index & 1);
index >>= 1;
  }
  return rev;
}

--- CUT ---
Currently we get:
.L.ReverseBits:
cmpdi 0,4,0
mr 0,3
li 3,0
beqlr 0
addi 9,4,-1
cmpwi 7,4,0
rldicl 9,9,0,32
addi 9,9,1
mtctr 9
beq- 7,.L8
beq- 7,.L8

But since we know that any time cmpdi r4, 0/beq is true, then cmpwi r4, 0/beq
is also.  I think one of the issue is that doloop is also not generating
subregs with /s/u  on them, even though the original subregs have them.


-- 
   Summary: [4.3/4.4 Regression] extra code for doloop with unsigned
32bit types on LP64
   Product: gcc
   Version: 4.4.0
Status: UNCONFIRMED
  Keywords: missed-optimization
  Severity: normal
  Priority: P3
 Component: rtl-optimization
AssignedTo: unassigned at gcc dot gnu dot org
ReportedBy: pinskia at gcc dot gnu dot org
GCC target triplet: powerpc64-linux-gnu


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37263



[Bug rtl-optimization/37262] New: Two branches of the same condition being emitted

2008-08-27 Thread pinskia at gcc dot gnu dot org
Take:
unsigned ReverseBits (unsigned index, unsigned NumBits)
{
  unsigned i, rev;

  for (i = rev = 0; i < NumBits; i++)
  {
rev = (rev << 1) | (index & 1);
index >>= 1;
  }
  return rev;
}
 CUT ---
Currently we get:
mtctr 9
beq- 7,.L8
beq- 7,.L8
.p2align 3,,7

Which is obviously broken as we should have only one beq as they use the same
CR and go to the same block and there is no way to get to the second one
without going through the first.

4.1.1 -fno-ivopts produces even worse code:
cmplwi 7,4,1
blt- 7,.L8
cmpwi 7,4,0
beq- 7,.L8

But we know that this a logicial compare so r4 < 1 is the same as r4 ==0 so 4.3
produces better code but still needs slight improvement with respect of getting
rid of the extra branch (though we have regression between 4.1 and 4.3 which I
will file seperately as it is unrelated to this bug).


-- 
   Summary: Two branches of the same condition being emitted
   Product: gcc
   Version: 4.4.0
Status: UNCONFIRMED
  Keywords: missed-optimization
  Severity: normal
  Priority: P3
 Component: rtl-optimization
AssignedTo: unassigned at gcc dot gnu dot org
ReportedBy: pinskia at gcc dot gnu dot org
GCC target triplet: powerpc64-linux-gnu


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37262



[Bug c/18050] -Wsequence-point reports false positives

2008-08-27 Thread manu at gcc dot gnu dot org


--- Comment #13 from manu at gcc dot gnu dot org  2008-08-28 01:30 ---
(In reply to comment #12)
> 
> I think we are still warning in too many places but I can't remember now, it
> was almost 4 years ago and many stuff has changed.

Do you mind if I test it and try to make it work? For the tests in this PR it
seems to work correctly. If you can think of other tests, please post them
here.


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=18050



[Bug c/18050] -Wsequence-point reports false positives

2008-08-27 Thread pinskia at gcc dot gnu dot org


--- Comment #12 from pinskia at gcc dot gnu dot org  2008-08-28 01:22 
---
(In reply to comment #11)
> Andrew, your patch seems to work, so what is the problem?

I think we are still warning in too many places but I can't remember now, it
was almost 4 years ago and many stuff has changed.


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=18050



[Bug c/18050] -Wsequence-point reports false positives

2008-08-27 Thread manu at gcc dot gnu dot org


--- Comment #11 from manu at gcc dot gnu dot org  2008-08-28 01:18 ---
Andrew, your patch seems to work, so what is the problem?


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=18050



[Bug c++/37260] infinite loop in init

2008-08-27 Thread paolo dot carlini at oracle dot com


--- Comment #2 from paolo dot carlini at oracle dot com  2008-08-28 00:18 
---
Indeed, checking init for error_mark_node appear to fix the problem. I'll take
this...


-- 

paolo dot carlini at oracle dot com changed:

   What|Removed |Added

 AssignedTo|unassigned at gcc dot gnu   |paolo dot carlini at oracle
   |dot org |dot com
 Status|UNCONFIRMED |ASSIGNED
 Ever Confirmed|0   |1
   Last reconfirmed|-00-00 00:00:00 |2008-08-28 00:18:56
   date||


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37260



[Bug c++/37217] [4.4 Regression] -Wconversion causes ICE with __builtin_strcmp with one char compare

2008-08-27 Thread manu at gcc dot gnu dot org


--- Comment #16 from manu at gcc dot gnu dot org  2008-08-28 00:12 ---
Fixed in GCC 4.4.


-- 

manu at gcc dot gnu dot org changed:

   What|Removed |Added

 Status|NEW |RESOLVED
 Resolution||FIXED


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37217



[Bug c++/37217] [4.4 Regression] -Wconversion causes ICE with __builtin_strcmp with one char compare

2008-08-27 Thread manu at gcc dot gnu dot org


--- Comment #15 from manu at gcc dot gnu dot org  2008-08-28 00:09 ---
Subject: Bug 37217

Author: manu
Revision: 139682
Modified property: svn:log

Modified: svn:log at Thu Aug 28 00:09:20 2008
--
--- svn:log (original)
+++ svn:log Thu Aug 28 00:09:20 2008
@@ -1,6 +1,6 @@
 2008-08-27  Manuel Lopez-Ibanez  <[EMAIL PROTECTED]>

PR 37217
-   * c-common.c (convesion_warning): Check for null operands.
+   * c-common.c (conversion_warning): Check for null operands.
 testsuite/
* gcc.dg/pr37217.c: New.


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37217



[Bug c++/37217] [4.4 Regression] -Wconversion causes ICE with __builtin_strcmp with one char compare

2008-08-27 Thread manu at gcc dot gnu dot org


--- Comment #14 from manu at gcc dot gnu dot org  2008-08-28 00:02 ---
Subject: Bug 37217

Author: manu
Date: Thu Aug 28 00:00:49 2008
New Revision: 139682

URL: http://gcc.gnu.org/viewcvs?root=gcc&view=rev&rev=139682
Log:
2008-08-27  Manuel Lopez-Ibanez  <[EMAIL PROTECTED]>

PR 37217
* c-common.c (convesion_warning): Check for null operands.
testsuite/
* gcc.dg/pr37217.c: New.

Added:
trunk/gcc/testsuite/gcc.dg/pr37217.c
Modified:
trunk/gcc/ChangeLog
trunk/gcc/c-common.c
trunk/gcc/testsuite/ChangeLog


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37217



[Bug c/31673] "`for' loop initial declaration used outside C99 mode" is confusing

2008-08-27 Thread manu at gcc dot gnu dot org


--- Comment #8 from manu at gcc dot gnu dot org  2008-08-27 23:56 ---
Fixed for GCC 4.4


-- 

manu at gcc dot gnu dot org changed:

   What|Removed |Added

 Status|UNCONFIRMED |RESOLVED
 Resolution||FIXED
   Target Milestone|--- |4.4.0


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=31673



[Bug c/31673] "`for' loop initial declaration used outside C99 mode" is confusing

2008-08-27 Thread manu at gcc dot gnu dot org


--- Comment #7 from manu at gcc dot gnu dot org  2008-08-27 23:55 ---
Subject: Bug 31673

Author: manu
Date: Wed Aug 27 23:54:36 2008
New Revision: 139681

URL: http://gcc.gnu.org/viewcvs?root=gcc&view=rev&rev=139681
Log:
2008-08-27  Manuel Lopez-Ibanez  <[EMAIL PROTECTED]>

PR c/31673
* c-decl.c (check_for_loop_decls): Improve error message. Give
hint.
testsuite/
* gcc.dg/c90-fordecl-1.c: Update.

Modified:
trunk/gcc/ChangeLog
trunk/gcc/c-decl.c
trunk/gcc/testsuite/ChangeLog
trunk/gcc/testsuite/gcc.dg/c90-fordecl-1.c


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=31673



[Bug c/37186] -Wno-error=pointer-sign does not work

2008-08-27 Thread manu at gcc dot gnu dot org


--- Comment #3 from manu at gcc dot gnu dot org  2008-08-27 23:55 ---
Fixed for GCC 4.4.


-- 

manu at gcc dot gnu dot org changed:

   What|Removed |Added

 Status|NEW |RESOLVED
 Resolution||FIXED
   Target Milestone|--- |4.4.0


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37186



[Bug c/37186] -Wno-error=pointer-sign does not work

2008-08-27 Thread manu at gcc dot gnu dot org


--- Comment #2 from manu at gcc dot gnu dot org  2008-08-27 23:52 ---
Subject: Bug 37186

Author: manu
Date: Wed Aug 27 23:51:13 2008
New Revision: 139680

URL: http://gcc.gnu.org/viewcvs?root=gcc&view=rev&rev=139680
Log:
2008-08-27  Manuel Lopez-Ibanez  <[EMAIL PROTECTED]>

PR c/37186
* c-typeck.c (WARN_FOR_ASSIGNMENT): Add OPT parameter.
(convert_for_assignment): Pass corrent OPT_W* parameter to
WARN_FOR_ASSIGNMENT.
testsuite/
* gcc.dg/pr37186.c: New.

Added:
trunk/gcc/testsuite/gcc.dg/pr37186.c
Modified:
trunk/gcc/ChangeLog
trunk/gcc/c-typeck.c
trunk/gcc/testsuite/ChangeLog


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37186



[Bug c/37261] New: Spurious (?) "integer overflow in expression" warnings

2008-08-27 Thread roland at digitalvampire dot org
With:

$ gcc --version
gcc (Debian 4.3.1-2) 4.3.1

running on x86-64, the code below produces seemingly spurious warnings about
integer overflow:

$ LANG=C gcc -c b.c
b.c: In function 'foo':
b.c:3: warning: integer overflow in expression
b.c:5: warning: integer overflow in expression

$ cat b.c
unsigned foo(int x)
{
return ((x & 1) | 2) & 0x8000;
return ((x & 2) | 2) & 0x8000;
return ((x & 4) | 2) & 0x8000;
}


-- 
   Summary: Spurious (?) "integer overflow in expression" warnings
   Product: gcc
   Version: 4.3.1
Status: UNCONFIRMED
  Severity: minor
  Priority: P3
 Component: c
AssignedTo: unassigned at gcc dot gnu dot org
ReportedBy: roland at digitalvampire dot org
 GCC build triplet: x86_64-linux-gnu
  GCC host triplet: x86_64-linux-gnu
GCC target triplet: x86_64-linux-gnu


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37261



[Bug debug/33044] Local static variable in C++ constructor not visible for debugging

2008-08-27 Thread le dot ben dot smith at gmail dot com


--- Comment #11 from le dot ben dot smith at gmail dot com  2008-08-27 
23:26 ---
I just noticed this problem with gcc 4.3.0.  I'm not familiar with compiler
internals, so I don't understand all the details of the previous comments.  It
sounds like this is a gdb bug then...  Is that correct?


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=33044



[Bug c++/37260] infinite loop in init

2008-08-27 Thread mrs at apple dot com


--- Comment #1 from mrs at apple dot com  2008-08-27 22:47 ---
I think reshape_init_r doesn't handle init when it ia error_mark_node.


-- 


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37260



[Bug c++/37260] New: infinite loop in init

2008-08-27 Thread mrs at apple dot com
gcc version 4.4.0 20080827 (experimental) [trunk revision 138965] (GCC) 

produces:

/tmp/t.cc:9: error: initializer for ‘pthread_once_t’ must be brace-enclosed
/tmp/t.cc:9: error: initializer for ‘pthread_once_t’ must be brace-enclosed
/tmp/t.cc:9: error: initializer for ‘pthread_once_t’ must be brace-enclosed
/tmp/t.cc:9: error: initializer for ‘pthread_once_t’ must be brace-enclosed
/tmp/t.cc:9: error: initializer for ‘pthread_once_t’ must be brace-enclosed
/tmp/t.cc:9: error: initializer for ‘pthread_once_t’ must be brace-enclosed
/tmp/t.cc:9: error: initializer for ‘pthread_once_t’ must be brace-enclosed
[...]

for

struct pthread_once_t { };
struct test {
  pthread_once_t once;
};

int main(void) {
  struct test foo = {
once: PTHREAD_ONCE_INITIALIZER
  };

  return 0;
}

:-(


-- 
   Summary: infinite loop in init
   Product: gcc
   Version: 4.4.0
Status: UNCONFIRMED
  Severity: normal
  Priority: P3
 Component: c++
AssignedTo: unassigned at gcc dot gnu dot org
ReportedBy: mrs at apple dot com


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37260



[Bug web/36850] missing onlinedocs for 4.3.1

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #2 from jsm28 at gcc dot gnu dot org  2008-08-27 22:27 ---
I have generated docs for both 4.3.1 and 4.3.2 and updated the links to point
to 4.3.2.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

 Status|NEW |RESOLVED
 Resolution||FIXED


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36850



[Bug middle-end/37248] [4.3/4.4 Regression] regression 4.3.1 -> 4.3.2-rc transformation bitfield to individual bytes

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #2 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37248



[Bug middle-end/37236] [4.3/4.4 Regression] ICE: in mark_operand_necessary, at tree-ssa-dce.c:242

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #9 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37236



[Bug target/37168] [4.3/4.4 Regression] ICE: in final_scan_insn, at final.c:2615 (altivec)

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #5 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37168



[Bug tree-optimization/37102] [4.3/4.4 Regression] possible integer codegen bug

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #5 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37102



[Bug middle-end/37135] [4.3/4.4 Regression] code size increase for bit-fields assignment

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37135



[Bug c++/37093] [4.2/4.3/4.4 Regression] ICE with pointer to member template parameters

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37093



[Bug target/37101] [4.2 Regression] wrong code: tree vectorizer omits bogus movq/movlps construct

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #12 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37101



[Bug middle-end/37060] [4.3/4.4 regression] Bogus __builtin___memcpy_chk overflow warning

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #3 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=37060



[Bug rtl-optimization/36998] [4.3/4.4 regression] Ada bootstrap broken on i586-*-*

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #28 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36998



[Bug c++/36921] [4.3/4.4 Regression] comparison does not have mathematical meaning is not correct

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36921



[Bug target/36827] [4.3/4.4 Regression] newlib:libm/math/k_rem_pio2.c fails in reload

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #18 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36827



[Bug middle-end/36817] [4.3 Regression] internal compiler error: in compare_values_warnv

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #13 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36817



[Bug middle-end/36758] [4.3/4.4 Regression] address addition moved out of the loop

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #3 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36758



[Bug c++/36741] [4.3/4.4 regression] Bogus "large integer implicitly truncated" passing size_t constant to new

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #14 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36741



[Bug fortran/36700] [4.3/4.4 Regression] ICE on calling a function

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #3 from jsm28 at gcc dot gnu dot org  2008-08-27 22:05 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36700



[Bug debug/36690] [4.3/4.4 Regression] .debug_line first line is behind the first instruction

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #5 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36690



[Bug c++/36654] Inlined con/de-structor breaks virtual inheritance dllimport classes

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36654



[Bug tree-optimization/36646] [4.3/4.4 Regression] Unnecessary moves generated on loop boundaries

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36646



[Bug tree-optimization/36631] [4.3/4.4 Regression] attribute always_inline -> sorry, unimplemented: recursive inlining

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36631



[Bug tree-optimization/36630] [4.3/4.4 Regression] ICE in vect_update_ivs_after_vectorizer

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36630



[Bug middle-end/36583] [4.3/4.4 Regression] ICE on 5282/5206 at -O2

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36583



[Bug ada/36575] [4.3/4.4 Regression][Ada] ACATS c460011 runtime fails at -O3

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36575



[Bug middle-end/36548] [4.3 Regression] remainder gives the wrong result for wrapping case with unsigned types

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #8 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36548



[Bug c++/36478] [4.3/4.4 regression] warning not emitted when code expanded from macro

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36478



[Bug testsuite/36443] [4.3/4.4 Regression]: HOSTCC doesn't work with installed gcc

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #29 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36443



[Bug tree-optimization/36439] [4.3/4.4 Regression] infinite loop in PRE building gimp-plugin-registry

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #5 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36439



[Bug c++/36408] [4.3/4.4 regression] ICE with statement expression in template

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #12 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36408



[Bug rtl-optimization/36365] [4.3/4.4 Regression] Hang in df_analyze

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #8 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36365



[Bug rtl-optimization/36350] [4.3/4.4 Regression] GCC ICE with -frename-registers

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #3 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36350



[Bug testsuite/36344] [4.3 Regression] gcc.dg/tree-ssa/loadpre8.c XFAILed

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36344



[Bug tree-optimization/36343] [4.3 Regression] Wrong code due to bad TBAA pruning of points-to-sets and use in call clobbering

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #5 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36343



[Bug middle-end/36227] [4.3/4.4 Regression] POINTER_PLUS folding introduces undefined overflow

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #7 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36227



[Bug tree-optimization/36218] [4.2/4.3/4.4 regression] VRP causes stack overflow while building libgcj

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #17 from jsm28 at gcc dot gnu dot org  2008-08-27 22:04 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=36218



[Bug target/35860] [4.3/4.4 Regression] [avr] code bloat caused by -fsplit-wide-types

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #9 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35860



[Bug middle-end/35854] [4.3/4.4 Regression] life passes dump option still documented

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #2 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35854



[Bug c++/35813] [4.3 regression] ICE with partial specialization of variadic templates

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #3 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35813



[Bug fortran/35680] [4.3/4.4 regression] ICE on invalid transfer in variable declaration

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35680



[Bug target/35658] between -funroll-loops -fno-automatic -O2 and common block variable

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #12 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35658



[Bug bootstrap/35619] [4.3/4.4 Regression] fixed includes not being found if building in src dir

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #22 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35619



[Bug tree-optimization/35639] [4.3/4.4 Regression] -fprofile-generate + PRE = big compile-time

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35639



[Bug tree-optimization/35618] [4.3 regression] ICE in cgraph_estimate_size_after_inlining, at ipa-inline.c:188

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #10 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35618



[Bug c/35448] [4.3/4.4 regression] ICE with fixed-point constants

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #2 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35448



[Bug tree-optimization/35428] [4.3 regression] ICE with "-ftrapv"

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #16 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35428



[Bug c++/35331] [4.3 regression] ICE with invalid specialization of variadic template

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35331



[Bug c++/35327] [4.3 regression] ICE with invalid constructor

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35327



[Bug target/35318] [4.3/4.4 regression] ICE with inline asm in reload

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35318



[Bug c++/35243] [4.3 regression] ICE with invalid initializer list in variadic template

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35243



[Bug c++/35319] [4.3/4.4 regression] ICE throwing fixed-point types

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35319



[Bug c++/35242] [4.3 regression] ICE with invalid specialization of variadic template

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35242



[Bug c++/35241] [4.3/4.4 regression] ICE with sizeof in variadic template

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #3 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35241



[Bug rtl-optimization/35232] [4.3 Regression] ICE in fp-int-convert-double.c at -O2

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #7 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35232



[Bug middle-end/35193] [4.3/4.4 Regression] can't find a register in class 'R1_REGS' while reloading 'asm'

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #9 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35193



[Bug c++/35025] [4.3 regression] ICE with invalid specialization of variadic template

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35025



[Bug target/35090] [4.3/4.4 regression] libjava testsuite failures on hppa-linux

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35090



[Bug c++/35022] [4.3/4.4 regression] ICE with parameter pack in template constant parameter

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35022



[Bug tree-optimization/35011] [4.3/4.4 regression] ICE with -fcheck-data-deps

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #5 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=35011



[Bug c++/34892] [4.3/4.4 regression] ICE with ellipsis in default template argument

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=34892



[Bug c++/34756] [4.3/4.4 regression] ICE with broken specialization of variadic template

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=34756



[Bug target/34571] [4.3/4.4 Regression] Segfault in alpha_expand_mov at -O3

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #13 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=34571



[Bug c++/34274] [4.3/4.4 regression] Broken diagnostic: 'template_template_parm' not supported by dump_decl

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #4 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=34274



[Bug middle-end/34226] [4.3/4.4 Regression][frv] ICE in default_secondary_reload, at targhooks.c:612

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #15 from jsm28 at gcc dot gnu dot org  2008-08-27 22:03 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=34226



[Bug tree-optimization/33928] [4.3/4.4 Regression] 22% performance slowdown from 4.2.2 to 4.3/4.4.0 in floating-point code

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #35 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=33928



[Bug target/33604] [4.3/4.4 Regression] Revision 119502 causes significantly slower results with 4.3/4.4 compared to 4.2

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #42 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=33604



[Bug bootstrap/33781] [4.3/4.4 Regression] "Arg list too long" building libgcc.a

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #23 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=33781



[Bug libgcj/33263] [4.3/4.4 regression] libjava testsuite failures on alpha-linux

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=33263



[Bug tree-optimization/33237] [4.3/4.4 Regression] Tree memory partitioning is spending 430 seconds of a 490 second compile.

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #14 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=33237



[Bug bootstrap/33100] [4.3/4.4 regression] on bootstrap getting section .eh_frame: bad cie version 0: offset 0x0

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #20 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=33100



[Bug libgcj/32967] [4.3/4.4 regression] gcjavac throws java exceptions on startup

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #6 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=32967



[Bug middle-end/32964] [4.3/4.4 Regression] union cause inefficient code inside loops

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #9 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=32964



[Bug tree-optimization/32921] [4.3/4.4 Regression] Revision 126326 causes 12% slowdown

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #55 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=32921



gcc-bugs@gcc.gnu.org

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #8 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=32643



[Bug target/32431] [4.3/4.4 Regression][m68hc11] ICE in df_refs_verify, at df-scan.c:4066

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #8 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=32431



[Bug target/32424] [4.3/4.4 Regression] gcc.c-torture/compile/20050303-1.c FAILs

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #9 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=32424



[Bug middle-end/32044] [4.3/4.4 regression] udivdi3 counterproductive, unwarranted use

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #45 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=32044



[Bug target/31897] [4.3 Regression] 30% speed regression with -m32 on Opteron with rnflow

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #15 from jsm28 at gcc dot gnu dot org  2008-08-27 22:01 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=31897



[Bug libmudflap/32276] [4.3/4.4 Regression]: libmudflap.c++/pass41-frag.cxx

2008-08-27 Thread jsm28 at gcc dot gnu dot org


--- Comment #9 from jsm28 at gcc dot gnu dot org  2008-08-27 22:02 ---
4.3.2 is released, changing milestones to 4.3.3.


-- 

jsm28 at gcc dot gnu dot org changed:

   What|Removed |Added

   Target Milestone|4.3.2   |4.3.3


http://gcc.gnu.org/bugzilla/show_bug.cgi?id=32276



  1   2   >