File: bindings06.f90

package info (click to toggle)
llvm-toolchain-20 1%3A20.1.8-1
  • links: PTS, VCS
  • area: main
  • in suites: experimental
  • size: 2,111,696 kB
  • sloc: cpp: 7,438,781; ansic: 1,393,871; asm: 1,012,926; python: 241,771; f90: 86,635; objc: 75,411; lisp: 42,144; pascal: 17,286; sh: 8,596; ml: 5,082; perl: 4,730; makefile: 3,591; awk: 3,523; javascript: 2,251; xml: 892; fortran: 672
file content (81 lines) | stat: -rw-r--r-- 2,660 bytes parent folder | download | duplicates (14)
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
! RUN: %flang_fc1 -fdebug-dump-symbols %s 2>&1 | FileCheck %s
module ma
  type a
   contains
    procedure, private, nopass :: tbp_private => sub_a1
    procedure, public, nopass :: tbp_public => sub_a2
    generic, public :: gen => tbp_private, tbp_public
  end type
 contains
  subroutine sub_a1(w)
    character*(*), intent(in) :: w
    print *, w, ' -> a1'
  end
  subroutine sub_a2(w, j)
    character*(*), intent(in) :: w
    integer, intent(in) :: j
    print *, w, ' -> a2'
  end
  subroutine test_mono_a
    type(a) x
    call x%tbp_private('type(a) tbp_private')
    call x%tbp_public('type(a) tbp_public', 0)
    call x%gen('type(a) gen 1')
    call x%gen('type(a) gen 2', 0)
  end
  subroutine test_poly_a(x, w)
    class(a), intent(in) :: x
    character*(*), intent(in) :: w
    call x%tbp_private('class(a) (' // w // ') tbp_private')
    call x%tbp_public('class(a) (' // w // ') tbp_public', 0)
    call x%gen('class(a) (' // w // ') gen 1')
    call x%gen('class(a) (' // w // ') gen 2', 0)
  end
end

module mb
  use ma
  type, extends(a) :: ab
   contains
    procedure, private, nopass :: tbp_private => sub_ab1
    procedure, public, nopass :: tbp_public => sub_ab2
  end type
 contains
  subroutine sub_ab1(w)
    character*(*), intent(in) :: w
    print *, w, ' -> ab1'
  end
  subroutine sub_ab2(w, j)
    character*(*), intent(in) :: w
    integer, intent(in) :: j
    print *, w, ' -> ab2'
  end
  subroutine test_mono_ab
    type(ab) x
    call x%tbp_private('type(ab) tbp_private')
    call x%tbp_public('type(ab) tbp_public', 0)
    call x%gen('type(ab) gen 1')
    call x%gen('type(ab) gen 2', 0)
  end
  subroutine test_poly_ab(x, w)
    class(ab), intent(in) :: x
    character*(*), intent(in) :: w
    call x%tbp_private('class(ab) (' // w // ') tbp_private')
    call x%tbp_public('class(ab) (' // w // ') tbp_public', 0)
    call x%gen('class(ab) (' // w // ') gen 1')
    call x%gen('class(ab) (' // w // ') gen 2', 0)
  end
end

program main
  use mb
  call test_mono_a
  call test_mono_ab
  call test_poly_a(a(), 'a')
  call test_poly_a(ab(), 'ab')
  call test_poly_ab(ab(), 'ab')
end

!CHECK: .v.a, SAVE, TARGET (CompilerCreated, ReadOnly): ObjectEntity type: TYPE(binding) shape: 0_8:1_8 init:[binding::binding(proc=sub_a1,name=.n.tbp_private),binding(proc=sub_a2,name=.n.tbp_public)]
!CHECK: .v.ab, SAVE, TARGET (CompilerCreated, ReadOnly): ObjectEntity type: TYPE(binding) shape: 0_8:2_8 init:[binding::binding(proc=sub_a1,name=.n.tbp_private),binding(proc=sub_ab2,name=.n.tbp_public),binding(proc=sub_ab1,name=.n.tbp_private)]
!CHECK: tbp_private, NOPASS, PRIVATE: ProcBinding => sub_ab1 numPrivatesNotOverridden: 1