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

Subversion Repositories openrisc_me

[/] [openrisc/] [trunk/] [gnu-src/] [gcc-4.2.2/] [gcc/] [testsuite/] [gfortran.dg/] [arrayio_11.f90] - Diff between revs 149 and 154

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

Rev 149 Rev 154
! { dg-do run }
! { dg-do run }
! Tests the fix for PR30284, in which the substring plus
! Tests the fix for PR30284, in which the substring plus
! component reference for an internal file would cause an ICE.
! component reference for an internal file would cause an ICE.
!
!
! Contributed by Harald Anlauf 
! Contributed by Harald Anlauf 
program gfcbug51
program gfcbug51
  implicit none
  implicit none
  type :: date_t
  type :: date_t
    character(len=12) :: date      ! yyyymmddhhmm
    character(len=12) :: date      ! yyyymmddhhmm
  end type date_t
  end type date_t
  type year_t
  type year_t
    integer :: year = 0
    integer :: year = 0
  end type year_t
  end type year_t
  type(date_t) :: file(3)
  type(date_t) :: file(3)
  type(year_t) :: time(3)
  type(year_t) :: time(3)
  FILE%date = (/'200612231200', '200712231200', &
  FILE%date = (/'200612231200', '200712231200', &
                '200812231200'/)
                '200812231200'/)
  time = date_to_year (FILE)
  time = date_to_year (FILE)
  if (any (time%year .ne. (/2006, 2007, 2008/))) call abort ()
  if (any (time%year .ne. (/2006, 2007, 2008/))) call abort ()
  call month_to_date ((/8, 9, 10/), FILE)
  call month_to_date ((/8, 9, 10/), FILE)
  if ( any (file%date .ne. (/'200608231200', '200709231200', &
  if ( any (file%date .ne. (/'200608231200', '200709231200', &
                             '200810231200'/))) call abort ()
                             '200810231200'/))) call abort ()
contains
contains
  function date_to_year (d) result (y)
  function date_to_year (d) result (y)
    type(date_t) :: d(3)
    type(date_t) :: d(3)
    type(year_t) :: y(size (d, 1))
    type(year_t) :: y(size (d, 1))
    read (d%date(1:4),'(i4)')  time% year
    read (d%date(1:4),'(i4)')  time% year
  end function date_to_year
  end function date_to_year
  subroutine month_to_date (m, d)
  subroutine month_to_date (m, d)
    type(date_t) :: d(3)
    type(date_t) :: d(3)
    integer :: m(:)
    integer :: m(:)
    write (d%date(5:6),'(i2.2)')  m
    write (d%date(5:6),'(i2.2)')  m
  end subroutine month_to_date
  end subroutine month_to_date
end program gfcbug51
end program gfcbug51
 
 

powered by: WebSVN 2.1.0

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