1 ! RUN: %python %S/test_errors.py %s %flang_fc1 -pedantic
2 ! Tests for the ETIME intrinsics
4 subroutine bad_kind_error(values
, time
)
5 REAL(KIND
=8), DIMENSION(2) :: values
7 !ERROR: Actual argument for 'values=' has bad type or kind 'REAL(8)'
8 call etime(values
, time
)
9 end subroutine bad_kind_error
11 subroutine bad_args_error(values
)
12 REAL(KIND
=4), DIMENSION(2) :: values
13 !ERROR: missing mandatory 'time=' argument
15 end subroutine bad_args_error
17 subroutine bad_apply_form(values
)
18 REAL(KIND
=4), DIMENSION(2) :: values
20 !Declaration of 'etime'
21 call etime(values
, time
)
22 !ERROR: Cannot call subroutine 'etime' like a function
24 end subroutine bad_apply_form
26 subroutine good_kind_equal(values
, time
)
27 REAL(KIND
=4), DIMENSION(2) :: values
29 call etime(values
, time
)
30 end subroutine good_kind_equal