2014-07-12 Paul Thomas <pault@gcc.gnu.org>
[official-gcc.git] / gcc / testsuite / gfortran.dg / coarray / image_index_3.f90
blob9bfa02db3e635701c23e8de2015c2658f60427ea
1 ! { dg-do run }
2 ! { dg-options "-fdefault-integer-8" }
4 ! As image_index_1.f90 but with -fdefault-integer-8
5 ! PR fortran/51682
7 ! Run-time test for IMAGE_INDEX with cobounds only known at
8 ! the compile time, suitable for any number of NUM_IMAGES()
9 ! For compile-time cobounds, the -fcoarray=lib version still
10 ! needs to run-time evalulation if image_index returns > 1
11 ! as image_index is 0 if the index would exceed num_images().
13 ! Please set num_images() to >= 13, if possible.
15 ! PR fortran/18918
18 program test_image_index
19 implicit none
20 integer :: index1, index2, index3
21 logical :: one
23 integer, allocatable :: a(:)[:,:,:], b(:)[:,:], c(:,:)[:]
24 integer, save :: d(2)[-1:3, *]
25 integer, save :: e(2)[-1:-1, 3:*]
27 one = num_images() == 1
29 allocate(a(1)[3:3, -4:-3, 88:*])
30 allocate(b(2)[-1:0,0:*])
31 allocate(c(3,3)[*])
33 index1 = image_index(a, [3, -4, 88] )
34 index2 = image_index(b, [-1, 0] )
35 index3 = image_index(c, [1] )
36 if (index1 /= 1 .or. index2 /= 1 .or. index3 /= 1) call abort()
39 index1 = image_index(a, [3, -3, 88] )
40 index2 = image_index(b, [0, 0] )
41 index3 = image_index(c, [2] )
43 if (one .and. (index1 /= 0 .or. index2 /= 0 .or. index3 /= 0)) &
44 call abort()
45 if (.not. one .and. (index1 /= 2 .or. index2 /= 2 .or. index3 /= 2)) &
46 call abort()
49 index1 = image_index(d, [-1, 1] )
50 index2 = image_index(d, [0, 1] )
52 if (one .and. (index1 /= 1 .or. index2 /= 0)) &
53 call abort()
54 if (.not. one .and. (index1 /= 1 .or. index2 /= 2)) &
55 call abort()
57 index1 = image_index(e, [-1, 3] )
58 index2 = image_index(e, [-1, 4] )
60 if (one .and. (index1 /= 1 .or. index2 /= 0)) &
61 call abort()
62 if (.not. one .and. (index1 /= 1 .or. index2 /= 2)) &
63 call abort()
65 call test(1, a,b,c)
67 ! The following test is in honour of the F2008 standard:
68 deallocate(a)
69 allocate(a (10) [10, 0:9, 0:*])
71 index1 = image_index(a, [1, 0, 0] )
72 index2 = image_index(a, [3, 1, 2] ) ! = 213, yeah!
73 index3 = image_index(a, [3, 1, 0] ) ! = 13
75 if (num_images() < 13 .and. (index1 /= 1 .or. index2 /= 0 .or. index3 /= 0)) &
76 call abort()
77 if (num_images() >= 213 .and. (index1 /= 1 .or. index2 /= 213 .or. index3 /= 13)) &
78 call abort()
79 if (num_images() >= 13 .and. (index1 /= 1 .or. index2 /= 0 .or. index3 /= 13)) &
80 call abort()
83 contains
84 subroutine test(n, a, b, c)
85 integer :: n
86 integer :: a(1)[3*n:3*n, -4*n:-3*n, 88*n:*], b(2)[-1*n:0*n,0*n:*], c(3*n,3*n)[*]
88 index1 = image_index(a, [3, -4, 88] )
89 index2 = image_index(b, [-1, 0] )
90 index3 = image_index(c, [1] )
91 if (index1 /= 1 .or. index2 /= 1 .or. index3 /= 1) call abort()
94 index1 = image_index(a, [3, -3, 88] )
95 index2 = image_index(b, [0, 0] )
96 index3 = image_index(c, [2] )
98 if (one .and. (index1 /= 0 .or. index2 /= 0 .or. index3 /= 0)) &
99 call abort()
100 if (.not. one .and. (index1 /= 2 .or. index2 /= 2 .or. index3 /= 2)) &
101 call abort()
102 end subroutine test
103 end program test_image_index