PR inline-asm/84742
[official-gcc.git] / gcc / testsuite / gfortran.dg / array_constructor_51.f90
blob4c3cdf71fcfa691b2d23927489cd2de92d468e51
1 ! { dg-do compile }
2 ! { dg-additional-options "-ffrontend-optimize -fdump-tree-original" }
3 ! PR 82567 - long compile times caused by large constant constructors
4 ! multiplied by variables
6 SUBROUTINE sub()
7 IMPLICIT NONE
9 INTEGER, PARAMETER :: n = 1000
10 REAL, ALLOCATABLE :: x(:)
11 REAL :: xc, h
12 INTEGER :: i
14 ALLOCATE( x(n) )
15 xc = 100.
16 h = xc/n
17 x = h*[(i,i=1,n)]
19 end
20 ! { dg-final { scan-tree-dump-times "__var" 0 "original" } }