re PR fortran/78741 (ICE in gfc_get_symbol_decl, at fortran/trans-decl.c:1534)
[official-gcc.git] / gcc / testsuite / gfortran.dg / namelist_93.f90
blobf4e26bc8af3e07cf2bbf7bd62ea59365e563d6a6
1 ! { dg-do compile }
2 ! PR78659 Spurious "requires DTIO" reported against namelist statement
3 MODULE ma
4 IMPLICIT NONE
5 TYPE :: ta
6 INTEGER, allocatable :: array(:)
7 END TYPE ta
8 END MODULE ma
10 PROGRAM p
11 USE ma
12 class(ta), allocatable :: x
13 NAMELIST /nml/ x
14 WRITE (*, nml)! { dg-error "is polymorphic and requires a defined input/output procedure" }
15 READ (*, nml) ! { dg-error "is polymorphic and requires a defined input/output procedure" }
16 END PROGRAM p