blob: 30db4012f46d965a4040176f3bbb5b572d652e7d [file] [log] [blame]
! This is the testcase from PR 12841. We used to report a type/rank mismatch
! when passing NULL() as an argument to a function.
MODULE T
PUBLIC :: A
CONTAINS
SUBROUTINE A(B)
REAL, POINTER :: B
IF (ASSOCIATED(B)) STOP 1
END SUBROUTINE A
END MODULE T
USE T
CALL A(NULL())
END