blob: 0fcf00e53a5938a18b8a7b57bd1e3361df799d6b [file] [log] [blame]
! { dg-do compile }
! Tests the fix for PR26779, where an error would occur because
! init was detected to be public with a private type dummy argument.
!
! Contributed by Paul Thomas <pault@gcc.gnu.org>
!
module test
public sub
type, private :: t
integer :: i
end type t
contains
subroutine sub (arg)
integer arg
type(t) :: root
call init(root, arg)
contains
subroutine init(ir, i)
integer i
type(t) :: ir
ir%i = i
end subroutine init
end subroutine sub
end module test
! { dg-final { cleanup-modules "test" } }