3 ! Tests the fix for PR67933, which was a side effect of the fix for PR67171.
5 ! Contributed by Andrew <mandrew9@vt.edu>
14 type, extends(class_t) :: class_e
19 class(class_t), allocatable :: class_var
20 ! type(class_t), allocatable :: class_var
21 ! integer, allocatable :: class_id
25 type(wrapper_t) :: classes(20)
33 subroutine Method(this)
38 allocate (this%classes(i)%class_var, source = class_t (i))
40 allocate (this%classes(i)%class_var, source = class_e (i, real (2 * i)))
44 subroutine Dealloc(this)
48 if (allocated (this%classes(i)%class_var)) &
49 deallocate (this%classes(i)%class_var)
51 end subroutine Dealloc
52 subroutine Typeme(this)
58 j(i) = this%classes(i)%class_var%i
59 select type (p => this%classes(i)%class_var)
67 if (any (j .ne. [(i, i = 1,20)])) STOP 1
68 ! print "(10f6.2,/)", r
69 if (any (r(1:10) .ne. [(real (2 * i), i = 1,10)])) STOP 2
70 if (any (r(11:20) .ne. zero)) STOP 3