OSDN Git Service

PR debug/43983
[pf3gnuchains/gcc-fork.git] / gcc / testsuite / gfortran.dg / private_type_7.f90
1 ! { dg-do compile }
2 ! PR32760 Error defining subroutine named PRINT
3 ! Test case derived from original PR.
4
5 module gfcbug68
6   implicit none
7   private :: write
8
9 contains
10
11   function foo (i)
12     integer, intent(in)  :: i
13     integer foo
14
15     write (*,*) i
16     call write(i)
17     foo = i
18   end function foo
19
20   subroutine write (m)
21     integer, intent(in) :: m
22     print *, m*m*m
23   end subroutine write
24
25 end module gfcbug68
26
27 program testit
28   use gfcbug68
29   integer :: i = 27
30   integer :: k
31   
32   k = foo(i)
33   print *, "in the main:", k
34 end program testit
35 ! { dg-final { cleanup-modules "gfcbug68" } }