Commit 3157b0c2 by Alexandre Oliva Committed by Alexandre Oliva

re PR debug/41225 (VTA: internal compiler error: in vect_stmt_relevant_p, at tree-vect-stmts.c:150)

gcc/ChangeLog:
PR debug/41225
* tree-vect-stmts.c (vect_stmt_relevant_p): Skip debug uses.
gcc/testsuite/ChangeLog:
PR debug/41225
* gfortran.dg/pr41225.f90: New.

From-SVN: r151438
parent 510bc854
2009-09-04 Alexandre Oliva <aoliva@redhat.com>
PR debug/41225
* tree-vect-stmts.c (vect_stmt_relevant_p): Skip debug uses.
2009-09-04 Alexandre Oliva <aoliva@redhat.com>
PR target/41252
* config/arm/vfp.md (*cmpdf_split_vfp): Fix src mode in the second
pattern of the split.
......
2009-09-04 Alexandre Oliva <aoliva@redhat.com>
PR debug/41225
* gfortran.dg/pr41225.f90: New.
2009-09-04 Alexandre Oliva <aoliva@redhat.com>
* gcc.dg/guality/guality.h: Include stdint.h. Drop unnecessary
unistd.h, sys/types.h and sys/wait.h.
(gualchk_t): New.
......
! { dg-do compile }
! { dg-options "-O2 -ffast-math -funroll-loops -ftree-vectorize -g" }
SUBROUTINE block_15_1_1_1(kbd,kbc,kad,kac,pbd,pbc,pad,pac,prim,scale)
INTEGER, PARAMETER :: dp=8
REAL(KIND=dp) :: kbd(1*1), kbc(1*1), kad(15*1), kac(15*1), pbd(1*1), &
pbc(1*1), pad(15*1), pac(15*1), prim(15*1*1*1), scale
INTEGER :: ma, mb, mc, md, p_index
DO md = 1,1
DO mc = 1,1
DO mb = 1,1
DO ma = 1,15
p_index=p_index+1
tmp = scale*prim(p_index)
ks_bd = ks_bd + tmp* pac((mc-1)*15+ma)
END DO
kbd((md-1)*1+mb) = kbd((md-1)*1+mb) - ks_bd
END DO
END DO
END DO
END SUBROUTINE block_15_1_1_1
......@@ -145,6 +145,9 @@ vect_stmt_relevant_p (gimple stmt, loop_vec_info loop_vinfo,
if (vect_print_dump_info (REPORT_DETAILS))
fprintf (vect_dump, "vec_stmt_relevant_p: used out of loop.");
if (is_gimple_debug (USE_STMT (use_p)))
continue;
/* We expect all such uses to be in the loop exit phis
(because of loop closed form) */
gcc_assert (gimple_code (USE_STMT (use_p)) == GIMPLE_PHI);
......
Markdown is supported
0% or
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment