source: XIOS/dev/branch_openmp/src/interface/fortran_attr/iinterpolate_domain_attr.F90 @ 1545

Last change on this file since 1545 was 1545, checked in by yushan, 6 years ago

branch_openmp merged with trunk r1544

File size: 16.2 KB
Line 
1! * ************************************************************************** *
2! *               Interface auto generated - do not modify                     *
3! * ************************************************************************** *
4#include "xios_fortran_prefix.hpp"
5
6MODULE iinterpolate_domain_attr
7  USE, INTRINSIC :: ISO_C_BINDING
8  USE iinterpolate_domain
9  USE interpolate_domain_interface_attr
10
11CONTAINS
12
13  SUBROUTINE xios(set_interpolate_domain_attr)  &
14    ( interpolate_domain_id, detect_missing_value, mode, order, quantity, read_write_convention  &
15    , renormalize, weight_filename, write_weight )
16
17    IMPLICIT NONE
18      TYPE(txios(interpolate_domain))  :: interpolate_domain_hdl
19      CHARACTER(LEN=*), INTENT(IN) ::interpolate_domain_id
20      LOGICAL  , OPTIONAL, INTENT(IN) :: detect_missing_value
21      LOGICAL (KIND=C_BOOL) :: detect_missing_value_tmp
22      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: mode
23      INTEGER  , OPTIONAL, INTENT(IN) :: order
24      LOGICAL  , OPTIONAL, INTENT(IN) :: quantity
25      LOGICAL (KIND=C_BOOL) :: quantity_tmp
26      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: read_write_convention
27      LOGICAL  , OPTIONAL, INTENT(IN) :: renormalize
28      LOGICAL (KIND=C_BOOL) :: renormalize_tmp
29      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: weight_filename
30      LOGICAL  , OPTIONAL, INTENT(IN) :: write_weight
31      LOGICAL (KIND=C_BOOL) :: write_weight_tmp
32
33      CALL xios(get_interpolate_domain_handle) &
34      (interpolate_domain_id,interpolate_domain_hdl)
35      CALL xios(set_interpolate_domain_attr_hdl_)   &
36      ( interpolate_domain_hdl, detect_missing_value, mode, order, quantity, read_write_convention  &
37      , renormalize, weight_filename, write_weight )
38
39  END SUBROUTINE xios(set_interpolate_domain_attr)
40
41  SUBROUTINE xios(set_interpolate_domain_attr_hdl)  &
42    ( interpolate_domain_hdl, detect_missing_value, mode, order, quantity, read_write_convention  &
43    , renormalize, weight_filename, write_weight )
44
45    IMPLICIT NONE
46      TYPE(txios(interpolate_domain)) , INTENT(IN) :: interpolate_domain_hdl
47      LOGICAL  , OPTIONAL, INTENT(IN) :: detect_missing_value
48      LOGICAL (KIND=C_BOOL) :: detect_missing_value_tmp
49      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: mode
50      INTEGER  , OPTIONAL, INTENT(IN) :: order
51      LOGICAL  , OPTIONAL, INTENT(IN) :: quantity
52      LOGICAL (KIND=C_BOOL) :: quantity_tmp
53      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: read_write_convention
54      LOGICAL  , OPTIONAL, INTENT(IN) :: renormalize
55      LOGICAL (KIND=C_BOOL) :: renormalize_tmp
56      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: weight_filename
57      LOGICAL  , OPTIONAL, INTENT(IN) :: write_weight
58      LOGICAL (KIND=C_BOOL) :: write_weight_tmp
59
60      CALL xios(set_interpolate_domain_attr_hdl_)  &
61      ( interpolate_domain_hdl, detect_missing_value, mode, order, quantity, read_write_convention  &
62      , renormalize, weight_filename, write_weight )
63
64  END SUBROUTINE xios(set_interpolate_domain_attr_hdl)
65
66  SUBROUTINE xios(set_interpolate_domain_attr_hdl_)   &
67    ( interpolate_domain_hdl, detect_missing_value_, mode_, order_, quantity_, read_write_convention_  &
68    , renormalize_, weight_filename_, write_weight_ )
69
70    IMPLICIT NONE
71      TYPE(txios(interpolate_domain)) , INTENT(IN) :: interpolate_domain_hdl
72      LOGICAL  , OPTIONAL, INTENT(IN) :: detect_missing_value_
73      LOGICAL (KIND=C_BOOL) :: detect_missing_value__tmp
74      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: mode_
75      INTEGER  , OPTIONAL, INTENT(IN) :: order_
76      LOGICAL  , OPTIONAL, INTENT(IN) :: quantity_
77      LOGICAL (KIND=C_BOOL) :: quantity__tmp
78      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: read_write_convention_
79      LOGICAL  , OPTIONAL, INTENT(IN) :: renormalize_
80      LOGICAL (KIND=C_BOOL) :: renormalize__tmp
81      CHARACTER(len = *) , OPTIONAL, INTENT(IN) :: weight_filename_
82      LOGICAL  , OPTIONAL, INTENT(IN) :: write_weight_
83      LOGICAL (KIND=C_BOOL) :: write_weight__tmp
84
85      IF (PRESENT(detect_missing_value_)) THEN
86        detect_missing_value__tmp = detect_missing_value_
87        CALL cxios_set_interpolate_domain_detect_missing_value &
88      (interpolate_domain_hdl%daddr, detect_missing_value__tmp)
89      ENDIF
90
91      IF (PRESENT(mode_)) THEN
92        CALL cxios_set_interpolate_domain_mode &
93      (interpolate_domain_hdl%daddr, mode_, len(mode_))
94      ENDIF
95
96      IF (PRESENT(order_)) THEN
97        CALL cxios_set_interpolate_domain_order &
98      (interpolate_domain_hdl%daddr, order_)
99      ENDIF
100
101      IF (PRESENT(quantity_)) THEN
102        quantity__tmp = quantity_
103        CALL cxios_set_interpolate_domain_quantity &
104      (interpolate_domain_hdl%daddr, quantity__tmp)
105      ENDIF
106
107      IF (PRESENT(read_write_convention_)) THEN
108        CALL cxios_set_interpolate_domain_read_write_convention &
109      (interpolate_domain_hdl%daddr, read_write_convention_, len(read_write_convention_))
110      ENDIF
111
112      IF (PRESENT(renormalize_)) THEN
113        renormalize__tmp = renormalize_
114        CALL cxios_set_interpolate_domain_renormalize &
115      (interpolate_domain_hdl%daddr, renormalize__tmp)
116      ENDIF
117
118      IF (PRESENT(weight_filename_)) THEN
119        CALL cxios_set_interpolate_domain_weight_filename &
120      (interpolate_domain_hdl%daddr, weight_filename_, len(weight_filename_))
121      ENDIF
122
123      IF (PRESENT(write_weight_)) THEN
124        write_weight__tmp = write_weight_
125        CALL cxios_set_interpolate_domain_write_weight &
126      (interpolate_domain_hdl%daddr, write_weight__tmp)
127      ENDIF
128
129  END SUBROUTINE xios(set_interpolate_domain_attr_hdl_)
130
131  SUBROUTINE xios(get_interpolate_domain_attr)  &
132    ( interpolate_domain_id, detect_missing_value, mode, order, quantity, read_write_convention  &
133    , renormalize, weight_filename, write_weight )
134
135    IMPLICIT NONE
136      TYPE(txios(interpolate_domain))  :: interpolate_domain_hdl
137      CHARACTER(LEN=*), INTENT(IN) ::interpolate_domain_id
138      LOGICAL  , OPTIONAL, INTENT(OUT) :: detect_missing_value
139      LOGICAL (KIND=C_BOOL) :: detect_missing_value_tmp
140      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: mode
141      INTEGER  , OPTIONAL, INTENT(OUT) :: order
142      LOGICAL  , OPTIONAL, INTENT(OUT) :: quantity
143      LOGICAL (KIND=C_BOOL) :: quantity_tmp
144      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: read_write_convention
145      LOGICAL  , OPTIONAL, INTENT(OUT) :: renormalize
146      LOGICAL (KIND=C_BOOL) :: renormalize_tmp
147      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: weight_filename
148      LOGICAL  , OPTIONAL, INTENT(OUT) :: write_weight
149      LOGICAL (KIND=C_BOOL) :: write_weight_tmp
150
151      CALL xios(get_interpolate_domain_handle) &
152      (interpolate_domain_id,interpolate_domain_hdl)
153      CALL xios(get_interpolate_domain_attr_hdl_)   &
154      ( interpolate_domain_hdl, detect_missing_value, mode, order, quantity, read_write_convention  &
155      , renormalize, weight_filename, write_weight )
156
157  END SUBROUTINE xios(get_interpolate_domain_attr)
158
159  SUBROUTINE xios(get_interpolate_domain_attr_hdl)  &
160    ( interpolate_domain_hdl, detect_missing_value, mode, order, quantity, read_write_convention  &
161    , renormalize, weight_filename, write_weight )
162
163    IMPLICIT NONE
164      TYPE(txios(interpolate_domain)) , INTENT(IN) :: interpolate_domain_hdl
165      LOGICAL  , OPTIONAL, INTENT(OUT) :: detect_missing_value
166      LOGICAL (KIND=C_BOOL) :: detect_missing_value_tmp
167      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: mode
168      INTEGER  , OPTIONAL, INTENT(OUT) :: order
169      LOGICAL  , OPTIONAL, INTENT(OUT) :: quantity
170      LOGICAL (KIND=C_BOOL) :: quantity_tmp
171      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: read_write_convention
172      LOGICAL  , OPTIONAL, INTENT(OUT) :: renormalize
173      LOGICAL (KIND=C_BOOL) :: renormalize_tmp
174      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: weight_filename
175      LOGICAL  , OPTIONAL, INTENT(OUT) :: write_weight
176      LOGICAL (KIND=C_BOOL) :: write_weight_tmp
177
178      CALL xios(get_interpolate_domain_attr_hdl_)  &
179      ( interpolate_domain_hdl, detect_missing_value, mode, order, quantity, read_write_convention  &
180      , renormalize, weight_filename, write_weight )
181
182  END SUBROUTINE xios(get_interpolate_domain_attr_hdl)
183
184  SUBROUTINE xios(get_interpolate_domain_attr_hdl_)   &
185    ( interpolate_domain_hdl, detect_missing_value_, mode_, order_, quantity_, read_write_convention_  &
186    , renormalize_, weight_filename_, write_weight_ )
187
188    IMPLICIT NONE
189      TYPE(txios(interpolate_domain)) , INTENT(IN) :: interpolate_domain_hdl
190      LOGICAL  , OPTIONAL, INTENT(OUT) :: detect_missing_value_
191      LOGICAL (KIND=C_BOOL) :: detect_missing_value__tmp
192      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: mode_
193      INTEGER  , OPTIONAL, INTENT(OUT) :: order_
194      LOGICAL  , OPTIONAL, INTENT(OUT) :: quantity_
195      LOGICAL (KIND=C_BOOL) :: quantity__tmp
196      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: read_write_convention_
197      LOGICAL  , OPTIONAL, INTENT(OUT) :: renormalize_
198      LOGICAL (KIND=C_BOOL) :: renormalize__tmp
199      CHARACTER(len = *) , OPTIONAL, INTENT(OUT) :: weight_filename_
200      LOGICAL  , OPTIONAL, INTENT(OUT) :: write_weight_
201      LOGICAL (KIND=C_BOOL) :: write_weight__tmp
202
203      IF (PRESENT(detect_missing_value_)) THEN
204        CALL cxios_get_interpolate_domain_detect_missing_value &
205      (interpolate_domain_hdl%daddr, detect_missing_value__tmp)
206        detect_missing_value_ = detect_missing_value__tmp
207      ENDIF
208
209      IF (PRESENT(mode_)) THEN
210        CALL cxios_get_interpolate_domain_mode &
211      (interpolate_domain_hdl%daddr, mode_, len(mode_))
212      ENDIF
213
214      IF (PRESENT(order_)) THEN
215        CALL cxios_get_interpolate_domain_order &
216      (interpolate_domain_hdl%daddr, order_)
217      ENDIF
218
219      IF (PRESENT(quantity_)) THEN
220        CALL cxios_get_interpolate_domain_quantity &
221      (interpolate_domain_hdl%daddr, quantity__tmp)
222        quantity_ = quantity__tmp
223      ENDIF
224
225      IF (PRESENT(read_write_convention_)) THEN
226        CALL cxios_get_interpolate_domain_read_write_convention &
227      (interpolate_domain_hdl%daddr, read_write_convention_, len(read_write_convention_))
228      ENDIF
229
230      IF (PRESENT(renormalize_)) THEN
231        CALL cxios_get_interpolate_domain_renormalize &
232      (interpolate_domain_hdl%daddr, renormalize__tmp)
233        renormalize_ = renormalize__tmp
234      ENDIF
235
236      IF (PRESENT(weight_filename_)) THEN
237        CALL cxios_get_interpolate_domain_weight_filename &
238      (interpolate_domain_hdl%daddr, weight_filename_, len(weight_filename_))
239      ENDIF
240
241      IF (PRESENT(write_weight_)) THEN
242        CALL cxios_get_interpolate_domain_write_weight &
243      (interpolate_domain_hdl%daddr, write_weight__tmp)
244        write_weight_ = write_weight__tmp
245      ENDIF
246
247  END SUBROUTINE xios(get_interpolate_domain_attr_hdl_)
248
249  SUBROUTINE xios(is_defined_interpolate_domain_attr)  &
250    ( interpolate_domain_id, detect_missing_value, mode, order, quantity, read_write_convention  &
251    , renormalize, weight_filename, write_weight )
252
253    IMPLICIT NONE
254      TYPE(txios(interpolate_domain))  :: interpolate_domain_hdl
255      CHARACTER(LEN=*), INTENT(IN) ::interpolate_domain_id
256      LOGICAL, OPTIONAL, INTENT(OUT) :: detect_missing_value
257      LOGICAL(KIND=C_BOOL) :: detect_missing_value_tmp
258      LOGICAL, OPTIONAL, INTENT(OUT) :: mode
259      LOGICAL(KIND=C_BOOL) :: mode_tmp
260      LOGICAL, OPTIONAL, INTENT(OUT) :: order
261      LOGICAL(KIND=C_BOOL) :: order_tmp
262      LOGICAL, OPTIONAL, INTENT(OUT) :: quantity
263      LOGICAL(KIND=C_BOOL) :: quantity_tmp
264      LOGICAL, OPTIONAL, INTENT(OUT) :: read_write_convention
265      LOGICAL(KIND=C_BOOL) :: read_write_convention_tmp
266      LOGICAL, OPTIONAL, INTENT(OUT) :: renormalize
267      LOGICAL(KIND=C_BOOL) :: renormalize_tmp
268      LOGICAL, OPTIONAL, INTENT(OUT) :: weight_filename
269      LOGICAL(KIND=C_BOOL) :: weight_filename_tmp
270      LOGICAL, OPTIONAL, INTENT(OUT) :: write_weight
271      LOGICAL(KIND=C_BOOL) :: write_weight_tmp
272
273      CALL xios(get_interpolate_domain_handle) &
274      (interpolate_domain_id,interpolate_domain_hdl)
275      CALL xios(is_defined_interpolate_domain_attr_hdl_)   &
276      ( interpolate_domain_hdl, detect_missing_value, mode, order, quantity, read_write_convention  &
277      , renormalize, weight_filename, write_weight )
278
279  END SUBROUTINE xios(is_defined_interpolate_domain_attr)
280
281  SUBROUTINE xios(is_defined_interpolate_domain_attr_hdl)  &
282    ( interpolate_domain_hdl, detect_missing_value, mode, order, quantity, read_write_convention  &
283    , renormalize, weight_filename, write_weight )
284
285    IMPLICIT NONE
286      TYPE(txios(interpolate_domain)) , INTENT(IN) :: interpolate_domain_hdl
287      LOGICAL, OPTIONAL, INTENT(OUT) :: detect_missing_value
288      LOGICAL(KIND=C_BOOL) :: detect_missing_value_tmp
289      LOGICAL, OPTIONAL, INTENT(OUT) :: mode
290      LOGICAL(KIND=C_BOOL) :: mode_tmp
291      LOGICAL, OPTIONAL, INTENT(OUT) :: order
292      LOGICAL(KIND=C_BOOL) :: order_tmp
293      LOGICAL, OPTIONAL, INTENT(OUT) :: quantity
294      LOGICAL(KIND=C_BOOL) :: quantity_tmp
295      LOGICAL, OPTIONAL, INTENT(OUT) :: read_write_convention
296      LOGICAL(KIND=C_BOOL) :: read_write_convention_tmp
297      LOGICAL, OPTIONAL, INTENT(OUT) :: renormalize
298      LOGICAL(KIND=C_BOOL) :: renormalize_tmp
299      LOGICAL, OPTIONAL, INTENT(OUT) :: weight_filename
300      LOGICAL(KIND=C_BOOL) :: weight_filename_tmp
301      LOGICAL, OPTIONAL, INTENT(OUT) :: write_weight
302      LOGICAL(KIND=C_BOOL) :: write_weight_tmp
303
304      CALL xios(is_defined_interpolate_domain_attr_hdl_)  &
305      ( interpolate_domain_hdl, detect_missing_value, mode, order, quantity, read_write_convention  &
306      , renormalize, weight_filename, write_weight )
307
308  END SUBROUTINE xios(is_defined_interpolate_domain_attr_hdl)
309
310  SUBROUTINE xios(is_defined_interpolate_domain_attr_hdl_)   &
311    ( interpolate_domain_hdl, detect_missing_value_, mode_, order_, quantity_, read_write_convention_  &
312    , renormalize_, weight_filename_, write_weight_ )
313
314    IMPLICIT NONE
315      TYPE(txios(interpolate_domain)) , INTENT(IN) :: interpolate_domain_hdl
316      LOGICAL, OPTIONAL, INTENT(OUT) :: detect_missing_value_
317      LOGICAL(KIND=C_BOOL) :: detect_missing_value__tmp
318      LOGICAL, OPTIONAL, INTENT(OUT) :: mode_
319      LOGICAL(KIND=C_BOOL) :: mode__tmp
320      LOGICAL, OPTIONAL, INTENT(OUT) :: order_
321      LOGICAL(KIND=C_BOOL) :: order__tmp
322      LOGICAL, OPTIONAL, INTENT(OUT) :: quantity_
323      LOGICAL(KIND=C_BOOL) :: quantity__tmp
324      LOGICAL, OPTIONAL, INTENT(OUT) :: read_write_convention_
325      LOGICAL(KIND=C_BOOL) :: read_write_convention__tmp
326      LOGICAL, OPTIONAL, INTENT(OUT) :: renormalize_
327      LOGICAL(KIND=C_BOOL) :: renormalize__tmp
328      LOGICAL, OPTIONAL, INTENT(OUT) :: weight_filename_
329      LOGICAL(KIND=C_BOOL) :: weight_filename__tmp
330      LOGICAL, OPTIONAL, INTENT(OUT) :: write_weight_
331      LOGICAL(KIND=C_BOOL) :: write_weight__tmp
332
333      IF (PRESENT(detect_missing_value_)) THEN
334        detect_missing_value__tmp = cxios_is_defined_interpolate_domain_detect_missing_value &
335      (interpolate_domain_hdl%daddr)
336        detect_missing_value_ = detect_missing_value__tmp
337      ENDIF
338
339      IF (PRESENT(mode_)) THEN
340        mode__tmp = cxios_is_defined_interpolate_domain_mode &
341      (interpolate_domain_hdl%daddr)
342        mode_ = mode__tmp
343      ENDIF
344
345      IF (PRESENT(order_)) THEN
346        order__tmp = cxios_is_defined_interpolate_domain_order &
347      (interpolate_domain_hdl%daddr)
348        order_ = order__tmp
349      ENDIF
350
351      IF (PRESENT(quantity_)) THEN
352        quantity__tmp = cxios_is_defined_interpolate_domain_quantity &
353      (interpolate_domain_hdl%daddr)
354        quantity_ = quantity__tmp
355      ENDIF
356
357      IF (PRESENT(read_write_convention_)) THEN
358        read_write_convention__tmp = cxios_is_defined_interpolate_domain_read_write_convention &
359      (interpolate_domain_hdl%daddr)
360        read_write_convention_ = read_write_convention__tmp
361      ENDIF
362
363      IF (PRESENT(renormalize_)) THEN
364        renormalize__tmp = cxios_is_defined_interpolate_domain_renormalize &
365      (interpolate_domain_hdl%daddr)
366        renormalize_ = renormalize__tmp
367      ENDIF
368
369      IF (PRESENT(weight_filename_)) THEN
370        weight_filename__tmp = cxios_is_defined_interpolate_domain_weight_filename &
371      (interpolate_domain_hdl%daddr)
372        weight_filename_ = weight_filename__tmp
373      ENDIF
374
375      IF (PRESENT(write_weight_)) THEN
376        write_weight__tmp = cxios_is_defined_interpolate_domain_write_weight &
377      (interpolate_domain_hdl%daddr)
378        write_weight_ = write_weight__tmp
379      ENDIF
380
381  END SUBROUTINE xios(is_defined_interpolate_domain_attr_hdl_)
382
383END MODULE iinterpolate_domain_attr
Note: See TracBrowser for help on using the repository browser.