PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / PR40660.f90
blobdbd533961553aa655841aa8b57ffb9feb58cf659
1 ! { dg-do compile }
2 ! { dg-options "-fdump-tree-original-lineno" }
4 ! PR fortran/40660
6 PROGRAM test
7 INTEGER, DIMENSION(3) :: a1,a2
8 a1 = 1
9 PRINT*, a1
10 a2 = 2
11 end program test
13 ! { dg-final { scan-tree-dump-times ": 3\] _gfortran" 0 "original" } }