URL
https://opencores.org/ocsvn/openrisc_me/openrisc_me/trunk
Subversion Repositories openrisc_me
[/] [openrisc/] [trunk/] [gnu-src/] [gcc-4.5.1/] [gcc/] [testsuite/] [gfortran.dg/] [interface_assignment_4.f90] - Rev 399
Go to most recent revision | Compare with Previous | Blame | View Log
! { dg-do compile }
!
! 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
! Contributed by Janus Weil <janus@gcc.gnu.org>
implicit none
type :: varying_string
end type
interface assignment(=)
procedure op_assign_VS_CH
end interface
contains
subroutine op_assign_VS_CH (var, exp)
type(varying_string), intent(out) :: var
character(LEN=*), intent(in) :: exp
end subroutine
subroutine split_VS
type(varying_string) :: string
call split_CH(string)
end subroutine
subroutine split_CH (string)
type(varying_string) :: string
string = ""
end subroutine
end
Go to most recent revision | Compare with Previous | Blame | View Log