RISC-V: Regenerate opt urls.
[official-gcc.git] / gcc / testsuite / gfortran.dg / generic_35.f90
blob24ac270319fe11b1f6275973c401db5eb6894c12
1 ! { dg-do compile }
3 ! PR 86545: ICE in transfer_expr on invalid WRITE statement
5 ! Contributed by Janus Weil <janus@gcc.gnu.org>
7 module m
9 type tString
10 character(len=:), allocatable :: cs
11 end type
13 interface my_trim
14 module procedure trim_string
15 end interface
17 contains
19 elemental function trim_string(self) result(str)
20 type(tString) :: str
21 class(tString), intent(in) :: self
22 end function
24 end module
27 program p
28 use m
29 type(tString) :: s
30 write(*,*) my_trim(s) ! { dg-error "cannot have ALLOCATABLE components" }
31 end