UPP  V11.0.0
 All Data Structures Files Functions Pages
io_int_stubs.f
1 ! Stubs version of wrf io spi subroutines
2 !
3 !--- get_dom_ti_real
4 SUBROUTINE ext_int_get_dom_ti_real ( DataHandle,Element, Data, Count, Outcount, Status )
5  INTEGER , INTENT(IN) :: datahandle
6  CHARACTER*(*) :: element
7  REAL , INTENT(OUT) :: data(*)
8  INTEGER , INTENT(IN) :: count
9  INTEGER , INTENT(OUT) :: outcount
10  INTEGER , INTENT(OUT) :: status
11 
12 RETURN
13 END SUBROUTINE ext_int_get_dom_ti_real
14 
15 
16 SUBROUTINE ext_int_get_dom_ti_integer ( DataHandle,Element, Data, Count, Outcount, Status )
17 
18 RETURN
19 END SUBROUTINE ext_int_get_dom_ti_integer
20 
21 
22 !--- get_dom_ti_char
23 SUBROUTINE ext_int_get_dom_ti_char ( DataHandle,Element, Data, Status )
24 
25 RETURN
26 END SUBROUTINE ext_int_get_dom_ti_char
27 
28 
29 !--- get_var_info
30 SUBROUTINE ext_int_get_var_info ( DataHandle , VarName , NDim , MemoryOrder , Stagger , &
31  domainstart , domainend , wrftype, status )
32 
33 RETURN
34 END SUBROUTINE ext_int_get_var_info
35 
36 
37 !--- read_field
38 SUBROUTINE ext_int_read_field ( DataHandle , DateStr , VarName , Field , FieldType , Comm , IOComm, &
39  domaindesc , memoryorder , stagger , dimnames , &
40  domainstart , domainend , &
41  memorystart , memoryend , &
42  patchstart , patchend , &
43  status )
44  RETURN
45 
46 END SUBROUTINE ext_int_read_field
47 
48 
49 !--- close
50 SUBROUTINE ext_int_ioclose ( DataHandle, Status )
51 
52  RETURN
53 END SUBROUTINE ext_int_ioclose
54 
55 
56 !--- initialize
57 SUBROUTINE ext_int_ioinit( SysDepInfo, Status )
58 
59 END SUBROUTINE ext_int_ioinit
60 
61 
62 
63 !--- open_for_read
64 SUBROUTINE ext_int_open_for_read ( FileName , Comm_compute, Comm_io, SysDepInfo, &
65  datahandle , status )
66 
67  RETURN
68 END SUBROUTINE ext_int_open_for_read
69 
70 
71 
72 SUBROUTINE int_get_ti_header_c ( hdrbuf, hdrbufsize, n, itypesize, typesize, &
73  datahandle, Data, count, code )
74 
75 RETURN
76 END SUBROUTINE int_get_ti_header_c
77 
78 
79 ! NETCDF STUBS
80 SUBROUTINE ext_ncd_ioinit(SysDepInfo, Status)
81 
82 RETURN
83 END SUBROUTINE ext_ncd_ioinit
84 
85 
86 subroutine ext_ncd_open_for_read(DatasetName, Comm1, Comm2, SysDepInfo, DataHandle, Status)
87 
88 RETURN
89 END subroutine ext_ncd_open_for_read
90 
91 
92 subroutine ext_ncd_get_dom_ti_integer(DataHandle,Element,Data,Count,OutCount,Status)
93 
94 RETURN
95 END subroutine ext_ncd_get_dom_ti_integer
96 
97 
98 subroutine ext_ncd_ioclose(DataHandle, Status)
99 
100  return
101 end subroutine ext_ncd_ioclose
102 
103 
104 subroutine ext_ncd_get_dom_ti_char(DataHandle,Element,Data,Status)
105 
106  return
107 end subroutine ext_ncd_get_dom_ti_char
108 
109 
110 subroutine ext_ncd_get_dom_ti_real(DataHandle,Element,Data,Count,Status)
111 
112  return
113 end subroutine ext_ncd_get_dom_ti_real
114 
115 
116 subroutine ext_ncd_get_var_info(DataHandle,Name,NDim,MemoryOrder, &
117  stagger,domainstart,domainend,wrftype,status)
118 
119  return
120 end subroutine ext_ncd_get_var_info
121 
122 
123 subroutine ext_ncd_read_field(DataHandle,DateStr,Var,Field,FieldType,Comm, &
124  iocomm, domaindesc, memoryordin, stagger, dimnames, &
125  domainstart,domainend,memorystart,memoryend,patchstart,patchend,status)
126 
127  return
128 end subroutine ext_ncd_read_field
129 
130 
131 subroutine wrf_error_fatal(massage)
132 
133 stop
134 end subroutine wrf_error_fatal
135 
136 
137 subroutine int_gen_ti_header_c ( hdrbuf, hdrbufsize, itypesize, typesize, &
138  datahandle, Data, count, code )
139  RETURN
140 END SUBROUTINE int_gen_ti_header_c
141 
142 
143 
144 
145 
146 
147