source: palm/trunk/SOURCE/data_output_3d.f90 @ 2031

Last change on this file since 2031 was 2031, checked in by knoop, 7 years ago

Renamed variable rho to rho_ocean, rho_init to rho_ocean_init and rho_av to rho_ocean_av

  • Property svn:keywords set to Id
File size: 24.8 KB
Line 
1!> @file data_output_3d.f90
2!------------------------------------------------------------------------------!
3! This file is part of PALM.
4!
5! PALM is free software: you can redistribute it and/or modify it under the
6! terms of the GNU General Public License as published by the Free Software
7! Foundation, either version 3 of the License, or (at your option) any later
8! version.
9!
10! PALM is distributed in the hope that it will be useful, but WITHOUT ANY
11! WARRANTY; without even the implied warranty of MERCHANTABILITY or FITNESS FOR
12! A PARTICULAR PURPOSE.  See the GNU General Public License for more details.
13!
14! You should have received a copy of the GNU General Public License along with
15! PALM. If not, see <http://www.gnu.org/licenses/>.
16!
17! Copyright 1997-2016 Leibniz Universitaet Hannover
18!------------------------------------------------------------------------------!
19!
20! Current revisions:
21! ------------------
22! renamed variable rho to rho_ocean and rho_av to rho_ocean_av
23!
24! Former revisions:
25! -----------------
26! $Id: data_output_3d.f90 2031 2016-10-21 15:11:58Z knoop $
27!
28! 2011 2016-09-19 17:29:57Z kanani
29! Flag urban_surface is now defined in module control_parameters,
30! changed prefix for urban surface model output to "usm_",
31! introduced control parameter varnamelength for LEN of trimvar.
32!
33! 2007 2016-08-24 15:47:17Z kanani
34! Added support for new urban surface model (temporary modifications of
35! SELECT CASE ( ) necessary, see variable trimvar)
36!
37! 2000 2016-08-20 18:09:15Z knoop
38! Forced header and separation lines into 80 columns
39!
40! 1980 2016-07-29 15:51:57Z suehring
41! Bugfix, in order to steer user-defined output, setting flag found explicitly
42! to .F.
43!
44! 1976 2016-07-27 13:28:04Z maronga
45! Output of radiation quantities is now done directly in the respective module
46!
47! 1972 2016-07-26 07:52:02Z maronga
48! Output of land surface quantities is now done directly in the respective module.
49! Unnecessary directive __parallel removed.
50!
51! 1960 2016-07-12 16:34:24Z suehring
52! Scalar surface flux added
53!
54! 1849 2016-04-08 11:33:18Z hoffmann
55! prr moved to arrays_3d
56!
57! 1822 2016-04-07 07:49:42Z hoffmann
58! prr vertical dimensions set to nzb_do to nzt_do. Unused variables deleted.
59!
60! 1808 2016-04-05 19:44:00Z raasch
61! test output removed
62!
63! 1783 2016-03-06 18:36:17Z raasch
64! name change of netcdf routines and module + related changes
65!
66! 1745 2016-02-05 13:06:51Z gronemeier
67! Bugfix: test if time axis limit exceeds moved to point after call of check_open
68!
69! 1691 2015-10-26 16:17:44Z maronga
70! Added output of radiative heating rates for RRTMG
71!
72! 1682 2015-10-07 23:56:08Z knoop
73! Code annotations made doxygen readable
74!
75! 1585 2015-04-30 07:05:52Z maronga
76! Added support for RRTMG
77!
78! 1551 2015-03-03 14:18:16Z maronga
79! Added suppport for land surface model and radiation model output. In the course
80! of this action, the limits for vertical loops have been changed (from nzb and
81! nzt+1 to nzb_do and nzt_do, respectively in order to allow soil model output).
82! Moreover, a new vertical grid zs was introduced.
83!
84! 1359 2014-04-11 17:15:14Z hoffmann
85! New particle structure integrated.
86!
87! 1353 2014-04-08 15:21:23Z heinze
88! REAL constants provided with KIND-attribute
89!
90! 1327 2014-03-21 11:00:16Z raasch
91! parts concerning avs output removed,
92! -netcdf output queries
93!
94! 1320 2014-03-20 08:40:49Z raasch
95! ONLY-attribute added to USE-statements,
96! kind-parameters added to all INTEGER and REAL declaration statements,
97! kinds are defined in new module kinds,
98! old module precision_kind is removed,
99! revision history before 2012 removed,
100! comment fields (!:) to be used for variable explanations added to
101! all variable declaration statements
102!
103! 1318 2014-03-17 13:35:16Z raasch
104! barrier argument removed from cpu_log,
105! module interfaces removed
106!
107! 1308 2014-03-13 14:58:42Z fricke
108! Check, if the limit of the time dimension is exceeded for parallel output
109! To increase the performance for parallel output, the following is done:
110! - Update of time axis is only done by PE0
111!
112! 1244 2013-10-31 08:16:56Z raasch
113! Bugfix for index bounds in case of 3d-parallel output
114!
115! 1115 2013-03-26 18:16:16Z hoffmann
116! ql is calculated by calc_liquid_water_content
117!
118! 1106 2013-03-04 05:31:38Z raasch
119! array_kind renamed precision_kind
120!
121! 1076 2012-12-05 08:30:18Z hoffmann
122! Bugfix in output of ql
123!
124! 1053 2012-11-13 17:11:03Z hoffmann
125! +nr, qr, prr, qc and averaged quantities
126!
127! 1036 2012-10-22 13:43:42Z raasch
128! code put under GPL (PALM 3.9)
129!
130! 1031 2012-10-19 14:35:30Z raasch
131! netCDF4 without parallel file support implemented
132!
133! 1007 2012-09-19 14:30:36Z franke
134! Bugfix: missing calculation of ql_vp added
135!
136! Revision 1.1  1997/09/03 06:29:36  raasch
137! Initial revision
138!
139!
140! Description:
141! ------------
142!> Output of the 3D-arrays in netCDF and/or AVS format.
143!------------------------------------------------------------------------------!
144 SUBROUTINE data_output_3d( av )
145 
146
147    USE arrays_3d,                                                             &
148        ONLY:  e, nr, p, pt, prr, q, qc, ql, ql_c, ql_v, qr, rho_ocean, s, sa, tend, &
149               u, v, vpt, w
150       
151    USE averaging
152       
153    USE cloud_parameters,                                                      &
154        ONLY:  l_d_cp, pt_d_t
155       
156    USE control_parameters,                                                    &
157        ONLY:  cloud_physics, do3d, do3d_no, do3d_time_count, io_blocks,       &
158               io_group, message_string, ntdim_3d, nz_do3d, psolver,           &
159               simulated_time, time_since_reference_point, urban_surface,      &
160               varnamelength
161       
162    USE cpulog,                                                                &
163        ONLY:  log_point, cpu_log
164       
165    USE indices,                                                               &
166        ONLY:  nbgp, nx, nxl, nxlg, nxr, nxrg, ny, nyn, nyng, nys, nysg, nzb
167       
168    USE kinds
169   
170    USE land_surface_model_mod,                                                &
171        ONLY: land_surface, lsm_data_output_3d, nzb_soil, nzt_soil
172
173#if defined( __netcdf )
174    USE NETCDF
175#endif
176
177    USE netcdf_interface,                                                      &
178        ONLY:  id_set_3d, id_var_do3d, id_var_time_3d, nc_stat,                &
179               netcdf_data_format, netcdf_handle_error
180       
181    USE particle_attributes,                                                   &
182        ONLY:  grid_particles, number_of_particles, particles,                 &
183               particle_advection_start, prt_count
184       
185    USE pegrid
186
187    USE radiation_model_mod,                                                   &
188        ONLY:  radiation, radiation_data_output_3d
189
190    USE urban_surface_mod,                                                     &
191        ONLY:  nzub, nzut, usm_data_output_3d
192
193
194    IMPLICIT NONE
195
196    INTEGER(iwp) ::  av        !<
197    INTEGER(iwp) ::  i         !<
198    INTEGER(iwp) ::  if        !<
199    INTEGER(iwp) ::  j         !<
200    INTEGER(iwp) ::  k         !<
201    INTEGER(iwp) ::  n         !<
202    INTEGER(iwp) ::  nzb_do    !< vertical lower limit for data output
203    INTEGER(iwp) ::  nzt_do    !< vertical upper limit for data output
204
205    LOGICAL      ::  found     !<
206    LOGICAL      ::  resorted  !<
207
208    REAL(wp)     ::  mean_r    !<
209    REAL(wp)     ::  s_r2      !<
210    REAL(wp)     ::  s_r3      !<
211
212    REAL(sp), DIMENSION(:,:,:), ALLOCATABLE ::  local_pf  !<
213
214    REAL(wp), DIMENSION(:,:,:), POINTER ::  to_be_resorted  !<
215
216    CHARACTER (LEN=varnamelength) ::  trimvar  !< TRIM of output-variable string
217
218!
219!-- Return, if nothing to output
220    IF ( do3d_no(av) == 0 )  RETURN
221
222    CALL cpu_log (log_point(14),'data_output_3d','start')
223
224!
225!-- Open output file.
226!-- Also creates coordinate and fld-file for AVS.
227!-- For classic or 64bit netCDF output or output of other (old) data formats,
228!-- for a run on more than one PE, each PE opens its own file and
229!-- writes the data of its subdomain in binary format (regardless of the format
230!-- the user has requested). After the run, these files are combined to one
231!-- file by combine_plot_fields in the format requested by the user (netcdf
232!-- and/or avs).
233!-- For netCDF4/HDF5 output, data is written in parallel into one file.
234    IF ( netcdf_data_format < 5 )  THEN
235       CALL check_open( 30 )
236       IF ( myid == 0 )  CALL check_open( 106+av*10 )
237    ELSE
238       CALL check_open( 106+av*10 )
239    ENDIF
240
241!
242!-- For parallel netcdf output the time axis must be limited. Return, if this
243!-- limit is exceeded. This could be the case, if the simulated time exceeds
244!-- the given end time by the length of the given output interval.
245    IF ( netcdf_data_format > 4 )  THEN
246       IF ( do3d_time_count(av) + 1 > ntdim_3d(av) )  THEN
247          WRITE ( message_string, * ) 'Output of 3d data is not given at t=',  &
248                                      simulated_time, '&because the maximum ', & 
249                                      'number of output time levels is ',      &
250                                      'exceeded.'
251          CALL message( 'data_output_3d', 'PA0387', 0, 1, 0, 6, 0 )
252          CALL cpu_log( log_point(14), 'data_output_3d', 'stop' )
253          RETURN
254       ENDIF
255    ENDIF
256
257!
258!-- Update the netCDF time axis
259!-- In case of parallel output, this is only done by PE0 to increase the
260!-- performance.
261#if defined( __netcdf )
262    do3d_time_count(av) = do3d_time_count(av) + 1
263    IF ( myid == 0 )  THEN
264       nc_stat = NF90_PUT_VAR( id_set_3d(av), id_var_time_3d(av),           &
265                               (/ time_since_reference_point /),            &
266                               start = (/ do3d_time_count(av) /),           &
267                               count = (/ 1 /) )
268       CALL netcdf_handle_error( 'data_output_3d', 376 )
269    ENDIF
270#endif
271
272!
273!-- Loop over all variables to be written.
274    if = 1
275
276    DO  WHILE ( do3d(av,if)(1:1) /= ' ' )
277
278!
279!--    Temporary solution to account for data output within the new urban
280!--    surface model (urban_surface_mod.f90), see also SELECT CASE ( trimvar ).
281!--    Store the array chosen on the temporary array.
282       trimvar = TRIM( do3d(av,if) )
283       IF ( urban_surface  .AND.  trimvar(1:4) == 'usm_' )  THEN
284          trimvar = 'usm_output'
285          resorted = .TRUE.
286          nzb_do   = nzub
287          nzt_do   = nzut
288       ELSE
289          resorted = .FALSE.
290          nzb_do   = nzb
291          nzt_do   = nz_do3d
292       ENDIF
293!
294!--    Set flag to steer output of radiation, land-surface, or user-defined
295!--    quantities
296       found = .FALSE.
297!
298!--    Allocate a temporary array with the desired output dimensions.
299       ALLOCATE( local_pf(nxlg:nxrg,nysg:nyng,nzb_do:nzt_do) )
300
301       SELECT CASE ( trimvar )
302
303          CASE ( 'e' )
304             IF ( av == 0 )  THEN
305                to_be_resorted => e
306             ELSE
307                to_be_resorted => e_av
308             ENDIF
309
310          CASE ( 'lpt' )
311             IF ( av == 0 )  THEN
312                to_be_resorted => pt
313             ELSE
314                to_be_resorted => lpt_av
315             ENDIF
316
317          CASE ( 'nr' )
318             IF ( av == 0 )  THEN
319                to_be_resorted => nr
320             ELSE
321                to_be_resorted => nr_av
322             ENDIF
323
324          CASE ( 'p' )
325             IF ( av == 0 )  THEN
326                IF ( psolver /= 'sor' )  CALL exchange_horiz( p, nbgp )
327                to_be_resorted => p
328             ELSE
329                IF ( psolver /= 'sor' )  CALL exchange_horiz( p_av, nbgp )
330                to_be_resorted => p_av
331             ENDIF
332
333          CASE ( 'pc' )  ! particle concentration (requires ghostpoint exchange)
334             IF ( av == 0 )  THEN
335                IF ( simulated_time >= particle_advection_start )  THEN
336                   tend = prt_count
337                   CALL exchange_horiz( tend, nbgp )
338                ELSE
339                   tend = 0.0_wp
340                ENDIF
341                DO  i = nxlg, nxrg
342                   DO  j = nysg, nyng
343                      DO  k = nzb_do, nzt_do
344                         local_pf(i,j,k) = tend(k,j,i)
345                      ENDDO
346                   ENDDO
347                ENDDO
348                resorted = .TRUE.
349             ELSE
350                CALL exchange_horiz( pc_av, nbgp )
351                to_be_resorted => pc_av
352             ENDIF
353
354          CASE ( 'pr' )  ! mean particle radius (effective radius)
355             IF ( av == 0 )  THEN
356                IF ( simulated_time >= particle_advection_start )  THEN
357                   DO  i = nxl, nxr
358                      DO  j = nys, nyn
359                         DO  k = nzb_do, nzt_do
360                            number_of_particles = prt_count(k,j,i)
361                            IF (number_of_particles <= 0)  CYCLE
362                            particles => grid_particles(k,j,i)%particles(1:number_of_particles)
363                            s_r2 = 0.0_wp
364                            s_r3 = 0.0_wp
365                            DO  n = 1, number_of_particles
366                               IF ( particles(n)%particle_mask )  THEN
367                                  s_r2 = s_r2 + particles(n)%radius**2 * &
368                                         particles(n)%weight_factor
369                                  s_r3 = s_r3 + particles(n)%radius**3 * &
370                                         particles(n)%weight_factor
371                               ENDIF
372                            ENDDO
373                            IF ( s_r2 > 0.0_wp )  THEN
374                               mean_r = s_r3 / s_r2
375                            ELSE
376                               mean_r = 0.0_wp
377                            ENDIF
378                            tend(k,j,i) = mean_r
379                         ENDDO
380                      ENDDO
381                   ENDDO
382                   CALL exchange_horiz( tend, nbgp )
383                ELSE
384                   tend = 0.0_wp
385                ENDIF
386                DO  i = nxlg, nxrg
387                   DO  j = nysg, nyng
388                      DO  k = nzb_do, nzt_do
389                         local_pf(i,j,k) = tend(k,j,i)
390                      ENDDO
391                   ENDDO
392                ENDDO
393                resorted = .TRUE.
394             ELSE
395                CALL exchange_horiz( pr_av, nbgp )
396                to_be_resorted => pr_av
397             ENDIF
398
399          CASE ( 'prr' )
400             IF ( av == 0 )  THEN
401                CALL exchange_horiz( prr, nbgp )
402                DO  i = nxlg, nxrg
403                   DO  j = nysg, nyng
404                      DO  k = nzb_do, nzt_do
405                         local_pf(i,j,k) = prr(k,j,i)
406                      ENDDO
407                   ENDDO
408                ENDDO
409             ELSE
410                CALL exchange_horiz( prr_av, nbgp )
411                DO  i = nxlg, nxrg
412                   DO  j = nysg, nyng
413                      DO  k = nzb_do, nzt_do
414                         local_pf(i,j,k) = prr_av(k,j,i)
415                      ENDDO
416                   ENDDO
417                ENDDO
418             ENDIF
419             resorted = .TRUE.
420
421          CASE ( 'pt' )
422             IF ( av == 0 )  THEN
423                IF ( .NOT. cloud_physics ) THEN
424                   to_be_resorted => pt
425                ELSE
426                   DO  i = nxlg, nxrg
427                      DO  j = nysg, nyng
428                         DO  k = nzb_do, nzt_do
429                            local_pf(i,j,k) = pt(k,j,i) + l_d_cp *             &
430                                                          pt_d_t(k) *          &
431                                                          ql(k,j,i)
432                         ENDDO
433                      ENDDO
434                   ENDDO
435                   resorted = .TRUE.
436                ENDIF
437             ELSE
438                to_be_resorted => pt_av
439             ENDIF
440
441          CASE ( 'q' )
442             IF ( av == 0 )  THEN
443                to_be_resorted => q
444             ELSE
445                to_be_resorted => q_av
446             ENDIF
447
448          CASE ( 'qc' )
449             IF ( av == 0 )  THEN
450                to_be_resorted => qc
451             ELSE
452                to_be_resorted => qc_av
453             ENDIF
454
455          CASE ( 'ql' )
456             IF ( av == 0 )  THEN
457                to_be_resorted => ql
458             ELSE
459                to_be_resorted => ql_av
460             ENDIF
461
462          CASE ( 'ql_c' )
463             IF ( av == 0 )  THEN
464                to_be_resorted => ql_c
465             ELSE
466                to_be_resorted => ql_c_av
467             ENDIF
468
469          CASE ( 'ql_v' )
470             IF ( av == 0 )  THEN
471                to_be_resorted => ql_v
472             ELSE
473                to_be_resorted => ql_v_av
474             ENDIF
475
476          CASE ( 'ql_vp' )
477             IF ( av == 0 )  THEN
478                IF ( simulated_time >= particle_advection_start )  THEN
479                   DO  i = nxl, nxr
480                      DO  j = nys, nyn
481                         DO  k = nzb_do, nzt_do
482                            number_of_particles = prt_count(k,j,i)
483                            IF (number_of_particles <= 0)  CYCLE
484                            particles => grid_particles(k,j,i)%particles(1:number_of_particles)
485                            DO  n = 1, number_of_particles
486                               IF ( particles(n)%particle_mask )  THEN
487                                  tend(k,j,i) =  tend(k,j,i) +                 &
488                                                 particles(n)%weight_factor /  &
489                                                 prt_count(k,j,i)
490                               ENDIF
491                            ENDDO
492                         ENDDO
493                      ENDDO
494                   ENDDO
495                   CALL exchange_horiz( tend, nbgp )
496                ELSE
497                   tend = 0.0_wp
498                ENDIF
499                DO  i = nxlg, nxrg
500                   DO  j = nysg, nyng
501                      DO  k = nzb_do, nzt_do
502                         local_pf(i,j,k) = tend(k,j,i)
503                      ENDDO
504                   ENDDO
505                ENDDO
506                resorted = .TRUE.
507             ELSE
508                CALL exchange_horiz( ql_vp_av, nbgp )
509                to_be_resorted => ql_vp_av
510             ENDIF
511
512          CASE ( 'qr' )
513             IF ( av == 0 )  THEN
514                to_be_resorted => qr
515             ELSE
516                to_be_resorted => qr_av
517             ENDIF
518
519          CASE ( 'qv' )
520             IF ( av == 0 )  THEN
521                DO  i = nxlg, nxrg
522                   DO  j = nysg, nyng
523                      DO  k = nzb_do, nzt_do
524                         local_pf(i,j,k) = q(k,j,i) - ql(k,j,i)
525                      ENDDO
526                   ENDDO
527                ENDDO
528                resorted = .TRUE.
529             ELSE
530                to_be_resorted => qv_av
531             ENDIF
532
533          CASE ( 'rho_ocean' )
534             IF ( av == 0 )  THEN
535                to_be_resorted => rho_ocean
536             ELSE
537                to_be_resorted => rho_ocean_av
538             ENDIF
539
540          CASE ( 's' )
541             IF ( av == 0 )  THEN
542                to_be_resorted => s
543             ELSE
544                to_be_resorted => s_av
545             ENDIF
546
547          CASE ( 'sa' )
548             IF ( av == 0 )  THEN
549                to_be_resorted => sa
550             ELSE
551                to_be_resorted => sa_av
552             ENDIF
553
554          CASE ( 'u' )
555             IF ( av == 0 )  THEN
556                to_be_resorted => u
557             ELSE
558                to_be_resorted => u_av
559             ENDIF
560
561          CASE ( 'v' )
562             IF ( av == 0 )  THEN
563                to_be_resorted => v
564             ELSE
565                to_be_resorted => v_av
566             ENDIF
567
568          CASE ( 'vpt' )
569             IF ( av == 0 )  THEN
570                to_be_resorted => vpt
571             ELSE
572                to_be_resorted => vpt_av
573             ENDIF
574
575          CASE ( 'w' )
576             IF ( av == 0 )  THEN
577                to_be_resorted => w
578             ELSE
579                to_be_resorted => w_av
580             ENDIF
581!             
582!--       Block of urban surface model outputs   
583          CASE ( 'usm_output' )
584             CALL usm_data_output_3d( av, do3d(av,if), found, local_pf,     &
585                                         nzb_do, nzt_do )
586
587          CASE DEFAULT
588
589!
590!--          Land surface quantity
591             IF ( land_surface )  THEN
592!
593!--             For soil model quantities, it is required to re-allocate local_pf
594                nzb_do = nzb_soil
595                nzt_do = nzt_soil
596
597                DEALLOCATE ( local_pf )
598                ALLOCATE( local_pf(nxlg:nxrg,nysg:nyng,nzb_do:nzt_do) )
599
600                CALL lsm_data_output_3d( av, do3d(av,if), found, local_pf )
601                resorted = .TRUE.
602
603!
604!--             If no soil model variable was found, re-allocate local_pf
605                IF ( .NOT. found )  THEN
606                   nzb_do = nzb
607                   nzt_do = nz_do3d
608
609                   DEALLOCATE ( local_pf )
610                   ALLOCATE( local_pf(nxlg:nxrg,nysg:nyng,nzb_do:nzt_do) )                 
611                ENDIF
612
613             ENDIF
614
615!
616!--          Radiation quantity
617             IF ( .NOT. found  .AND.  radiation )  THEN
618                CALL radiation_data_output_3d( av, do3d(av,if), found,         &
619                                               local_pf )
620                resorted = .TRUE.
621             ENDIF
622
623!
624!--          User defined quantity
625             IF ( .NOT. found )  THEN
626                CALL user_data_output_3d( av, do3d(av,if), found, local_pf,    &
627                                          nzb_do, nzt_do )
628                resorted = .TRUE.
629             ENDIF
630
631             IF ( .NOT. found )  THEN
632                message_string =  'no output available for: ' //               &
633                                  TRIM( do3d(av,if) )
634                CALL message( 'data_output_3d', 'PA0182', 0, 0, 0, 6, 0 )
635             ENDIF
636
637       END SELECT
638
639!
640!--    Resort the array to be output, if not done above
641       IF ( .NOT. resorted )  THEN
642          DO  i = nxlg, nxrg
643             DO  j = nysg, nyng
644                DO  k = nzb_do, nzt_do
645                   local_pf(i,j,k) = to_be_resorted(k,j,i)
646                ENDDO
647             ENDDO
648          ENDDO
649       ENDIF
650
651!
652!--    Output of the 3D-array
653#if defined( __parallel )
654       IF ( netcdf_data_format < 5 )  THEN
655!
656!--       Non-parallel netCDF output. Data is output in parallel in
657!--       FORTRAN binary format here, and later collected into one file by
658!--       combine_plot_fields
659          IF ( myid == 0 )  THEN
660             WRITE ( 30 )  time_since_reference_point,                   &
661                           do3d_time_count(av), av
662          ENDIF
663          DO  i = 0, io_blocks-1
664             IF ( i == io_group )  THEN
665                WRITE ( 30 )  nxlg, nxrg, nysg, nyng, nzb_do, nzt_do
666                WRITE ( 30 )  local_pf(:,:,nzb_do:nzt_do)
667             ENDIF
668
669             CALL MPI_BARRIER( comm2d, ierr )
670
671          ENDDO
672
673       ELSE
674#if defined( __netcdf )
675!
676!--       Parallel output in netCDF4/HDF5 format.
677!--       Do not output redundant ghost point data except for the
678!--       boundaries of the total domain.
679          IF ( nxr == nx  .AND.  nyn /= ny )  THEN
680             nc_stat = NF90_PUT_VAR( id_set_3d(av), id_var_do3d(av,if),  &
681                               local_pf(nxl:nxr+1,nys:nyn,nzb_do:nzt_do),    &
682                start = (/ nxl+1, nys+1, nzb_do+1, do3d_time_count(av) /),  &
683                count = (/ nxr-nxl+2, nyn-nys+1, nzt_do-nzb_do+1, 1 /) )
684          ELSEIF ( nxr /= nx  .AND.  nyn == ny )  THEN
685             nc_stat = NF90_PUT_VAR( id_set_3d(av), id_var_do3d(av,if),  &
686                               local_pf(nxl:nxr,nys:nyn+1,nzb_do:nzt_do),    &
687                start = (/ nxl+1, nys+1, nzb_do+1, do3d_time_count(av) /),  &
688                count = (/ nxr-nxl+1, nyn-nys+2, nzt_do-nzb_do+1, 1 /) )
689          ELSEIF ( nxr == nx  .AND.  nyn == ny )  THEN
690             nc_stat = NF90_PUT_VAR( id_set_3d(av), id_var_do3d(av,if),  &
691                             local_pf(nxl:nxr+1,nys:nyn+1,nzb_do:nzt_do  ),  &
692                start = (/ nxl+1, nys+1, nzb_do+1, do3d_time_count(av) /),  &
693                count = (/ nxr-nxl+2, nyn-nys+2, nzt_do-nzb_do+1, 1 /) )
694          ELSE
695             nc_stat = NF90_PUT_VAR( id_set_3d(av), id_var_do3d(av,if),  &
696                                 local_pf(nxl:nxr,nys:nyn,nzb_do:nzt_do),    &
697                start = (/ nxl+1, nys+1, nzb_do+1, do3d_time_count(av) /),  &
698                count = (/ nxr-nxl+1, nyn-nys+1, nzt_do-nzb_do+1, 1 /) )
699          ENDIF
700          CALL netcdf_handle_error( 'data_output_3d', 386 )
701#endif
702       ENDIF
703#else
704#if defined( __netcdf )
705       nc_stat = NF90_PUT_VAR( id_set_3d(av), id_var_do3d(av,if),        &
706                         local_pf(nxl:nxr+1,nys:nyn+1,nzb_do:nzt_do),        &
707                         start = (/ 1, 1, 1, do3d_time_count(av) /),     &
708                         count = (/ nx+2, ny+2, nzt_do-nzb_do+1, 1 /) )
709       CALL netcdf_handle_error( 'data_output_3d', 446 )
710#endif
711#endif
712
713       if = if + 1
714
715!
716!--    Deallocate temporary array
717       DEALLOCATE ( local_pf )
718
719    ENDDO
720
721    CALL cpu_log( log_point(14), 'data_output_3d', 'stop' )
722
723!
724!-- Formats.
7253300 FORMAT ('variable ',I4,'  file=',A,'  filetype=unformatted  skip=',I12/   &
726             'label = ',A,A)
727
728 END SUBROUTINE data_output_3d
Note: See TracBrowser for help on using the repository browser.