2 ! { dg-options "-Wsurprising" }
4 ! Implementation of finalizer procedures.
5 ! Check for expected warnings on dubious FINAL constructs.
11 INTEGER, ALLOCATABLE :: fooarr(:)
14 ! Non-scalar procedures should be assumed shape
20 TYPE :: type_2 ! { dg-warning "Only array FINAL procedures" }
23 ! No scalar finalizer, only array ones
29 SUBROUTINE fin1_scalar (el)
32 END SUBROUTINE fin1_scalar
34 SUBROUTINE fin1_shape_1 (v) ! { dg-warning "assumed shape" }
37 END SUBROUTINE fin1_shape_1
39 SUBROUTINE fin1_shape_2 (v) ! { dg-warning "assumed shape" }
41 TYPE(type_1) :: v(42, 5)
42 END SUBROUTINE fin1_shape_2
44 SUBROUTINE fin2_vector (v)
47 END SUBROUTINE fin2_vector
56 ! TODO: Remove this once finalization is implemented.
57 ! { dg-excess-errors "not yet implemented" }
59 ! { dg-final { cleanup-modules "final_type" } }