Retro68/gcc/gcc/testsuite/gfortran.dg/select_type_23.f03
Wolfgang Thaller aaf905ce07 add gcc 4.70
2012-03-28 01:13:14 +02:00

25 lines
443 B
Fortran

! { dg-do compile }
!
! PR 48699: [OOP] MOVE_ALLOC inside SELECT TYPE
!
! Contributed by Salvatore Filippone <sfilippone@uniroma2.it>
!
! Updated for PR fortran/48887
program testmv2
type bar
integer, allocatable :: ia(:), ja(:)
end type bar
class(bar), allocatable :: sm,sm2
allocate(sm2)
select type(sm2)
type is (bar)
call move_alloc(sm2,sm) ! { dg-error "must be ALLOCATABLE" }
end select
end program testmv2