URL
https://opencores.org/ocsvn/openrisc/openrisc/trunk
Subversion Repositories openrisc
[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.fortran-torture/] [execute/] [intrinsic_shape.f90] - Rev 760
Go to most recent revision | Compare with Previous | Blame | View Log
! Program to test the shape intrinsic
program testbounds
implicit none
real, dimension(:, :), allocatable :: a
integer, dimension(2) :: j
integer i
allocate (a(3:8, 6:7))
j = shape (a);
if (any (j .ne. (/ 6, 2 /))) call abort
call test(a)
contains
subroutine test (a)
real, dimension (1:, 1:) :: a
if (any (shape (a) .ne. (/ 6, 2 /))) call abort
end subroutine
end program
Go to most recent revision | Compare with Previous | Blame | View Log