PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / module_equivalence_5.f90
bloba4d81af65cb154b7729b3826d08442d54ed831b9
1 ! { dg-do run }
3 ! Fixes PR37787 where the EQUIVALENCE between QLA1 and QLA2 wasn't recognized
4 ! in the dependency checking because the compiler was looking in the wrong name
5 ! space.
7 ! Contributed by Dick Hendrickson <dick.hendrickson@gmail.com>
9 module stuff
10 integer, parameter :: r4_kv = 4
11 contains
13 SUBROUTINE CF0004
14 ! COPYRIGHT 1999 SPACKMAN & HENDRICKSON, INC.
15 REAL(R4_KV), dimension (10) :: QLA1, QLA2, QLA3, &
16 QCA = (/(i, i= 1, 10)/)
17 EQUIVALENCE (QLA1, QLA2)
18 QLA1 = QCA
19 QLA3 = QCA
20 QLA3( 2:10:3) = QCA ( 1:5:2) + 1
21 QLA1( 2:10:3) = QLA2( 1:5:2) + 1 !failed because of dependency
22 if (any (qla1 .ne. qla3)) STOP 1
23 END SUBROUTINE
24 end module
26 program try_cf004
27 use stuff
28 nf1 = 1
29 nf2 = 2
30 call cf0004
31 end