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.0rc1/] [libgomp/] [testsuite/] [libgomp.fortran/] [workshare2.f90] - Diff between revs 273 and 338

Only display areas with differences | Details | Blame | View Log

Rev 273 Rev 338
subroutine f1
subroutine f1
  integer a(20:50,70:90)
  integer a(20:50,70:90)
!$omp parallel workshare
!$omp parallel workshare
  a(:,:) = 17
  a(:,:) = 17
!$omp end parallel workshare
!$omp end parallel workshare
  if (any (a.ne.17)) call abort
  if (any (a.ne.17)) call abort
end subroutine f1
end subroutine f1
subroutine f2
subroutine f2
  integer a(20:50,70:90),d(15),e(15),f(15)
  integer a(20:50,70:90),d(15),e(15),f(15)
  integer b, c, i
  integer b, c, i
!$omp parallel workshare
!$omp parallel workshare
  c = 5
  c = 5
  a(:,:) = 17
  a(:,:) = 17
  b = 4
  b = 4
  d = (/ 0, 1, 2, 3, 4, 0, 6, 7, 8, 9, 10, 0, 0, 13, 14 /)
  d = (/ 0, 1, 2, 3, 4, 0, 6, 7, 8, 9, 10, 0, 0, 13, 14 /)
  forall (i=1:15, d(i) /= 0)
  forall (i=1:15, d(i) /= 0)
     d(i) = 0
     d(i) = 0
  end forall
  end forall
  e = (/ 4, 5, 2, 6, 4, 5, 2, 6, 4, 5, 2, 6, 4, 5, 2 /)
  e = (/ 4, 5, 2, 6, 4, 5, 2, 6, 4, 5, 2, 6, 4, 5, 2 /)
  f = 7
  f = 7
  where (e.ge.5) f = f + 1
  where (e.ge.5) f = f + 1
!$omp end parallel workshare
!$omp end parallel workshare
  if (any (a.ne.17)) call abort
  if (any (a.ne.17)) call abort
  if (c.ne.5.or.b.ne.4) call abort
  if (c.ne.5.or.b.ne.4) call abort
  if (any(d.ne.0)) call abort
  if (any(d.ne.0)) call abort
  do i = 1, 15
  do i = 1, 15
    if (e(i).ge.5) then
    if (e(i).ge.5) then
      if (f(i).ne.8) call abort
      if (f(i).ne.8) call abort
    else
    else
      if (f(i).ne.7) call abort
      if (f(i).ne.7) call abort
    end if
    end if
  end do
  end do
end subroutine f2
end subroutine f2
  call f1
  call f1
  call f2
  call f2
end
end
 
 

powered by: WebSVN 2.1.0

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