2 ! { dg-add-options ieee }
3 ! { dg-skip-if "NaN not supported" { spu-*-* } }
7 ! Check that namelists and the real values Inf, NaN, Infinity
8 ! properly coexist with interceding line ends and spaces.
12 real , DIMENSION(10) ::foo
16 NAMELIST /nl
/ infinity
20 open (10, status
="scratch")
22 write (10,'(a)') " &nl foo(1:6) = 5, 5, 5, nan, infinity"
27 write (10,'(a)') "infinity"
39 write (10,'(a)') "=1/"
43 if(infinity
/= 1) call abort
44 if(any(foo(1:3) /= [5.0, 5.0, 5.0]) .or
. .not
.isnan(foo(4)) &
45 .or
. (foo(5) <= huge(foo
)) .or
. any(foo(6:10) /= -1.0)) &