xref: /llvm-project/flang/test/Semantics/resolve124.f90 (revision 3af717d661e9fe8d562181b933a373ca58e41b27)
1! RUN: %python %S/test_errors.py %s %flang_fc1
2! Tests for F'2023 C1132:
3! A variable-name that appears in a REDUCE locality-spec shall be of intrinsic
4! type suitable for the intrinsic operation or function specified by its
5! reduce-operation.
6
7subroutine s1(n)
8! This is OK
9  integer :: i1, i2, i3, i4, i5, i6, i7, n
10  real(8) :: r1, r2, r3, r4
11  complex :: c1, c2
12  logical :: l1, l2, l3(n,n), l4(n)
13  do concurrent(i=1:5) &
14       & reduce(+:i1,r1,c1) reduce(*:i2,r2,c2) reduce(iand:i3) reduce(ieor:i4) &
15       & reduce(ior:i5) reduce(max:i6,r3) reduce(min:i7,r4) reduce(.and.:l1) &
16       & reduce(.or.:l2) reduce(.eqv.:l3) reduce(.neqv.:l4)
17  end do
18end subroutine s1
19
20subroutine s2()
21! Cannot apply logical operations to integer variables
22  integer :: i1, i2, i3, i4
23!ERROR: Reduction variable 'i1' ('INTEGER(4)') does not have a suitable type ('LOGICAL').
24!ERROR: Reduction variable 'i2' ('INTEGER(4)') does not have a suitable type ('LOGICAL').
25!ERROR: Reduction variable 'i3' ('INTEGER(4)') does not have a suitable type ('LOGICAL').
26!ERROR: Reduction variable 'i4' ('INTEGER(4)') does not have a suitable type ('LOGICAL').
27  do concurrent(i=1:5) &
28       & reduce(.and.:i1) reduce(.or.:i2) reduce(.eqv.:i3) reduce(.neqv.:i4)
29  end do
30end subroutine s2
31
32subroutine s3()
33! Cannot apply integer/logical operations to real variables
34  real :: r1, r2, r3, r4
35!ERROR: Reduction variable 'r1' ('REAL(4)') does not have a suitable type ('INTEGER').
36!ERROR: Reduction variable 'r2' ('REAL(4)') does not have a suitable type ('INTEGER').
37!ERROR: Reduction variable 'r3' ('REAL(4)') does not have a suitable type ('INTEGER').
38!ERROR: Reduction variable 'r4' ('REAL(4)') does not have a suitable type ('LOGICAL').
39!ERROR: Reduction variable 'r5' ('REAL(4)') does not have a suitable type ('LOGICAL').
40!ERROR: Reduction variable 'r6' ('REAL(4)') does not have a suitable type ('LOGICAL').
41!ERROR: Reduction variable 'r7' ('REAL(4)') does not have a suitable type ('LOGICAL').
42  do concurrent(i=1:5) &
43       & reduce(iand:r1) reduce(ieor:r2) reduce(ior:r3) reduce(.and.:r4) &
44       & reduce(.or.:r5) reduce(.eqv.:r6) reduce(.neqv.:r7)
45  end do
46end subroutine s3
47
48subroutine s4()
49! Cannot apply integer/logical operations to complex variables
50  complex :: c1, c2, c3, c4, c5, c6, c7, c8, c9
51!ERROR: Reduction variable 'c1' ('COMPLEX(4)') does not have a suitable type ('INTEGER').
52!ERROR: Reduction variable 'c2' ('COMPLEX(4)') does not have a suitable type ('INTEGER').
53!ERROR: Reduction variable 'c3' ('COMPLEX(4)') does not have a suitable type ('INTEGER').
54!ERROR: Reduction variable 'c4' ('COMPLEX(4)') does not have a suitable type ('INTEGER', or 'REAL').
55!ERROR: Reduction variable 'c5' ('COMPLEX(4)') does not have a suitable type ('INTEGER', or 'REAL').
56!ERROR: Reduction variable 'c6' ('COMPLEX(4)') does not have a suitable type ('LOGICAL').
57!ERROR: Reduction variable 'c7' ('COMPLEX(4)') does not have a suitable type ('LOGICAL').
58!ERROR: Reduction variable 'c8' ('COMPLEX(4)') does not have a suitable type ('LOGICAL').
59!ERROR: Reduction variable 'c9' ('COMPLEX(4)') does not have a suitable type ('LOGICAL').
60  do concurrent(i=1:5) &
61       & reduce(iand:c1) reduce(ieor:c2) reduce(ior:c3) reduce(max:c4) &
62       & reduce(min:c5) reduce(.and.:c6) reduce(.or.:c7) reduce(.eqv.:c8) &
63       & reduce(.neqv.:c9)
64  end do
65end subroutine s4
66
67subroutine s5()
68! Cannot apply integer operations to logical variables
69  logical :: l1, l2, l3, l4, l5, l6, l7
70!ERROR: Reduction variable 'l1' ('LOGICAL(4)') does not have a suitable type ('COMPLEX', 'INTEGER', or 'REAL').
71!ERROR: Reduction variable 'l2' ('LOGICAL(4)') does not have a suitable type ('COMPLEX', 'INTEGER', or 'REAL').
72!ERROR: Reduction variable 'l3' ('LOGICAL(4)') does not have a suitable type ('INTEGER').
73!ERROR: Reduction variable 'l4' ('LOGICAL(4)') does not have a suitable type ('INTEGER').
74!ERROR: Reduction variable 'l5' ('LOGICAL(4)') does not have a suitable type ('INTEGER').
75!ERROR: Reduction variable 'l6' ('LOGICAL(4)') does not have a suitable type ('INTEGER', or 'REAL').
76!ERROR: Reduction variable 'l7' ('LOGICAL(4)') does not have a suitable type ('INTEGER', or 'REAL').
77  do concurrent(i=1:5) &
78       & reduce(+:l1) reduce(*:l2) reduce(iand:l3) reduce(ieor:l4) &
79       & reduce(ior:l5) reduce(max:l6) reduce(min:l7)
80  end do
81end subroutine s5
82
83subroutine s6()
84! Cannot reduce a character
85  character ch
86!ERROR: Reduction variable 'ch' ('CHARACTER(1_8,1)') does not have a suitable type ('COMPLEX', 'INTEGER', or 'REAL').
87  do concurrent(i=1:5) reduce(+:ch)
88  end do
89end subroutine s6
90