Changeset 2773 for palm/trunk/SOURCE


Ignore:
Timestamp:
Jan 30, 2018 2:12:54 PM (6 years ago)
Author:
suehring
Message:

Nesting for chemical species implemented; Bugfix passive scalar boundary condition after anterpolation; Timeseries output of surface temperature; Enable initialization of 3D topography (was commented out so far)

Location:
palm/trunk/SOURCE
Files:
8 edited

Legend:

Unmodified
Added
Removed
  • palm/trunk/SOURCE/Makefile

    r2718 r2773  
    2525# -----------------
    2626# $Id$
     27# Nesting of chemical species
     28#
     29# 2718 2018-01-02 08:49:38Z maronga
    2730# Corrected "Former revisions" section
    2831#
     
    630633mod_kinds.o: mod_kinds.f90
    631634mod_particle_attributes.o: mod_particle_attributes.f90 mod_kinds.o
    632 netcdf_data_input_mod.o: modules.o mod_kinds.o pmc_interface_mod.o
    633 netcdf_interface_mod.o: netcdf_interface_mod.f90 modules.o mod_kinds.o \
     635netcdf_data_input_mod.o: modules.o mod_kinds.o
     636netcdf_interface_mod.o: modules.o mod_kinds.o \
    634637   chemistry_model_mod.o land_surface_model_mod.o radiation_model_mod.o \
    635638   spectra_mod.o turbulence_closure_mod.o urban_surface_mod.o uv_exposure_model_mod.o
     
    645648plant_canopy_model_mod.o: modules.o mod_kinds.o netcdf_data_input_mod.o surface_mod.o
    646649pmc_interface_mod.o: modules.o mod_kinds.o pmc_child_mod.o pmc_general_mod.o \
    647         pmc_handle_communicator_mod.o pmc_mpi_wrapper_mod.o pmc_parent_mod.o surface_mod.o
     650   pmc_handle_communicator_mod.o pmc_mpi_wrapper_mod.o pmc_parent_mod.o surface_mod.o \
     651   chem_modules.o chemistry_model_mod.o
    648652pmc_child_mod.o: mod_kinds.o pmc_general_mod.o pmc_handle_communicator_mod.o \
    649653   pmc_mpi_wrapper_mod.o
  • palm/trunk/SOURCE/check_parameters.f90

    r2766 r2773  
    2525! -----------------
    2626! $Id$
     27! Check for consistent initialization in nesting mode added.
     28!
     29! 2766 2018-01-22 17:17:47Z kanani
    2730! Removed preprocessor directive __chem
    2831!
     
    666669    INTEGER(iwp) ::  lsp                             !< running index for chem spcs.
    667670
     671    LOGICAL     ::  check_nest                       !< flag used to check initialization in case of nesting
    668672    LOGICAL     ::  found                            !<
    669673
     
    13401344       CALL message( 'check_parameters', 'PA0033', 1, 2, 0, 6, 0 )
    13411345    ENDIF
     1346!
     1347!-- In case of nested run assure that all domains are initialized the same
     1348!-- way, i.e. if at least at one domain is initialized with soil and
     1349!-- atmospheric data provided by COSMO, all domains must be initialized the
     1350!-- same way, to assure that soil and atmospheric quantities are
     1351!-- consistent.
     1352    IF ( nested_run )  THEN
     1353       check_nest = .TRUE.
     1354#if defined( __parallel )
     1355       CALL MPI_ALLREDUCE( TRIM( initializing_actions ) == 'inifor',           &
     1356                           check_nest, 1, MPI_LOGICAL,                         &
     1357                           MPI_LAND, MPI_COMM_WORLD, ierr )
     1358
     1359       IF ( TRIM( initializing_actions ) == 'inifor'  .AND.                    &
     1360            .NOT.  check_nest )  THEN
     1361          message_string = 'In case of nesting, if at least in one ' //        &
     1362                           'domain initializing_actions = inifor, '  //        &
     1363                           'all domains need to be initialized that way.'
     1364          CALL message( 'netcdf_data_input_mod', 'PA0430', 3, 2, 0, 6, 0 )
     1365       ENDIF
     1366#endif
     1367    ENDIF
    13421368
    13431369    IF ( cloud_physics  .AND.  .NOT.  humidity )  THEN
  • palm/trunk/SOURCE/chemistry_model_mod.f90

    r2772 r2773  
    2727! -----------------
    2828! $Id$
     29! Declare variables required for nesting as public
     30!
     31! 2772 2018-01-29 13:10:35Z suehring
    2932! Bugfix in string handling
    3033!
     
    152155   PUBLIC nspec
    153156   PUBLIC nvar       
    154    PUBLIC spc_names 
     157   PUBLIC spc_names
     158   PUBLIC spec_conc_2 
    155159
    156160!- Interface section
  • palm/trunk/SOURCE/flow_statistics.f90

    r2753 r2773  
    2525! -----------------
    2626! $Id$
     27! Timeseries output of surface temperature.
     28!
     29! 2753 2018-01-16 14:16:49Z suehring
    2730! Tile approach for spectral albedo implemented.
    2831!
     
    709712!
    710713!--          2D-arrays (being collected in the last column of sums_l)
    711              IF ( surf_def_h(0)%end_index(j,i) >=                                 &
     714             IF ( surf_def_h(0)%end_index(j,i) >=                              &
    712715                  surf_def_h(0)%start_index(j,i) )  THEN
    713716                m = surf_def_h(0)%start_index(j,i)
    714                 sums_l(nzb,pr_palm,tn)   = sums_l(nzb,pr_palm,tn) +               &
     717                sums_l(nzb,pr_palm,tn)   = sums_l(nzb,pr_palm,tn) +            &
    715718                                        surf_def_h(0)%us(m)   * rmask(j,i,sr)
    716                 sums_l(nzb+1,pr_palm,tn) = sums_l(nzb+1,pr_palm,tn) +             &
     719                sums_l(nzb+1,pr_palm,tn) = sums_l(nzb+1,pr_palm,tn) +          &
    717720                                        surf_def_h(0)%usws(m) * rmask(j,i,sr)
    718                 sums_l(nzb+2,pr_palm,tn) = sums_l(nzb+2,pr_palm,tn) +             &
     721                sums_l(nzb+2,pr_palm,tn) = sums_l(nzb+2,pr_palm,tn) +          &
    719722                                        surf_def_h(0)%vsws(m) * rmask(j,i,sr)
    720                 sums_l(nzb+3,pr_palm,tn) = sums_l(nzb+3,pr_palm,tn) +             &
     723                sums_l(nzb+3,pr_palm,tn) = sums_l(nzb+3,pr_palm,tn) +          &
    721724                                        surf_def_h(0)%ts(m)   * rmask(j,i,sr)
    722725                IF ( humidity )  THEN
    723                    sums_l(nzb+12,pr_palm,tn) = sums_l(nzb+12,pr_palm,tn) +        &
     726                   sums_l(nzb+12,pr_palm,tn) = sums_l(nzb+12,pr_palm,tn) +     &
    724727                                            surf_def_h(0)%qs(m)   * rmask(j,i,sr)
    725728                ENDIF
    726729                IF ( passive_scalar )  THEN
    727                    sums_l(nzb+13,pr_palm,tn) = sums_l(nzb+13,pr_palm,tn) +        &
     730                   sums_l(nzb+13,pr_palm,tn) = sums_l(nzb+13,pr_palm,tn) +     &
    728731                                            surf_def_h(0)%ss(m)   * rmask(j,i,sr)
    729732                ENDIF
     733!
     734!--             Summation of surface temperature.
     735                sums_l(nzb+14,pr_palm,tn) = sums_l(nzb+14,pr_palm,tn)   +      &
     736                                            surf_def_h(0)%pt_surface(m) *      &
     737                                            rmask(j,i,sr)
    730738             ENDIF
    731739             IF ( surf_lsm_h%end_index(j,i) >= surf_lsm_h%start_index(j,i) )  THEN
    732740                m = surf_lsm_h%start_index(j,i)
    733                 sums_l(nzb,pr_palm,tn)   = sums_l(nzb,pr_palm,tn) +               &
     741                sums_l(nzb,pr_palm,tn)   = sums_l(nzb,pr_palm,tn) +            &
    734742                                        surf_lsm_h%us(m)   * rmask(j,i,sr)
    735                 sums_l(nzb+1,pr_palm,tn) = sums_l(nzb+1,pr_palm,tn) +             &
     743                sums_l(nzb+1,pr_palm,tn) = sums_l(nzb+1,pr_palm,tn) +          &
    736744                                        surf_lsm_h%usws(m) * rmask(j,i,sr)
    737                 sums_l(nzb+2,pr_palm,tn) = sums_l(nzb+2,pr_palm,tn) +             &
     745                sums_l(nzb+2,pr_palm,tn) = sums_l(nzb+2,pr_palm,tn) +          &
    738746                                        surf_lsm_h%vsws(m) * rmask(j,i,sr)
    739                 sums_l(nzb+3,pr_palm,tn) = sums_l(nzb+3,pr_palm,tn) +             &
     747                sums_l(nzb+3,pr_palm,tn) = sums_l(nzb+3,pr_palm,tn) +          &
    740748                                        surf_lsm_h%ts(m)   * rmask(j,i,sr)
    741749                IF ( humidity )  THEN
    742                    sums_l(nzb+12,pr_palm,tn) = sums_l(nzb+12,pr_palm,tn) +        &
     750                   sums_l(nzb+12,pr_palm,tn) = sums_l(nzb+12,pr_palm,tn) +     &
    743751                                            surf_lsm_h%qs(m)   * rmask(j,i,sr)
    744752                ENDIF
    745753                IF ( passive_scalar )  THEN
    746                    sums_l(nzb+13,pr_palm,tn) = sums_l(nzb+13,pr_palm,tn) +        &
     754                   sums_l(nzb+13,pr_palm,tn) = sums_l(nzb+13,pr_palm,tn) +     &
    747755                                            surf_lsm_h%ss(m)   * rmask(j,i,sr)
    748756                ENDIF
     757!
     758!--             Summation of surface temperature.
     759                sums_l(nzb+14,pr_palm,tn) = sums_l(nzb+14,pr_palm,tn)   +      &
     760                                            surf_lsm_h%pt_surface(m)    *      &
     761                                            rmask(j,i,sr)
    749762             ENDIF
    750763             IF ( surf_usm_h%end_index(j,i) >= surf_usm_h%start_index(j,i) )  THEN
    751764                m = surf_usm_h%start_index(j,i)
    752                 sums_l(nzb,pr_palm,tn)   = sums_l(nzb,pr_palm,tn) +               &
     765                sums_l(nzb,pr_palm,tn)   = sums_l(nzb,pr_palm,tn) +            &
    753766                                        surf_usm_h%us(m)   * rmask(j,i,sr)
    754                 sums_l(nzb+1,pr_palm,tn) = sums_l(nzb+1,pr_palm,tn) +             &
     767                sums_l(nzb+1,pr_palm,tn) = sums_l(nzb+1,pr_palm,tn) +          &
    755768                                        surf_usm_h%usws(m) * rmask(j,i,sr)
    756                 sums_l(nzb+2,pr_palm,tn) = sums_l(nzb+2,pr_palm,tn) +             &
     769                sums_l(nzb+2,pr_palm,tn) = sums_l(nzb+2,pr_palm,tn) +          &
    757770                                        surf_usm_h%vsws(m) * rmask(j,i,sr)
    758                 sums_l(nzb+3,pr_palm,tn) = sums_l(nzb+3,pr_palm,tn) +             &
     771                sums_l(nzb+3,pr_palm,tn) = sums_l(nzb+3,pr_palm,tn) +          &
    759772                                        surf_usm_h%ts(m)   * rmask(j,i,sr)
    760773                IF ( humidity )  THEN
    761                    sums_l(nzb+12,pr_palm,tn) = sums_l(nzb+12,pr_palm,tn) +        &
     774                   sums_l(nzb+12,pr_palm,tn) = sums_l(nzb+12,pr_palm,tn) +     &
    762775                                            surf_usm_h%qs(m)   * rmask(j,i,sr)
    763776                ENDIF
    764777                IF ( passive_scalar )  THEN
    765                    sums_l(nzb+13,pr_palm,tn) = sums_l(nzb+13,pr_palm,tn) +        &
     778                   sums_l(nzb+13,pr_palm,tn) = sums_l(nzb+13,pr_palm,tn) +     &
    766779                                            surf_usm_h%ss(m)   * rmask(j,i,sr)
    767780                ENDIF
     781!
     782!--             Summation of surface temperature.
     783                sums_l(nzb+14,pr_palm,tn) = sums_l(nzb+14,pr_palm,tn)   +      &
     784                                            surf_usm_h%pt_surface(m)    *      &
     785                                            rmask(j,i,sr)
    768786             ENDIF
    769787          ENDDO
     
    18041822                                    ngp_2dh(sr)
    18051823       sums(nzb+13,pr_palm)       = sums(nzb+13,pr_palm)       / &    ! ss
     1824                                    ngp_2dh(sr)
     1825       sums(nzb+14,pr_palm)       = sums(nzb+14,pr_palm)       / &    ! surface temperature
    18061826                                    ngp_2dh(sr)
    18071827!--    eges, e*
     
    20882108       ts_value(15,sr) = hom(nzb+1,1,16,sr)         ! w'pt'   at k=1
    20892109       ts_value(16,sr) = hom(nzb+1,1,18,sr)         ! wpt     at k=1
    2090        ts_value(17,sr) = hom(nzb,1,4,sr)            ! pt(0)
     2110       ts_value(17,sr) = hom(nzb+14,1,pr_palm,sr)   ! pt(0)
    20912111       ts_value(18,sr) = hom(nzb+1,1,4,sr)          ! pt(zp)
    20922112       ts_value(19,sr) = hom(nzb+1,1,pr_palm,sr)    ! u'w'    at k=0
  • palm/trunk/SOURCE/netcdf_data_input_mod.f90

    r2772 r2773  
    2525! -----------------
    2626! $Id$
     27! - Enable initialization with 3D topography.
     28! - Move check for correct initialization in nesting mode to check_parameters.
     29!
     30! 2772 2018-01-29 13:10:35Z suehring
    2731! Initialization of simulation independent on land-surface model.
    2832!
     
    16991703!--             If available, also read 3D building information. If both are
    17001704!--             available, use 3D information.
    1701 !                 IF ( check_existence( var_names, 'buildings_3D' ) )  THEN
    1702 !                    buildings_f%from_file = .TRUE.
    1703 !                    CALL get_attribute( id_topo, char_lod, buildings_f%lod,     &
    1704 !                                        .FALSE., 'buildings_3D' )     
    1705 !
    1706 !                    CALL get_attribute( id_topo, char_fill,                     &
    1707 !                                        buildings_f%fill2,                      &
    1708 !                                        .FALSE., 'buildings_3D' )
    1709 !
    1710 !                    CALL get_dimension_length( id_topo, buildings_f%nz, 'z' )
    1711 !
    1712 !                    IF ( buildings_f%lod == 2 )  THEN
    1713 !                       ALLOCATE( buildings_f%var_3d(nzb:buildings_f%nz,         &
    1714 !                                                    nys:nyn,nxl:nxr) )
    1715 !                       buildings_f%var_3d = 0
    1716 ! !
    1717 ! !--                   Read data PE-wise. Read yz-slices.
    1718 !                       DO  i = nxl, nxr
    1719 !                          DO  j = nys, nyn
    1720 !                             CALL get_variable( id_topo, 'buildings_3D',        &
    1721 !                                                i, j,                           &
    1722 !                                                buildings_f%var_3d(:,j,i) )
    1723 !                          ENDDO
    1724 !                       ENDDO
    1725 !                    ELSE
    1726 !                       message_string = 'NetCDF attribute lod ' //              &
    1727 !                                        '(level of detail) is not set properly.'
    1728 !                       CALL message( 'netcdf_data_input_mod', 'PA0999',         &
    1729 !                                      1, 2, 0, 6, 0 )
    1730 !                    ENDIF
    1731 !                 ENDIF
     1705                IF ( check_existence( var_names, 'buildings_3D' ) )  THEN
     1706                   buildings_f%from_file = .TRUE.
     1707                   CALL get_attribute( id_topo, char_lod, buildings_f%lod,     &
     1708                                       .FALSE., 'buildings_3D' )     
     1709
     1710                   CALL get_attribute( id_topo, char_fill,                     &
     1711                                       buildings_f%fill2,                      &
     1712                                       .FALSE., 'buildings_3D' )
     1713
     1714                   CALL get_dimension_length( id_topo, buildings_f%nz, 'z' )
     1715
     1716                   IF ( buildings_f%lod == 2 )  THEN
     1717                      ALLOCATE( buildings_f%var_3d(nzb:buildings_f%nz,         &
     1718                                                   nys:nyn,nxl:nxr) )
     1719                      buildings_f%var_3d = 0
     1720!
     1721!--                   Read data PE-wise. Read yz-slices.
     1722                      DO  i = nxl, nxr
     1723                         DO  j = nys, nyn
     1724                            CALL get_variable( id_topo, 'buildings_3D',        &
     1725                                               i, j,                           &
     1726                                               buildings_f%var_3d(:,j,i) )
     1727                         ENDDO
     1728                      ENDDO
     1729                   ELSE
     1730                      message_string = 'NetCDF attribute lod ' //              &
     1731                                       '(level of detail) is not set properly.'
     1732                      CALL message( 'netcdf_data_input_mod', 'PA0999',         &
     1733                                     1, 2, 0, 6, 0 )
     1734                   ENDIF
     1735                ENDIF
    17321736!
    17331737!--             Read building IDs and its FillValue attribute. Further required
     
    26912695           ONLY:  initializing_actions, forcing, message_string
    26922696
    2693        USE pmc_interface,                                                      &
    2694            ONLY:  nested_run
    2695 
    26962697       IMPLICIT NONE
    2697 
    2698        LOGICAL      ::  check_nest !< flag indicating if a check passed
    26992698
    27002699!
     
    27142713                           TRIM( coupling_char )
    27152714          CALL message( 'netcdf_data_input_mod', 'PA0430', 1, 2, 0, 6, 0 )
    2716        ENDIF
    2717 !
    2718 !--    In case of nested run assure that all domains are initialized the same
    2719 !--    way, i.e. if at least at one domain is initialized with soil and
    2720 !--    atmospheric data provided by COSMO, all domains must be initialized the
    2721 !--    same way, to assure that soil and atmospheric quantities are
    2722 !--    consistent.
    2723        IF ( nested_run )  THEN
    2724           check_nest = .TRUE.
    2725 #if defined( __parallel )
    2726           CALL MPI_ALLREDUCE( TRIM( initializing_actions ) == 'inifor',        &
    2727                               check_nest, 1, MPI_LOGICAL,                      &
    2728                               MPI_LAND, MPI_COMM_WORLD, ierr )
    2729 
    2730           IF ( TRIM( initializing_actions ) == 'inifor'  .AND.                 &
    2731                .NOT.  check_nest )  THEN
    2732              message_string = 'In case of nesting, if at least in one ' //     &
    2733                               'domain initializing_actions = inifor, '  //     &
    2734                               'all domains need to be initialized that way.'
    2735              CALL message( 'netcdf_data_input_mod', 'PA0430', 3, 2, 0, 6, 0 )
    2736           ENDIF
    2737 #endif
    27382715       ENDIF
    27392716
  • palm/trunk/SOURCE/parin.f90

    r2766 r2773  
    2525! -----------------
    2626! $Id$
     27! Nesting for chemical species implemented
     28!
     29! 2766 2018-01-22 17:17:47Z kanani
    2730! Removed preprocessor directive __chem
    2831!
     
    617620             ENDIF
    618621             IF ( nest_domain )  THEN
    619                 bc_uv_t = 'nested'
    620                 bc_pt_t = 'nested'
    621                 bc_q_t  = 'nested'
    622                 bc_s_t  = 'nested'
    623                 bc_p_t  = 'neumann'
    624              ENDIF
    625           ELSE
    626          
     622                bc_uv_t  = 'nested'
     623                bc_pt_t  = 'nested'
     624                bc_q_t   = 'nested'
     625                bc_s_t   = 'nested'
     626                bc_cs_t  = 'nested'
     627                bc_p_t   = 'neumann' 
     628             ENDIF       
    627629!
    628630!--       For other nesting modes only set boundary conditions for
    629631!--       nested domains.
    630632             IF ( nest_domain )  THEN
    631                 bc_lr   = 'nested'
    632                 bc_ns   = 'nested'
    633                 bc_uv_t = 'nested'
    634                 bc_pt_t = 'nested'
    635                 bc_q_t  = 'nested'
    636                 bc_s_t  = 'nested'
    637                 bc_p_t  = 'neumann'
     633                bc_lr    = 'nested'
     634                bc_ns    = 'nested'
     635                bc_uv_t  = 'nested'
     636                bc_pt_t  = 'nested'
     637                bc_q_t   = 'nested'
     638                bc_s_t   = 'nested'
     639                bc_cs_t = 'nested'
     640                bc_p_t   = 'neumann'
    638641             ENDIF
    639642          ENDIF
    640643
    641644          IF ( forcing )  THEN
    642              bc_lr   = 'forcing'
    643              bc_ns   = 'forcing'
    644              bc_uv_t = 'forcing'
    645              bc_pt_t = 'forcing'
    646              bc_q_t  = 'forcing'
    647              bc_s_t  = 'forcing'  ! scalar boundary condition is not clear
    648              bc_p_t  = 'neumann'
    649 
     645             bc_lr    = 'forcing'
     646             bc_ns    = 'forcing'
     647             bc_uv_t  = 'forcing'
     648             bc_pt_t  = 'forcing'
     649             bc_q_t   = 'forcing'
     650             bc_s_t   = 'forcing'  ! scalar boundary condition is not clear
     651             bc_cs_t  = 'forcing'  ! same for chemical species
     652             bc_p_t   = 'neumann'
    650653          ENDIF
    651654
  • palm/trunk/SOURCE/pmc_interface_mod.f90

    r2718 r2773  
    2525! -----------------
    2626! $Id$
     27! - Nesting for chemical species
     28! - Bugfix in setting boundary condition at downward-facing walls for passive
     29!   scalar
     30! - Some formatting adjustments
     31!
     32! 2718 2018-01-02 08:49:38Z maronga
    2733! Corrected "Former revisions" section
    2834!
     
    220226
    221227    USE control_parameters,                                                     &
    222         ONLY:  cloud_physics, coupling_char, dt_3d, dz, humidity,               &
     228        ONLY:  air_chemistry, cloud_physics, coupling_char, dt_3d, dz, humidity,&
    223229               message_string, microphysics_morrison, microphysics_seifert,     &
    224230               nest_bound_l, nest_bound_r, nest_bound_s, nest_bound_n,          &
     
    226232               simulated_time, topography, volume_flow
    227233
    228     USE cpulog,                                                                 &
     234    USE chem_modules,                                                          &
     235        ONLY:  nspec
     236
     237    USE chemistry_model_mod,                                                   &
     238        ONLY:  chem_species, spec_conc_2
     239
     240    USE cpulog,                                                                &
    229241        ONLY:  cpu_log, log_point_s
    230242
    231     USE grid_variables,                                                         &
     243    USE grid_variables,                                                        &
    232244        ONLY:  dx, dy
    233245
    234     USE indices,                                                                &
    235         ONLY:  nbgp, nx, nxl, nxlg, nxlu, nxr, nxrg, ny, nyn, nyng, nys, nysg,  &
     246    USE indices,                                                               &
     247        ONLY:  nbgp, nx, nxl, nxlg, nxlu, nxr, nxrg, ny, nyn, nyng, nys, nysg, &
    236248               nysv, nz, nzb, nzt, wall_flags_0
    237249
     
    245257#endif
    246258
    247     USE pegrid,                                                                 &
    248         ONLY:  collective_wait, comm1dx, comm1dy, comm2d, myid, myidx, myidy,   &
     259    USE pegrid,                                                                &
     260        ONLY:  collective_wait, comm1dx, comm1dy, comm2d, myid, myidx, myidy,  &
    249261               numprocs
    250262
    251     USE pmc_child,                                                              &
    252         ONLY:  pmc_childinit, pmc_c_clear_next_array_list,                      &
    253                pmc_c_getnextarray, pmc_c_get_2d_index_list, pmc_c_getbuffer,    &
    254                pmc_c_putbuffer, pmc_c_setind_and_allocmem,                      &
     263    USE pmc_child,                                                             &
     264        ONLY:  pmc_childinit, pmc_c_clear_next_array_list,                     &
     265               pmc_c_getnextarray, pmc_c_get_2d_index_list, pmc_c_getbuffer,   &
     266               pmc_c_putbuffer, pmc_c_setind_and_allocmem,                     &
    255267               pmc_c_set_dataarray, pmc_set_dataarray_name
    256268
    257     USE pmc_general,                                                            &
     269    USE pmc_general,                                                           &
    258270        ONLY:  da_namelen
    259271
    260     USE pmc_handle_communicator,                                                &
    261         ONLY:  pmc_get_model_info, pmc_init_model, pmc_is_rootmodel,            &
     272    USE pmc_handle_communicator,                                               &
     273        ONLY:  pmc_get_model_info, pmc_init_model, pmc_is_rootmodel,           &
    262274               pmc_no_namelist_found, pmc_parent_for_child
    263275
    264     USE pmc_mpi_wrapper,                                                        &
    265         ONLY:  pmc_bcast, pmc_recv_from_child, pmc_recv_from_parent,            &
     276    USE pmc_mpi_wrapper,                                                       &
     277        ONLY:  pmc_bcast, pmc_recv_from_child, pmc_recv_from_parent,           &
    266278               pmc_send_to_child, pmc_send_to_parent
    267279
    268     USE pmc_parent,                                                             &
    269         ONLY:  pmc_parentinit, pmc_s_clear_next_array_list, pmc_s_fillbuffer,   &
    270                pmc_s_getdata_from_buffer, pmc_s_getnextarray,                   &
    271                pmc_s_setind_and_allocmem, pmc_s_set_active_data_array,          &
     280    USE pmc_parent,                                                            &
     281        ONLY:  pmc_parentinit, pmc_s_clear_next_array_list, pmc_s_fillbuffer,  &
     282               pmc_s_getdata_from_buffer, pmc_s_getnextarray,                  &
     283               pmc_s_setind_and_allocmem, pmc_s_set_active_data_array,         &
    272284               pmc_s_set_dataarray, pmc_s_set_2d_index_list
    273285
    274286#endif
    275287
    276     USE surface_mod,                                                            &
     288    USE surface_mod,                                                           &
    277289        ONLY:  get_topography_top_index_ji, surf_def_h, surf_lsm_h, surf_usm_h
    278290
     
    338350    REAL(wp), SAVE, DIMENSION(:,:,:), ALLOCATABLE, TARGET ::  ncc  !:
    339351    REAL(wp), SAVE, DIMENSION(:,:,:), ALLOCATABLE, TARGET ::  sc   !:
     352
     353    REAL(wp), SAVE, DIMENSION(:,:,:,:), ALLOCATABLE, TARGET ::  chem_spec_c   !< child coarse data array for chemical species
     354
    340355!
    341356!-- Child interpolation coefficients and child-array indices to be
     
    651666    INTEGER(iwp) ::  m                !:
    652667    INTEGER(iwp) ::  mm               !:
     668    INTEGER(iwp) ::  n = 1            !< running index for chemical species
    653669    INTEGER(iwp) ::  nest_overlap     !:
    654670    INTEGER(iwp) ::  nomatch          !:
     
    836852       CALL pmc_s_clear_next_array_list
    837853       DO  WHILE ( pmc_s_getnextarray( child_id, myname ) )
    838           CALL pmci_set_array_pointer( myname, child_id = child_id,             &
    839                                        nz_cl = nz_cl )
     854          IF ( INDEX( TRIM( myname ), 'chem_' ) /= 0 )  THEN             
     855             CALL pmci_set_array_pointer( myname, child_id = child_id,         &
     856                                          nz_cl = nz_cl, n = n )
     857             n = n + 1
     858          ELSE
     859             CALL pmci_set_array_pointer( myname, child_id = child_id,         &
     860                                          nz_cl = nz_cl )
     861          ENDIF
    840862       ENDDO
    841863       CALL pmc_s_setind_and_allocmem( child_id )
     
    965987 SUBROUTINE pmci_setup_child
    966988
     989
    967990#if defined( __parallel )
    968991    IMPLICIT NONE
    969992
    970     CHARACTER(LEN=da_namelen) ::  myname     !:
    971 
    972     INTEGER(iwp) ::  i          !:
    973     INTEGER(iwp) ::  ierr       !:
    974     INTEGER(iwp) ::  icl        !:
    975     INTEGER(iwp) ::  icr        !:
    976     INTEGER(iwp) ::  j          !:
    977     INTEGER(iwp) ::  jcn        !:
    978     INTEGER(iwp) ::  jcs        !:
     993    CHARACTER(LEN=da_namelen) ::  myname     !<
     994
     995    INTEGER(iwp) ::  i          !<
     996    INTEGER(iwp) ::  ierr       !<
     997    INTEGER(iwp) ::  icl        !<
     998    INTEGER(iwp) ::  icr        !<
     999    INTEGER(iwp) ::  j          !<
     1000    INTEGER(iwp) ::  jcn        !<
     1001    INTEGER(iwp) ::  jcs        !<
     1002    INTEGER(iwp) ::  n          !< running index for number of chemical species
    9791003
    9801004    INTEGER(iwp), DIMENSION(5) ::  val        !:
     
    10281052       IF ( passive_scalar )  THEN
    10291053          CALL pmc_set_dataarray_name( 'coarse', 's'  ,'fine', 's',  ierr )
     1054       ENDIF
     1055
     1056       IF ( air_chemistry )  THEN
     1057          DO  n = 1, nspec
     1058             CALL pmc_set_dataarray_name( 'coarse',                            &
     1059                                          'chem_' //                           &
     1060                                          TRIM( chem_species(n)%name ),        &
     1061                                         'fine',                               &
     1062                                          'chem_' //                           &
     1063                                          TRIM( chem_species(n)%name ),        &
     1064                                          ierr )
     1065          ENDDO
    10301066       ENDIF
    10311067
     
    11161152!--    TO_DO: Klaus: better explain the above comment (what is child content?)
    11171153       CALL  pmc_c_clear_next_array_list
     1154
     1155       n = 1
    11181156       DO  WHILE ( pmc_c_getnextarray( myname ) )
    11191157!--       Note that cg%nz is not th eoriginal nz of parent, but the highest
    1120 !--       parent-grid level needed for nesting.           
    1121           CALL pmci_create_child_arrays ( myname, icl, icr, jcs, jcn, cg%nz )
     1158!--       parent-grid level needed for nesting.
     1159!--       Please note, in case of chemical species an additional parameter
     1160!--       need to be passed, which is required to set the pointer correctly
     1161!--       to the chemical-species data structure. Hence, first check if current
     1162!--       variable is a chemical species. If so, pass index id of respective
     1163!--       species and increment this subsequently.
     1164          IF ( INDEX( TRIM( myname ), 'chem_' ) /= 0 )  THEN             
     1165             CALL pmci_create_child_arrays ( myname, icl, icr, jcs, jcn, cg%nz, n )
     1166             n = n + 1
     1167          ELSE
     1168             CALL pmci_create_child_arrays ( myname, icl, icr, jcs, jcn, cg%nz )
     1169          ENDIF
    11221170       ENDDO
    11231171       CALL pmc_c_setind_and_allocmem
     
    27852833
    27862834
    2787  SUBROUTINE pmci_set_array_pointer( name, child_id, nz_cl )
     2835 SUBROUTINE pmci_set_array_pointer( name, child_id, nz_cl, n )
    27882836
    27892837    IMPLICIT NONE
     
    27912839    INTEGER, INTENT(IN)          ::  child_id    !:
    27922840    INTEGER, INTENT(IN)          ::  nz_cl       !:
     2841    INTEGER, INTENT(IN),OPTIONAL ::  n           !< index of chemical species
     2842
    27932843    CHARACTER(LEN=*), INTENT(IN) ::  name        !:
    27942844
     
    28192869    IF ( TRIM(name) == "nc" )  p_3d => nc
    28202870    IF ( TRIM(name) == "s"  )  p_3d => s
     2871    IF ( INDEX( TRIM(name), "chem_" ) /= 0 )  p_3d => chem_species(n)%conc
     2872
    28212873!
    28222874!-- Next line is just an example for a 2D array (not active for coupling!)
     
    28552907    IF ( TRIM(name) == "nc" )  p_3d_sec => nc_2
    28562908    IF ( TRIM(name) == "s"  )  p_3d_sec => s_2
     2909    IF ( INDEX( TRIM(name), "chem_" ) /= 0 )  p_3d_sec => spec_conc_2(:,:,:,n)
    28572910
    28582911    IF ( ASSOCIATED( p_3d ) )  THEN
     
    28832936
    28842937
    2885  SUBROUTINE pmci_create_child_arrays( name, is, ie, js, je, nzc  )
     2938 SUBROUTINE pmci_create_child_arrays( name, is, ie, js, je, nzc, n )
    28862939
    28872940    IMPLICIT NONE
     
    28952948    INTEGER(iwp), INTENT(IN) ::  nzc     !:  Note that nzc is cg%nz
    28962949
     2950    INTEGER(iwp), INTENT(IN), OPTIONAL ::  n  !< number of chemical species
     2951
    28972952#if defined( __parallel )
    28982953    INTEGER(iwp) ::  ierr    !:
     
    29082963!-- List of array names, which can be coupled
    29092964    IF ( TRIM( name ) == "u" )  THEN
    2910        IF ( .NOT. ALLOCATED( uc ) )  ALLOCATE( uc(0:nzc+1, js:je, is:ie) )
     2965       IF ( .NOT. ALLOCATED( uc ) )  ALLOCATE( uc(0:nzc+1,js:je,is:ie) )
    29112966       p_3d => uc
    29122967    ELSEIF ( TRIM( name ) == "v" )  THEN
    2913        IF ( .NOT. ALLOCATED( vc ) )  ALLOCATE( vc(0:nzc+1, js:je, is:ie) )
     2968       IF ( .NOT. ALLOCATED( vc ) )  ALLOCATE( vc(0:nzc+1,js:je,is:ie) )
    29142969       p_3d => vc
    29152970    ELSEIF ( TRIM( name ) == "w" )  THEN
    2916        IF ( .NOT. ALLOCATED( wc ) )  ALLOCATE( wc(0:nzc+1, js:je, is:ie) )
     2971       IF ( .NOT. ALLOCATED( wc ) )  ALLOCATE( wc(0:nzc+1,js:je,is:ie) )
    29172972       p_3d => wc
    29182973    ELSEIF ( TRIM( name ) == "e" )  THEN
    2919        IF ( .NOT. ALLOCATED( ec ) )  ALLOCATE( ec(0:nzc+1, js:je, is:ie) )
     2974       IF ( .NOT. ALLOCATED( ec ) )  ALLOCATE( ec(0:nzc+1,js:je,is:ie) )
    29202975       p_3d => ec
    29212976    ELSEIF ( TRIM( name ) == "pt")  THEN
    2922        IF ( .NOT. ALLOCATED( ptc ) ) ALLOCATE( ptc(0:nzc+1, js:je, is:ie) )
     2977       IF ( .NOT. ALLOCATED( ptc ) )  ALLOCATE( ptc(0:nzc+1,js:je,is:ie) )
    29232978       p_3d => ptc
    29242979    ELSEIF ( TRIM( name ) == "q")  THEN
    2925        IF ( .NOT. ALLOCATED( q_c ) ) ALLOCATE( q_c(0:nzc+1, js:je, is:ie) )
     2980       IF ( .NOT. ALLOCATED( q_c ) )  ALLOCATE( q_c(0:nzc+1,js:je,is:ie) )
    29262981       p_3d => q_c
    29272982    ELSEIF ( TRIM( name ) == "qc")  THEN
    2928        IF ( .NOT. ALLOCATED( qcc ) ) ALLOCATE( qcc(0:nzc+1, js:je, is:ie) )
     2983       IF ( .NOT. ALLOCATED( qcc ) )  ALLOCATE( qcc(0:nzc+1,js:je,is:ie) )
    29292984       p_3d => qcc
    29302985    ELSEIF ( TRIM( name ) == "qr")  THEN
    2931        IF ( .NOT. ALLOCATED( qrc ) ) ALLOCATE( qrc(0:nzc+1, js:je, is:ie) )
     2986       IF ( .NOT. ALLOCATED( qrc ) )  ALLOCATE( qrc(0:nzc+1,js:je,is:ie) )
    29322987       p_3d => qrc
    29332988    ELSEIF ( TRIM( name ) == "nr")  THEN
    2934        IF ( .NOT. ALLOCATED( nrc ) ) ALLOCATE( nrc(0:nzc+1, js:je, is:ie) )
     2989       IF ( .NOT. ALLOCATED( nrc ) )  ALLOCATE( nrc(0:nzc+1,js:je,is:ie) )
    29352990       p_3d => nrc
    29362991    ELSEIF ( TRIM( name ) == "nc")  THEN
    2937        IF ( .NOT. ALLOCATED( ncc ) ) ALLOCATE( ncc(0:nzc+1, js:je, is:ie) )
     2992       IF ( .NOT. ALLOCATED( ncc ) )  ALLOCATE( ncc(0:nzc+1,js:je,is:ie) )
    29382993       p_3d => ncc
    29392994    ELSEIF ( TRIM( name ) == "s")  THEN
    2940        IF ( .NOT. ALLOCATED( sc ) ) ALLOCATE( sc(0:nzc+1, js:je, is:ie) )
     2995       IF ( .NOT. ALLOCATED( sc ) )  ALLOCATE( sc(0:nzc+1,js:je,is:ie) )
    29412996       p_3d => sc
     2997    ELSEIF ( TRIM( name(1:5) ) == "chem_" )  THEN
     2998       IF ( .NOT. ALLOCATED( chem_spec_c ) )                                   &
     2999          ALLOCATE( chem_spec_c(0:nzc+1,js:je,is:ie,1:nspec) )
     3000       p_3d => chem_spec_c(:,:,:,n)
    29423001    !ELSEIF (trim(name) == "z0") then
    29433002       !IF (.not.allocated(z0c))  allocate(z0c(js:je, is:ie))
     
    30013060    IMPLICIT NONE
    30023061
    3003     INTEGER(iwp) ::  i          !:
    3004     INTEGER(iwp) ::  icl        !:
    3005     INTEGER(iwp) ::  icr        !:
    3006     INTEGER(iwp) ::  j          !:
    3007     INTEGER(iwp) ::  jcn        !:
    3008     INTEGER(iwp) ::  jcs        !:
    3009     INTEGER(iwp) ::  k          !:
    3010 
    3011     REAL(wp) ::  waittime       !:
     3062    INTEGER(iwp) ::  i          !<
     3063    INTEGER(iwp) ::  icl        !<
     3064    INTEGER(iwp) ::  icr        !<
     3065    INTEGER(iwp) ::  j          !<
     3066    INTEGER(iwp) ::  jcn        !<
     3067    INTEGER(iwp) ::  jcs        !<
     3068    INTEGER(iwp) ::  k          !<
     3069    INTEGER(iwp) ::  n          !< running index for chemical species
     3070
     3071    REAL(wp) ::  waittime       !<
    30123072
    30133073!
     
    30633123          CALL pmci_interp_tril_all ( s, sc, ico, jco, kco, r1xo, r2xo, r1yo,   &
    30643124                                      r2yo, r1zo, r2zo, 's' )
     3125       ENDIF
     3126
     3127       IF ( air_chemistry )  THEN
     3128          DO  n = 1, nspec
     3129             CALL pmci_interp_tril_all ( chem_species(n)%conc,                 &
     3130                                         chem_spec_c(:,:,:,n),                 &
     3131                                         ico, jco, kco, r1xo, r2xo, r1yo,      &
     3132                                         r2yo, r1zo, r2zo, 's' )
     3133          ENDDO
    30653134       ENDIF
    30663135
     
    37073776     
    37083777       IMPLICIT NONE
     3778
     3779       INTEGER(iwp) ::  n          !< running index for number of chemical species
    37093780     
    37103781!
     
    37873858             ENDIF
    37883859
     3860             IF ( air_chemistry )  THEN
     3861                DO  n = 1, nspec
     3862                   CALL pmci_interp_tril_lr( chem_species(n)%conc,              &
     3863                                             chem_spec_c(:,:,:,n),              &
     3864                                             ico, jco, kco, r1xo, r2xo,         &
     3865                                             r1yo, r2yo, r1zo, r2zo,            &
     3866                                             logc_u_l, logc_ratio_u_l,          &
     3867                                             nzt_topo_nestbc_l, 'l', 's' )
     3868                ENDDO
     3869             ENDIF
     3870
    37893871             IF ( TRIM( nesting_mode ) == 'one-way' )  THEN
    37903872                CALL pmci_extrap_ifoutflow_lr( u, 'l', 'u' )
     
    38183900                IF ( passive_scalar )  THEN
    38193901                   CALL pmci_extrap_ifoutflow_lr( s, 'l', 's' )
     3902                ENDIF
     3903
     3904                IF ( air_chemistry )  THEN
     3905                   DO  n = 1, nspec
     3906                      CALL pmci_extrap_ifoutflow_lr( chem_species(n)%conc,     &
     3907                                                     'l', 's' )
     3908                   ENDDO
    38203909                ENDIF
    38213910
     
    39033992                                          nzt_topo_nestbc_r, 'r', 's' )
    39043993
     3994             IF ( air_chemistry )  THEN
     3995                DO  n = 1, nspec
     3996                   CALL pmci_interp_tril_lr( chem_species(n)%conc,             &
     3997                                             chem_spec_c(:,:,:,n),             &
     3998                                             ico, jco, kco, r1xo, r2xo,        &
     3999                                             r1yo, r2yo, r1zo, r2zo,           &
     4000                                             logc_u_r, logc_ratio_u_r,         &
     4001                                             nzt_topo_nestbc_r, 'r', 's' )
     4002                ENDDO
     4003             ENDIF
     4004
    39054005             ENDIF
    39064006
     
    39324032                IF ( passive_scalar )  THEN
    39334033                   CALL pmci_extrap_ifoutflow_lr( s, 'r', 's' )
     4034                ENDIF
     4035
     4036                IF ( air_chemistry )  THEN
     4037                   DO  n = 1, nspec
     4038                      CALL pmci_extrap_ifoutflow_lr( chem_species(n)%conc,     &
     4039                                                     'r', 's' )
     4040                   ENDDO
    39344041                ENDIF
    39354042             ENDIF
     
    40104117             ENDIF
    40114118
     4119             IF ( air_chemistry )  THEN
     4120                DO  n = 1, nspec
     4121                   CALL pmci_interp_tril_sn( chem_species(n)%conc,              &
     4122                                             chem_spec_c(:,:,:,n),              &
     4123                                             ico, jco, kco, r1xo, r2xo,         &
     4124                                             r1yo, r2yo, r1zo, r2zo,            &
     4125                                             logc_u_s, logc_ratio_u_s,          &
     4126                                             nzt_topo_nestbc_s, 's', 's' )
     4127                ENDDO
     4128             ENDIF
     4129
    40124130             IF ( TRIM( nesting_mode ) == 'one-way' )  THEN
    40134131                CALL pmci_extrap_ifoutflow_sn( u, 's', 'u' )
     
    40384156                IF ( passive_scalar )  THEN
    40394157                   CALL pmci_extrap_ifoutflow_sn( s,  's', 's' )
     4158                ENDIF
     4159
     4160                IF ( air_chemistry )  THEN
     4161                   DO  n = 1, nspec
     4162                      CALL pmci_extrap_ifoutflow_sn( chem_species(n)%conc,     &
     4163                                                     's', 's' )
     4164                   ENDDO
    40404165                ENDIF
    40414166
     
    41204245             ENDIF
    41214246
     4247             IF ( air_chemistry )  THEN
     4248                DO  n = 1, nspec
     4249                   CALL pmci_interp_tril_sn( chem_species(n)%conc,              &
     4250                                             chem_spec_c(:,:,:,n),              &
     4251                                             ico, jco, kco, r1xo, r2xo,         &
     4252                                             r1yo, r2yo, r1zo, r2zo,            &
     4253                                             logc_u_n, logc_ratio_u_n,          &
     4254                                             nzt_topo_nestbc_n, 'n', 's' )
     4255                ENDDO
     4256             ENDIF
     4257
    41224258             IF ( TRIM( nesting_mode ) == 'one-way' )  THEN
    41234259                CALL pmci_extrap_ifoutflow_sn( u, 'n', 'u' )
     
    41474283                IF ( passive_scalar )  THEN
    41484284                   CALL pmci_extrap_ifoutflow_sn( s,  'n', 's' )
     4285                ENDIF
     4286
     4287                IF ( air_chemistry )  THEN
     4288                   DO  n = 1, nspec
     4289                      CALL pmci_extrap_ifoutflow_sn( chem_species(n)%conc,     &
     4290                                                     'n', 's' )
     4291                   ENDDO
    41494292                ENDIF
    41504293
     
    42034346       ENDIF
    42044347
     4348       IF ( air_chemistry )  THEN
     4349          DO  n = 1, nspec
     4350             CALL pmci_interp_tril_t( chem_species(n)%conc,                    &
     4351                                      chem_spec_c(:,:,:,n),                    &
     4352                                      ico, jco, kco, r1xo, r2xo,               &
     4353                                      r1yo, r2yo, r1zo, r2zo,                  &
     4354                                      's' )
     4355          ENDDO
     4356       ENDIF
     4357
    42054358       IF ( TRIM( nesting_mode ) == 'one-way' )  THEN
    42064359
     
    42354388          ENDIF
    42364389
     4390          IF ( air_chemistry )  THEN
     4391             DO  n = 1, nspec
     4392                CALL pmci_extrap_ifoutflow_t( chem_species(n)%conc, 's' )
     4393             ENDDO
     4394          ENDIF
     4395
    42374396       ENDIF
    42384397
     
    42474406!--   Note that TKE is not anterpolated.
    42484407      IMPLICIT NONE
     4408
     4409      INTEGER(iwp) ::  n          !< running index for number of chemical species
     4410
     4411
    42494412
    42504413      CALL pmci_anterp_tophat( u,  uc,  kctu, iflu, ifuu, jflo, jfuo, kflo,    &
     
    42904453         CALL pmci_anterp_tophat( s, sc, kctu, iflo, ifuo, jflo, jfuo, kflo,   &
    42914454                                  kfuo, ijfc_s, kfc_s, 's' )
     4455      ENDIF
     4456
     4457      IF ( air_chemistry )  THEN
     4458         DO  n = 1, nspec
     4459            CALL pmci_anterp_tophat( chem_species(n)%conc,                     &
     4460                                     chem_spec_c(:,:,:,n),                     &
     4461                                     kctu, iflo, ifuo, jflo, jfuo, kflo,       &
     4462                                     kfuo, ijfc_s, kfc_s, 's' )
     4463         ENDDO
    42924464      ENDIF
    42934465
     
    52015373 SUBROUTINE pmci_boundary_conds
    52025374
     5375    USE chem_modules,                                                          &
     5376        ONLY:  ibc_cs_b
     5377
    52035378    USE control_parameters,                                                    &
    52045379        ONLY:  ibc_pt_b, ibc_q_b, ibc_s_b, ibc_uv_b
     
    52135388    INTEGER(iwp) ::  k  !< Index along z-direction
    52145389    INTEGER(iwp) ::  m  !< Running index for surface type
     5390    INTEGER(iwp) ::  n  !< running index for number of chemical species
    52155391   
    52165392!
     
    53385514             j = bc_h(1)%j(m)
    53395515             k = bc_h(1)%k(m)
    5340              s(k-1,j,i) = s(k,j,i)
     5516             s(k+1,j,i) = s(k,j,i)
    53415517          ENDDO 
    53425518       ENDIF
    53435519    ENDIF
     5520!
     5521!-- Set Neumann boundary conditions for chemical species
     5522    IF ( air_chemistry )  THEN
     5523       IF ( ibc_cs_b == 1 )  THEN
     5524          DO  n = 1, nspec
     5525             DO  m = 1, bc_h(0)%ns
     5526                i = bc_h(0)%i(m)           
     5527                j = bc_h(0)%j(m)
     5528                k = bc_h(0)%k(m)
     5529                chem_species(n)%conc(k-1,j,i) = chem_species(n)%conc(k,j,i)
     5530             ENDDO
     5531             DO  m = 1, bc_h(1)%ns
     5532                i = bc_h(1)%i(m)           
     5533                j = bc_h(1)%j(m)
     5534                k = bc_h(1)%k(m)
     5535                chem_species(n)%conc(k+1,j,i) = chem_species(n)%conc(k,j,i)
     5536             ENDDO
     5537          ENDDO
     5538       ENDIF
     5539    ENDIF
    53445540
    53455541 END SUBROUTINE pmci_boundary_conds
  • palm/trunk/SOURCE/time_integration.f90

    r2766 r2773  
    2525! -----------------
    2626! $Id$
     27! - Nesting for chemical species
     28!
     29! 2766 2018-01-22 17:17:47Z kanani
    2730! Removed preprocessor directive __chem
    2831!
     
    756759                IF ( passive_scalar )  CALL exchange_horiz( s, nbgp )
    757760                IF ( .NOT. constant_diffusion )  CALL exchange_horiz( e, nbgp )
     761
     762                IF ( air_chemistry )  THEN
     763                   DO  n = 1, nspec     
     764                      CALL exchange_horiz( chem_species(n)%conc, nbgp )
     765                   ENDDO
     766                ENDIF
     767
    758768             ENDIF
    759769!
Note: See TracChangeset for help on using the changeset viewer.