aboutsummaryrefslogtreecommitdiff
path: root/gcc/testsuite/gfortran.dg/pr63797.f90
blob: 1131e8167b1a01702c192284f601d8870c14879d (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
! { dg-do compile }
! PR63797 - Bogus ambiguous reference to 'sqrt'

module mod1
  implicit none
  real, parameter :: z = sqrt (0.0)
  real            :: w = sqrt (1.0)
  interface
     pure real function sqrt_ifc (x)
       real, intent(in) :: x
     end function sqrt_ifc
  end interface
contains
  pure function myroot () result (f)
    procedure(sqrt_ifc), pointer :: f
    intrinsic :: sqrt
    f => sqrt
  end function myroot
end module mod1

module mod2
  implicit none
  type t
     real :: a = 0.
  end type
  interface sqrt
     module procedure sqrt
  end interface
contains
  elemental function sqrt (a)
    type(t), intent(in) :: a
    type(t)             :: sqrt
    sqrt% a = a% a
  end function sqrt
end module mod2

module mod3
  implicit none
  abstract interface
     function real_func (x)
       real              :: real_func
       real, intent (in) :: x
     end function real_func
  end interface
  intrinsic :: sqrt
  procedure(real_func), pointer :: real_root => sqrt
end module mod3

program test
  use mod1
  use mod2
  use mod3
  implicit none
  type(t) :: x, y
  procedure(sqrt_ifc), pointer :: root
  root => myroot ()
  y    = sqrt (x)
  y% a = sqrt (x% a) + z - w + root (x% a)
  y% a = real_root (x% a)
end program test