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

Subversion Repositories openrisc_me

[/] [openrisc/] [trunk/] [gnu-src/] [gcc-4.5.1/] [gcc/] [testsuite/] [gfortran.dg/] [gomp/] [appendix-a/] [a.36.1.f90] - Blame information for rev 316

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

Line No. Rev Author Line
1 302 jeremybenn
! { dg-do compile }
2
 
3
      SUBROUTINE DO_BY_16(X, IAM, IPOINTS)
4
        REAL X(*)
5
        INTEGER IAM, IPOINTS
6
      END SUBROUTINE DO_BY_16
7
      SUBROUTINE SUBA36(X, NPOINTS)
8
        INTEGER NPOINTS
9
        REAL X(NPOINTS)
10
        INTEGER IAM, IPOINTS
11
        EXTERNAL OMP_SET_DYNAMIC, OMP_SET_NUM_THREADS
12
        INTEGER OMP_GET_NUM_THREADS, OMP_GET_THREAD_NUM
13
        CALL OMP_SET_DYNAMIC(.FALSE.)
14
        CALL OMP_SET_NUM_THREADS(16)
15
!$OMP PARALLEL SHARED(X,NPOINTS) PRIVATE(IAM, IPOINTS)
16
          IF (OMP_GET_NUM_THREADS() .NE. 16) THEN
17
            STOP
18
          ENDIF
19
          IAM = OMP_GET_THREAD_NUM()
20
          IPOINTS = NPOINTS/16
21
          CALL DO_BY_16(X,IAM,IPOINTS)
22
!$OMP END PARALLEL
23
      END SUBROUTINE SUBA36

powered by: WebSVN 2.1.0

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