Merge -r 127928:132243 from trunk
[official-gcc.git] / gcc / testsuite / gfortran.dg / anint_1.f90
bloba6b92cbcd3a0091cb6204fa4e620eb7aa6a0c415
1 ! { dg-do run }
2 ! Check the fix for PR33568 in which the optional KIND
3 ! argument for ANINT, with an array for the first argument
4 ! would cause an ICE.
6 ! Contributed by Ignacio Fernández Galván <jellby@yahoo.com>
8 PROGRAM Test
9 IMPLICIT NONE
10 INTEGER, PARAMETER :: DP=8
11 REAL(DP), DIMENSION(1:3) :: A = (/1.76,2.32,7.66/), B
12 A = ANINT ( A , DP)
13 B = A
14 A = ANINT ( A)
15 if (any (A .ne. B)) call abort ()
16 END PROGRAM Test