4 ! Generic procedures as actual argument used to lead to
5 ! a NULL pointer dereference in gfc_get_proc_ifc_for_expr
6 ! because the generic symbol was used as procedure symbol,
7 ! instead of the specific one.
9 module iso_varying_string
10 type, public
:: varying_string
11 character(LEN
=1), dimension(:), allocatable
:: chars
12 end type varying_string
13 interface operator(/=)
14 module procedure op_ne_VS_CH
15 end interface operator (/=)
17 module procedure trim_
20 elemental
function op_ne_VS_CH (string_a
, string_b
) result (op_ne
)
21 type(varying_string
), intent(in
) :: string_a
22 character(LEN
=*), intent(in
) :: string_b
25 end function op_ne_VS_CH
26 elemental
function trim_ (string
) result (trim_string
)
27 type(varying_string
), intent(in
) :: string
28 type(varying_string
) :: trim_string
29 trim_string
= varying_string(["t", "r", "i", "m", "m", "e", "d"])
31 end module iso_varying_string
33 use iso_varying_string
, string_t
=> varying_string
35 subroutine set_rule_type_and_key
37 if (trim (key) /= "") then
40 end subroutine set_rule_type_and_key
41 end module syntax_rules