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

Subversion Repositories openrisc

[/] [openrisc/] [trunk/] [gnu-old/] [gcc-4.2.2/] [gcc/] [testsuite/] [gfortran.dg/] [pr15129.f90] - Diff between revs 154 and 816

Go to most recent revision | Only display areas with differences | Details | Blame | View Log

Rev 154 Rev 816
! { dg-do run }
! { dg-do run }
! PR 15129: we used to share the character length between A and B in the
! PR 15129: we used to share the character length between A and B in the
! subroutine.
! subroutine.
CHARACTER*10 A
CHARACTER*10 A
CHARACTER*8 B
CHARACTER*8 B
A = 'gfortran'
A = 'gfortran'
B = 'rocks!'
B = 'rocks!'
CALL T(A,B)
CALL T(A,B)
contains
contains
SUBROUTINE T(A,B)
SUBROUTINE T(A,B)
CHARACTER*(*) A,B
CHARACTER*(*) A,B
if(len(a)/=10) call abort()
if(len(a)/=10) call abort()
if(len(b)/=8) call abort()
if(len(b)/=8) call abort()
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.