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/] [pr32238.f90] - Diff between revs 302 and 384

Go to most recent revision | Only display areas with differences | Details | Blame | View Log

Rev 302 Rev 384
!PR fortran/32238
!PR fortran/32238
! { dg-do compile }
! { dg-do compile }
! { dg-final { cleanup-modules "bug_test" } }
! { dg-final { cleanup-modules "bug_test" } }
module bug_test
module bug_test
contains
contains
  subroutine bug(c)
  subroutine bug(c)
  implicit none
  implicit none
  integer, parameter :: fp = selected_real_kind(13)
  integer, parameter :: fp = selected_real_kind(13)
  complex(kind=fp)              :: c(:,:)
  complex(kind=fp)              :: c(:,:)
  where( abs( aimag( c ) ) < 1.e-10_fp )                             &
  where( abs( aimag( c ) ) < 1.e-10_fp )                             &
  &    c = cmplx( real( c , fp ) , 0._fp , fp )
  &    c = cmplx( real( c , fp ) , 0._fp , fp )
  where( abs( real( c , fp ) ) < 1.e-10_fp )                         &
  where( abs( real( c , fp ) ) < 1.e-10_fp )                         &
  &    c = cmplx( 0._fp , aimag( c ) , fp )
  &    c = cmplx( 0._fp , aimag( c ) , fp )
  return
  return
  end subroutine bug
  end subroutine bug
end module bug_test
end module bug_test
 
 

powered by: WebSVN 2.1.0

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