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/] [char_length_13.f90] - Rev 310
Go to most recent revision | Compare with Previous | Blame | View Log
! { dg-do compile }
!
! PR fortran/38095
!
! Contributed by Vivek Rao
!
! Compiling the program below gave an ICE
!
module bar
implicit none
contains
elemental function trim_append(xx,yy) result(xy)
character (len=*), intent(in) :: xx,yy
character (len=len(xx) + len(yy)) :: xy
xy = trim(xx) // yy
end function trim_append
function same(xx) result(yy)
character (len=*), intent(in) :: xx(:)
character (len=len(xx)) :: yy(size(xx))
yy = [xx]
end function same
subroutine foo(labels)
character (len=*), intent(in) :: labels(:)
print*,"size(labels)=",size(labels)
end subroutine foo
subroutine xmain()
call foo(trim_append(["a"],same(["b"])))
end subroutine xmain
end module bar
program main
use bar
call xmain()
end program main
! { dg-final { cleanup-modules "bar" } }
Go to most recent revision | Compare with Previous | Blame | View Log