diff --git a/gcc/ChangeLog.graphite b/gcc/ChangeLog.graphite
index 9f61066ad7ad1de0180f0bf87b14d53d8df9969b..ae3369e834fa02da273e5e685971bccdd1da61cc 100644
--- a/gcc/ChangeLog.graphite
+++ b/gcc/ChangeLog.graphite
@@ -1,3 +1,9 @@
+2009-12-18  Sebastian Pop  <sebastian.pop@amd.com>
+
+	PR middle-end/42180
+	* graphite-sese-to-poly.c (split_reduction_stmt): Do not split blocks
+	that contain only one statement.
+
 2009-12-17  Sebastian Pop  <sebastian.pop@amd.com>
 
 	PR middle-end/42393
diff --git a/gcc/graphite-sese-to-poly.c b/gcc/graphite-sese-to-poly.c
index 7b61ed72a21c93f8e9c846727a43aff7623bd9dc..5999a655aeb1b34a741b0f92c3eb750087c039aa 100644
--- a/gcc/graphite-sese-to-poly.c
+++ b/gcc/graphite-sese-to-poly.c
@@ -2450,6 +2450,9 @@ split_reduction_stmt (gimple stmt)
 
   split_block (bb, stmt);
 
+  if (gsi_one_before_end_p (gsi_start_bb (bb)))
+    return bb;
+
   gsi = gsi_last_bb (bb);
   gsi_prev (&gsi);
   e = split_block (bb, gsi_stmt (gsi));
diff --git a/gcc/testsuite/gfortran.dg/graphite/pr42180.f90 b/gcc/testsuite/gfortran.dg/graphite/pr42180.f90
new file mode 100644
index 0000000000000000000000000000000000000000..6c8daeaea608735034034fbbce9d05086409573a
--- /dev/null
+++ b/gcc/testsuite/gfortran.dg/graphite/pr42180.f90
@@ -0,0 +1,20 @@
+module mcc_m
+  integer, parameter, private :: longreal = selected_real_kind(15,90)
+contains
+  subroutine mutual_ind_cir_cir_coils (m, l12)
+    real (kind = longreal), intent(out) :: l12
+    real (kind = longreal), dimension(1:9), save :: zw
+    gauss:do i = 1, 9
+       theta_l12 = 0.0_longreal
+       theta1:   do n1 = 1, 2*m
+          theta_1 = pi*real(n1,longreal)/real(m,longreal)
+          theta2:       do n2 = 1, 2*m
+             numerator = -sin(theta_1)*tvx + cos(theta_1)*tvy
+             theta_l12 = theta_l12 + numerator/denominator
+          end do theta2
+       end do theta1
+       l12 = l12 + zw(i)*theta_l12
+    end do gauss
+    l12 = coefficient * l12
+  end subroutine mutual_ind_cir_cir_coils
+end module mcc_m