[LLVM] Fix Maintainers.md formatting (NFC)
[llvm-project.git] / flang / test / Semantics / etime.f90
blob28735c2a7aacfa8adde5d1c4da48912893ed5e4d
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
6 REAL(KIND=8) :: time
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
14 call etime(values)
15 end subroutine bad_args_error
17 subroutine bad_apply_form(values)
18 REAL(KIND=4), DIMENSION(2) :: values
19 REAL(KIND=4) :: time
20 !Declaration of 'etime'
21 call etime(values, time)
22 !ERROR: Cannot call subroutine 'etime' like a function
23 time = etime(values)
24 end subroutine bad_apply_form
26 subroutine good_kind_equal(values, time)
27 REAL(KIND=4), DIMENSION(2) :: values
28 REAL(KIND=4) :: time
29 call etime(values, time)
30 end subroutine good_kind_equal