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

Subversion Repositories openrisc_2011-10-31

[/] [openrisc/] [trunk/] [gnu-src/] [gcc-4.5.1/] [gcc/] [testsuite/] [gfortran.dg/] [generic_20.f90] - Rev 325

Go to most recent revision | Compare with Previous | Blame | View Log

! { dg-do run }
!
! PR fortran/39304
!
! matmul checking was checking the wrong specific function
! ("one" instead of "two")
!
module m
  implicit none
  interface one
    module procedure one, two
  end interface one
contains
  function one()
    real :: one(1)
    one = 0.0
  end function one
  function two(x)
    real :: x
    real :: two(1,1)
    two = reshape ( (/ x /), (/ 1, 1 /) )
  end function two
end module m

use m
real :: res(1)
res = matmul (one(2.0), (/ 2.0/))
if (abs (res(1)-4.0) > epsilon (res)) call abort ()
end

! { dg-final { cleanup-modules "m" } }

Go to most recent revision | Compare with Previous | Blame | View Log

powered by: WebSVN 2.1.0

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