OSDN Git Service

2010-11-13 Tobias Burnus <burnus@net-b.de>
[pf3gnuchains/gcc-fork.git] / gcc / testsuite / gfortran.dg / anint_1.f90
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.
5 !
6 ! Contributed by Ignacio Fernández Galván <jellby@yahoo.com>
7 !
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