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_21.f90] - Rev 384

Compare with Previous | Blame | View Log

! { dg-do compile }
!
! PR fortran/34785, in which the character length of BA_T was not
! passed on to the array constructor argument of SEQ.
!
! Contributed by Dick Hendrickson <dick.hendrickson@gmail.com>
!
      MODULE o_TYPE_DEFS
        implicit none
        TYPE SEQ
          SEQUENCE
          CHARACTER(len = 9) ::  BA(2)
        END TYPE SEQ
        CHARACTER(len = 9)   ::  BA_T(2)
        CHARACTER(LEN = 9)   ::  CA_T(1,2)
      END MODULE o_TYPE_DEFS

      MODULE TESTS
        use o_type_defs
        implicit none
      CONTAINS
        SUBROUTINE OG0015(UDS0L)
          TYPE(SEQ)          UDS0L
          integer :: j1
          UDS0L = SEQ((/ (BA_T(J1),J1=1,2) /))
        END SUBROUTINE
      END MODULE TESTS

      use o_type_defs
      CONTAINS
        SUBROUTINE OG0015(UDS0L)
          TYPE(SEQ)          UDS0L
          UDS0L = SEQ(RESHAPE ( (/ ((CA_T(J1,J2), J1 = 1, 1), J2 = 1, 2)/),(/2/)))
        END SUBROUTINE
      END
! { dg-final { cleanup-modules "o_TYPE_DEFS TESTS" } }

Compare with Previous | Blame | View Log

powered by: WebSVN 2.1.0

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