URL
https://opencores.org/ocsvn/openrisc/openrisc/trunk
Subversion Repositories openrisc
[/] [openrisc/] [trunk/] [gnu-dev/] [or1k-gcc/] [gcc/] [testsuite/] [gfortran.dg/] [pointer_function_actual_2.f90] - Rev 694
Compare with Previous | Blame | View Log
! { dg-do run }
! Tests the fix for PR31200, in which the target x would
! not be associated with p
!
! COntributed by Joost VandeVondele <jv244@cam.ac.uk>
!
REAL,TARGET :: x
CALL s3(f(x))
CONTAINS
FUNCTION f(a)
REAL,POINTER :: f
REAL,TARGET :: a
f => a
END FUNCTION
SUBROUTINE s3(targ)
REAL,TARGET :: targ
REAL,POINTER :: p
p => targ
IF (.NOT. ASSOCIATED(p,x)) CALL ABORT()
END SUBROUTINE
END