aboutsummaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/dependency_46.f90
blob: 28942a80769bd4fb95f8224c63d268d858812b31 (plain)
1
2
3
4
5
6
7
8
9
10
11
! { dg-do compile }
! PR 71783 - this used to ICE due to a missing charlen for the temporary.
! Test case by Toon Moene.

SUBROUTINE prtdata(ilen)
  INTEGER :: ilen
  character(len=ilen), allocatable :: cline(:)
  allocate(cline(2))
  cline(1) = 'a'
  cline(2) = cline(1)
END SUBROUTINE prtdata