URL
https://opencores.org/ocsvn/openrisc/openrisc/trunk
Subversion Repositories openrisc
[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [real_do_1.f90] - Rev 801
Go to most recent revision | Compare with Previous | Blame | View Log
! { dg-do run }
! { dg-warning "Loop variable" "Loop" { target *-*-* } 13 }
! { dg-warning "Start expression" "Start" { target *-*-* } 13 }
! { dg-warning "End expression" "End" { target *-*-* } 13 }
! { dg-warning "Step expression" "Step" { target *-*-* } 13 }
! Test REAL type iterators in DO loops
program real_do_1
real x, y
integer n
n = 0
y = 1.0
do x = 1.0, 2.05, 0.1
call check (x, y)
y = y + 0.1
n = n + 1
end do
if (n .ne. 11) call abort()
contains
subroutine check (a, b)
real, intent(in) :: a, b
if (abs (a - b) .gt. 0.00001) call abort()
end subroutine
end program
Go to most recent revision | Compare with Previous | Blame | View Log