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

Subversion Repositories openrisc

[/] [openrisc/] [tags/] [gnu-src/] [gcc-4.5.1/] [gcc-4.5.1-or32-1.0rc4/] [libgomp/] [testsuite/] [libgomp.fortran/] [appendix-a/] [a.38.1.f90] - Diff between revs 273 and 519

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

Rev 273 Rev 519
! { dg-do compile }
! { dg-do compile }
      FUNCTION NEW_LOCKS()
      FUNCTION NEW_LOCKS()
        USE OMP_LIB        ! or INCLUDE "omp_lib.h"
        USE OMP_LIB        ! or INCLUDE "omp_lib.h"
        INTEGER(OMP_LOCK_KIND), DIMENSION(1000) :: NEW_LOCKS
        INTEGER(OMP_LOCK_KIND), DIMENSION(1000) :: NEW_LOCKS
        INTEGER I
        INTEGER I
!$OMP PARALLEL DO PRIVATE(I)
!$OMP PARALLEL DO PRIVATE(I)
          DO I=1,1000
          DO I=1,1000
            CALL OMP_INIT_LOCK(NEW_LOCKS(I))
            CALL OMP_INIT_LOCK(NEW_LOCKS(I))
          END DO
          END DO
!$OMP END PARALLEL DO
!$OMP END PARALLEL DO
      END FUNCTION NEW_LOCKS
      END FUNCTION NEW_LOCKS
 
 

powered by: WebSVN 2.1.0

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