aarch64: Add vector floating point extend pattern [PR113880, PR113869]
[official-gcc.git] / gcc / testsuite / gfortran.dg / random_seed_3.f90
blobc4be96541b037ee12a4fa8b94c2492a6bc0cbdfe
1 ! { dg-do run }
2 ! Check that array constructors using non-compile-time
3 ! iterators are handled correctly.
4 program main
5 implicit none
6 call init_random_seed
7 contains
8 SUBROUTINE init_random_seed()
9 INTEGER :: i, n, clock
10 INTEGER, DIMENSION(:), ALLOCATABLE :: seed
12 CALL RANDOM_SEED(size = n)
13 ALLOCATE(seed(n))
15 CALL SYSTEM_CLOCK(COUNT=clock)
17 seed = clock + 37 * (/ (i - 1, i = 1, n) /)
18 CALL RANDOM_SEED(PUT = seed)
20 DEALLOCATE(seed)
21 END SUBROUTINE init_random_seed
22 end program main