Commit 7b22b4c6 by Eric Botcazou Committed by Eric Botcazou

re PR debug/71642 (ICE: in gen_type_die_with_usage, at dwarf2out.c:22729)

	PR debug/71642
	* tree-inline.c (remap_decl): When fixing up DECL_ORIGINAL_TYPE, just
	copy the type name.

From-SVN: r237771
parent 37e373c2
2016-06-24 Eric Botcazou <ebotcazou@adacore.com>
PR debug/71642
* tree-inline.c (remap_decl): When fixing up DECL_ORIGINAL_TYPE, just
copy the type name.
2016-06-24 Jakub Jelinek <jakub@redhat.com>
PR tree-optimization/71647
......
2016-06-24 Eric Botcazou <ebotcazou@adacore.com>
* gfortran.dg/pr71642.f90: New test.
2016-06-24 Jakub Jelinek <jakub@redhat.com>
PR tree-optimization/71647
......
! PR debug/71642
! { dg-do compile }
! { dg-options "-g" }
MODULE gauss_colloc
INTEGER, PARAMETER :: dp=8
CONTAINS
SUBROUTINE collocGauss(h,h_inv,grid,poly,alphai,posi,max_r2,&
periodic,gdim,local_bounds,local_shift,poly_shift,scale,lgrid,error)
REAL(dp), DIMENSION(0:, 0:, 0:), &
INTENT(inout) :: grid
INTEGER, INTENT(inout), OPTIONAL :: lgrid
CONTAINS
SUBROUTINE kloop6
IF (kJump/=1 .AND. (ikstart+kmax-kstart>=ndim(2)+l_shift(2) .OR.&
ikstart2+kmin-kstart2<=l_ub(2)-ndim(2))) THEN
DO
DO k=kstart2,kend2,-1
IF ( PRESENT ( lgrid ) ) THEN
grid(ik,ij,ii) = grid(ik,ij,ii) + p_v*res_k
END IF
END DO
END DO
END IF
END SUBROUTINE
END SUBROUTINE
END MODULE gauss_colloc
......@@ -377,7 +377,7 @@ remap_decl (tree decl, copy_body_data *id)
{
tree x = build_variant_type_copy (TREE_TYPE (t));
TYPE_STUB_DECL (x) = TYPE_STUB_DECL (TREE_TYPE (t));
TYPE_NAME (x) = t;
TYPE_NAME (x) = TYPE_NAME (TREE_TYPE (t));
DECL_ORIGINAL_TYPE (t) = x;
}
}
......
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