source: XIOS/dev/dev_olga/src/ppsrc/interface/fortran_attr/iexpand_domain_attr.f90 @ 1022

Last change on this file since 1022 was 1022, checked in by mhnguyen, 7 years ago
File size: 5.2 KB
Line 
1! * ************************************************************************** *
2! * Interface auto generated - do not modify *
3! * ************************************************************************** *
4
5
6MODULE iexpand_domain_attr
7  USE, INTRINSIC :: ISO_C_BINDING
8  USE iexpand_domain
9  USE expand_domain_interface_attr
10
11CONTAINS
12
13  SUBROUTINE xios_set_expand_domain_attr &
14    ( expand_domain_id, order, type )
15
16    IMPLICIT NONE
17      TYPE(xios_expand_domain) :: expand_domain_hdl
18      CHARACTER(LEN=*), INTENT(IN) ::expand_domain_id
19      INTEGER , OPTIONAL, INTENT(IN) :: order
20      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: type
21
22      CALL xios_get_expand_domain_handle &
23      (expand_domain_id,expand_domain_hdl)
24      CALL xios_set_expand_domain_attr_hdl_ &
25      ( expand_domain_hdl, order, type )
26
27  END SUBROUTINE xios_set_expand_domain_attr
28
29  SUBROUTINE xios_set_expand_domain_attr_hdl &
30    ( expand_domain_hdl, order, type )
31
32    IMPLICIT NONE
33      TYPE(xios_expand_domain) , INTENT(IN) :: expand_domain_hdl
34      INTEGER , OPTIONAL, INTENT(IN) :: order
35      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: type
36
37      CALL xios_set_expand_domain_attr_hdl_ &
38      ( expand_domain_hdl, order, type )
39
40  END SUBROUTINE xios_set_expand_domain_attr_hdl
41
42  SUBROUTINE xios_set_expand_domain_attr_hdl_ &
43    ( expand_domain_hdl, order_, type_ )
44
45    IMPLICIT NONE
46      TYPE(xios_expand_domain) , INTENT(IN) :: expand_domain_hdl
47      INTEGER , OPTIONAL, INTENT(IN) :: order_
48      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: type_
49
50      IF (PRESENT(order_)) THEN
51        CALL cxios_set_expand_domain_order &
52      (expand_domain_hdl%daddr, order_)
53      ENDIF
54
55      IF (PRESENT(type_)) THEN
56        CALL cxios_set_expand_domain_type &
57      (expand_domain_hdl%daddr, type_, len(type_))
58      ENDIF
59
60  END SUBROUTINE xios_set_expand_domain_attr_hdl_
61
62  SUBROUTINE xios_get_expand_domain_attr &
63    ( expand_domain_id, order, type )
64
65    IMPLICIT NONE
66      TYPE(xios_expand_domain) :: expand_domain_hdl
67      CHARACTER(LEN=*), INTENT(IN) ::expand_domain_id
68      INTEGER , OPTIONAL, INTENT(OUT) :: order
69      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: type
70
71      CALL xios_get_expand_domain_handle &
72      (expand_domain_id,expand_domain_hdl)
73      CALL xios_get_expand_domain_attr_hdl_ &
74      ( expand_domain_hdl, order, type )
75
76  END SUBROUTINE xios_get_expand_domain_attr
77
78  SUBROUTINE xios_get_expand_domain_attr_hdl &
79    ( expand_domain_hdl, order, type )
80
81    IMPLICIT NONE
82      TYPE(xios_expand_domain) , INTENT(IN) :: expand_domain_hdl
83      INTEGER , OPTIONAL, INTENT(OUT) :: order
84      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: type
85
86      CALL xios_get_expand_domain_attr_hdl_ &
87      ( expand_domain_hdl, order, type )
88
89  END SUBROUTINE xios_get_expand_domain_attr_hdl
90
91  SUBROUTINE xios_get_expand_domain_attr_hdl_ &
92    ( expand_domain_hdl, order_, type_ )
93
94    IMPLICIT NONE
95      TYPE(xios_expand_domain) , INTENT(IN) :: expand_domain_hdl
96      INTEGER , OPTIONAL, INTENT(OUT) :: order_
97      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: type_
98
99      IF (PRESENT(order_)) THEN
100        CALL cxios_get_expand_domain_order &
101      (expand_domain_hdl%daddr, order_)
102      ENDIF
103
104      IF (PRESENT(type_)) THEN
105        CALL cxios_get_expand_domain_type &
106      (expand_domain_hdl%daddr, type_, len(type_))
107      ENDIF
108
109  END SUBROUTINE xios_get_expand_domain_attr_hdl_
110
111  SUBROUTINE xios_is_defined_expand_domain_attr &
112    ( expand_domain_id, order, type )
113
114    IMPLICIT NONE
115      TYPE(xios_expand_domain) :: expand_domain_hdl
116      CHARACTER(LEN=*), INTENT(IN) ::expand_domain_id
117      LOGICAL, OPTIONAL, INTENT(OUT) :: order
118      LOGICAL(KIND=C_BOOL) :: order_tmp
119      LOGICAL, OPTIONAL, INTENT(OUT) :: type
120      LOGICAL(KIND=C_BOOL) :: type_tmp
121
122      CALL xios_get_expand_domain_handle &
123      (expand_domain_id,expand_domain_hdl)
124      CALL xios_is_defined_expand_domain_attr_hdl_ &
125      ( expand_domain_hdl, order, type )
126
127  END SUBROUTINE xios_is_defined_expand_domain_attr
128
129  SUBROUTINE xios_is_defined_expand_domain_attr_hdl &
130    ( expand_domain_hdl, order, type )
131
132    IMPLICIT NONE
133      TYPE(xios_expand_domain) , INTENT(IN) :: expand_domain_hdl
134      LOGICAL, OPTIONAL, INTENT(OUT) :: order
135      LOGICAL(KIND=C_BOOL) :: order_tmp
136      LOGICAL, OPTIONAL, INTENT(OUT) :: type
137      LOGICAL(KIND=C_BOOL) :: type_tmp
138
139      CALL xios_is_defined_expand_domain_attr_hdl_ &
140      ( expand_domain_hdl, order, type )
141
142  END SUBROUTINE xios_is_defined_expand_domain_attr_hdl
143
144  SUBROUTINE xios_is_defined_expand_domain_attr_hdl_ &
145    ( expand_domain_hdl, order_, type_ )
146
147    IMPLICIT NONE
148      TYPE(xios_expand_domain) , INTENT(IN) :: expand_domain_hdl
149      LOGICAL, OPTIONAL, INTENT(OUT) :: order_
150      LOGICAL(KIND=C_BOOL) :: order__tmp
151      LOGICAL, OPTIONAL, INTENT(OUT) :: type_
152      LOGICAL(KIND=C_BOOL) :: type__tmp
153
154      IF (PRESENT(order_)) THEN
155        order__tmp = cxios_is_defined_expand_domain_order &
156      (expand_domain_hdl%daddr)
157        order_ = order__tmp
158      ENDIF
159
160      IF (PRESENT(type_)) THEN
161        type__tmp = cxios_is_defined_expand_domain_type &
162      (expand_domain_hdl%daddr)
163        type_ = type__tmp
164      ENDIF
165
166  END SUBROUTINE xios_is_defined_expand_domain_attr_hdl_
167
168END MODULE iexpand_domain_attr
Note: See TracBrowser for help on using the repository browser.