URL
https://opencores.org/ocsvn/openrisc/openrisc/trunk
Subversion Repositories openrisc
[/] [openrisc/] [trunk/] [gnu-stable/] [gcc-4.5.1/] [gcc/] [testsuite/] [gfortran.dg/] [proc_ptr_13.f90] - Rev 862
Go to most recent revision | Compare with Previous | Blame | View Log
! { dg-do compile }
! { dg-options "-g" }
!
! PR 38152: Procedure pointers as module variables.
!
! Contributed by Daniel Kraft <domob@gcc.gnu.org>
MODULE myfortran_binding
IMPLICIT NONE
PROCEDURE(error_stop), POINTER :: error_handler
CONTAINS
LOGICAL FUNCTION myfortran_shutdown ()
CALL error_handler ()
END FUNCTION myfortran_shutdown
SUBROUTINE error_stop ()
END SUBROUTINE error_stop
END MODULE myfortran_binding
use myfortran_binding
error_handler => error_stop
end
! { dg-final { cleanup-modules "myfortran_binding" } }
Go to most recent revision | Compare with Previous | Blame | View Log