nvptx, libgfortran: Switch out of "minimal" mode
[official-gcc.git] / gcc / testsuite / gfortran.dg / dependency_46.f90
blob28942a80769bd4fb95f8224c63d268d858812b31
1 ! { dg-do compile }
2 ! PR 71783 - this used to ICE due to a missing charlen for the temporary.
3 ! Test case by Toon Moene.
5 SUBROUTINE prtdata(ilen)
6 INTEGER :: ilen
7 character(len=ilen), allocatable :: cline(:)
8 allocate(cline(2))
9 cline(1) = 'a'
10 cline(2) = cline(1)
11 END SUBROUTINE prtdata