OpenCores
URL https://opencores.org/ocsvn/openrisc_2011-10-31/openrisc_2011-10-31/trunk

Subversion Repositories openrisc_2011-10-31

[/] [openrisc/] [tags/] [gnu-src/] [gcc-4.5.1/] [gcc-4.5.1-or32-1.0rc2/] [gcc/] [testsuite/] [gfortran.dg/] [intrinsic_1.f90] - Diff between revs 302 and 384

Only display areas with differences | Details | Blame | View Log

Rev 302 Rev 384
! { dg-do compile }
! { dg-do compile }
!
!
! PR 39861/39864
! PR 39861/39864
!
!
! Test cases provided by Dominique d'Humieres 
! Test cases provided by Dominique d'Humieres 
! and Michael Richmond .
! and Michael Richmond .
module vector_calculus
module vector_calculus
  intrinsic :: dot_product, sqrt
  intrinsic :: dot_product, sqrt
contains
contains
  function len(r)
  function len(r)
    real, dimension(:), intent(in) :: r
    real, dimension(:), intent(in) :: r
    real :: len
    real :: len
    len = sqrt(dot_product(r,r))
    len = sqrt(dot_product(r,r))
  end function len
  end function len
  FUNCTION next_state()
  FUNCTION next_state()
    INTRINSIC :: RESHAPE
    INTRINSIC :: RESHAPE
    INTEGER, PARAMETER :: trantb(1,1) = RESHAPE((/1,2/), shape=(/1,1/))
    INTEGER, PARAMETER :: trantb(1,1) = RESHAPE((/1,2/), shape=(/1,1/))
    next_state = trantb(1, 1)
    next_state = trantb(1, 1)
  END FUNCTION next_state
  END FUNCTION next_state
end module vector_calculus
end module vector_calculus
! { dg-final { cleanup-modules "vector_calculus" } }
! { dg-final { cleanup-modules "vector_calculus" } }
 
 

powered by: WebSVN 2.1.0

© copyright 1999-2024 OpenCores.org, equivalent to Oliscience, all rights reserved. OpenCores®, registered trademark.