comparison gcc/testsuite/gfortran.dg/ldist-pr43023.f90 @ 111:04ced10e8804

gcc 7
author kono
date Fri, 27 Oct 2017 22:46:09 +0900
parents
children
comparison
equal deleted inserted replaced
68:561a7518be6b 111:04ced10e8804
1 ! { dg-do compile }
2 ! { dg-options "-O2 -ftree-loop-distribution" }
3
4 MODULE NFT_mod
5
6 implicit none
7 integer :: Nangle
8 real:: Z0
9 real, dimension(:,:), allocatable :: Angle
10 real, dimension(:), allocatable :: exth, ezth, hxth, hyth, hyphi
11
12 CONTAINS
13
14 SUBROUTINE NFT_Init()
15
16 real :: th, fi
17 integer :: n
18
19 do n = 1,Nangle
20 th = Angle(n,1)
21 fi = Angle(n,2)
22
23 exth(n) = cos(fi)*cos(th)
24 ezth(n) = -sin(th)
25 hxth(n) = -sin(fi)
26 hyth(n) = cos(fi)
27 hyphi(n) = -sin(fi)
28 end do
29 END SUBROUTINE NFT_Init
30
31 END MODULE NFT_mod