mirror of
https://review.haiku-os.org/buildtools
synced 2025-02-07 14:34:51 +01:00
Updated dependencies: * GMP 6.2.1 * ISL 0.24 * MPL 1.2.1 * MPFR 4.1.0 The dependencies were pulled in by running the ./contrib/download_prerequisites script and then manually removing the symbolic links and archives, and renaming the directories (i.e mv isl-0.24 to isl)
26 lines
684 B
Fortran
26 lines
684 B
Fortran
! { dg-do run }
|
|
! { dg-additional-sources pr96628-part2.f90 }
|
|
! { dg-additional-options "-ftree-slp-vectorize" }
|
|
!
|
|
! This file is compiled first
|
|
|
|
! { dg-additional-options -Wuninitialized }
|
|
|
|
module m2
|
|
real*8 :: mysum
|
|
!$acc declare device_resident(mysum)
|
|
contains
|
|
SUBROUTINE one(t)
|
|
!$acc routine
|
|
REAL*8, INTENT(IN) :: t(:)
|
|
mysum = sum(t)
|
|
END SUBROUTINE one
|
|
SUBROUTINE two(t)
|
|
!$acc routine seq
|
|
REAL*8, INTENT(INOUT) :: t(:)
|
|
t = (100.0_8*t)/sum
|
|
! { dg-warning {'sum' is used uninitialized} {} { target *-*-* } .-1 }
|
|
! { dg-note {'sum' was declared here} {} { target *-*-* } .-2 }
|
|
END SUBROUTINE two
|
|
end module m2
|