aboutsummaryrefslogtreecommitdiffstats
path: root/gcc-4.9/gcc/testsuite/gfortran.dg/entry_14.f90
blob: dfed19549f7a05ad06578f928475c225d27c59b0 (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
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
! { dg-do run }
! 
! PR fortran/34137
!
! Entry was previously not possible in a module.
! Checks also whether the different result combinations
! work properly.
!
module m1
  implicit none
contains
function func(a)
  implicit none
  integer :: a, func
  real :: ent
  func = a*4
  return
entry ent(a)
  ent = -a*2.0
  return
end function func
end module m1

module m2
  implicit none
contains
function func(a)
  implicit none
  integer :: a, func
  real :: func2
  func = a*8
  return
entry ent(a) result(func2)
  func2 = -a*4.0
  return
end function func
end module m2

module m3
  implicit none
contains
function func(a) result(res)
  implicit none
  integer :: a, res
  real :: func2
  res = a*12
  return
entry ent(a) result(func2)
  func2 = -a*6.0
  return
end function func
end module m3


module m4
  implicit none
contains
function func(a) result(res)
  implicit none
  integer :: a, res
  real :: ent
  res = a*16
  return
entry ent(a)
  ent = -a*8.0
  return
end function func
end module m4

program main
  implicit none
  call test1()
  call test2()
  call test3()
  call test4()
contains
  subroutine test1()
    use m1
    implicit none
    if(func(3) /= 12) call abort()
    if(abs(ent(7) + 14.0) > tiny(1.0)) call abort()
  end subroutine test1
  subroutine test2()
    use m2
    implicit none
    if(func(9) /= 72) call abort()
    if(abs(ent(11) + 44.0) > tiny(1.0)) call abort()
  end subroutine test2
  subroutine test3()
    use m3
    implicit none
    if(func(13) /= 156) call abort()
    if(abs(ent(17) + 102.0) > tiny(1.0)) call abort()
  end subroutine test3
  subroutine test4()
    use m4
    implicit none
    if(func(23) /= 368) call abort()
    if(abs(ent(27) + 216.0) > tiny(1.0)) call abort()
  end subroutine test4
end program main