3 ! Test contributed by Valery Weber <valeryweber@hotmail.com>
7 TYPE, PUBLIC
:: base_type
10 TYPE, PUBLIC
:: dict_entry_type
11 CLASS( * ), ALLOCATABLE
:: key
12 CLASS( * ), ALLOCATABLE
:: val
13 END TYPE dict_entry_type
18 SUBROUTINE dict_put ( this
, key, val
)
19 CLASS(dict_entry_type
), INTENT(INOUT
) :: this
20 CLASS(base_type
), INTENT(IN
) :: key, val
22 ALLOCATE( this
%key, SOURCE
=key, STAT
=istat
)
23 end SUBROUTINE dict_put
28 type(dict_entry_type
) :: t
29 type(base_type
) :: a
, b
30 call dict_put(t
, a
, b
)
32 if (.NOT
. allocated(t
%key)) STOP 1
33 select
type (x
=> t
%key)