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/] [interface_assignment_4.f90] - Diff between revs 302 and 384

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

Rev 302 Rev 384
! { dg-do compile }
! { dg-do compile }
!
!
! PR 40743: [4.5 Regression] ICE when compiling iso_varying_string.f95 at revision 149591
! PR 40743: [4.5 Regression] ICE when compiling iso_varying_string.f95 at revision 149591
!
!
! Reduced from http://www.fortran.com/iso_varying_string.f95
! Reduced from http://www.fortran.com/iso_varying_string.f95
! Contributed by Janus Weil 
! Contributed by Janus Weil 
  implicit none
  implicit none
  type :: varying_string
  type :: varying_string
  end type
  end type
  interface assignment(=)
  interface assignment(=)
     procedure op_assign_VS_CH
     procedure op_assign_VS_CH
  end interface
  end interface
contains
contains
  subroutine op_assign_VS_CH (var, exp)
  subroutine op_assign_VS_CH (var, exp)
    type(varying_string), intent(out) :: var
    type(varying_string), intent(out) :: var
    character(LEN=*), intent(in)      :: exp
    character(LEN=*), intent(in)      :: exp
  end subroutine
  end subroutine
  subroutine split_VS
  subroutine split_VS
    type(varying_string) :: string
    type(varying_string) :: string
    call split_CH(string)
    call split_CH(string)
  end subroutine
  end subroutine
  subroutine split_CH (string)
  subroutine split_CH (string)
    type(varying_string) :: string
    type(varying_string) :: string
    string = ""
    string = ""
  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.