OpenCores
URL https://opencores.org/ocsvn/openrisc/openrisc/trunk

Subversion Repositories openrisc

[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [lto/] [20100110-1_0.f90] - Rev 749

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

! { dg-lto-do link }
! { dg-lto-options {{ -O1 -flto }} }
! { dg-suppress-ld-options "-O1" }

      SUBROUTINE ylm4(ylm)
      COMPLEX, INTENT (OUT):: ylm(1)
      INTEGER l,m
      COMPLEX ylms
      REAL, ALLOCATABLE, SAVE  :: ynorm(:)
      ylms = 0
      DO m = 1, 1
         DO l = m, 1
            ylm(m) = conjg(ylms)*ynorm(m)
         ENDDO
      ENDDO
      END SUBROUTINE ylm4

      PROGRAM test
      END

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.