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.0rc2/] [gcc/] [testsuite/] [gfortran.dg/] [array_constructor_16.f90] - Diff between revs 302 and 384

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

Rev 302 Rev 384
! { dg-do run }
! { dg-do run }
! Tests the fix for PR31204, in which 'i' below would be incorrectly
! Tests the fix for PR31204, in which 'i' below would be incorrectly
! host associated by the contained subroutines.  The checks for 'ii'
! host associated by the contained subroutines.  The checks for 'ii'
! and 'iii' have been added, since they can be host associated because
! and 'iii' have been added, since they can be host associated because
! of the explicit declarations in the main program.
! of the explicit declarations in the main program.
!
!
! Contributed by Joost VandeVondele 
! Contributed by Joost VandeVondele 
!
!
  integer ii
  integer ii
  INTEGER, PARAMETER :: jmin(1:10) = (/ (i, i = 1, 10) /)
  INTEGER, PARAMETER :: jmin(1:10) = (/ (i, i = 1, 10) /)
  INTEGER, PARAMETER :: kmin(1:10) = (/ (ii, ii = 1, 10) /)
  INTEGER, PARAMETER :: kmin(1:10) = (/ (ii, ii = 1, 10) /)
  INTEGER, PARAMETER :: lmin(1:10) = (/ (iii, iii = 1, 10) /)
  INTEGER, PARAMETER :: lmin(1:10) = (/ (iii, iii = 1, 10) /)
  integer iii
  integer iii
  CALL two
  CALL two
CONTAINS
CONTAINS
  SUBROUTINE one
  SUBROUTINE one
    i = 99
    i = 99
    ii = 99
    ii = 99
    iii = 999
    iii = 999
  END SUBROUTINE
  END SUBROUTINE
  SUBROUTINE two
  SUBROUTINE two
    i = 0
    i = 0
    ii = 0
    ii = 0
    iii = 0
    iii = 0
    CALL one
    CALL one
    IF (i .NE. 0) CALL ABORT ()
    IF (i .NE. 0) CALL ABORT ()
    IF (ii .NE. 99) CALL ABORT ()
    IF (ii .NE. 99) CALL ABORT ()
    IF (iii .NE. 999) CALL ABORT ()
    IF (iii .NE. 999) CALL ABORT ()
  END SUBROUTINE
  END SUBROUTINE
END
END
 
 

powered by: WebSVN 2.1.0

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