SUBROUTINE readaerosolstrato(debut) USE netcdf95, ONLY: nf95_close, nf95_gw_var, nf95_inq_dimid, & nf95_inq_varid, nf95_open USE netcdf, ONLY: nf90_get_var, nf90_noerr, nf90_nowrite USE phys_cal_mod, ONLY: mth_cur USE lmdz_grid_phy, ONLY: nbp_lon, nbp_lat, klon_glo, & grid2dto1d_glo, grid_type, unstructured USE lmdz_phys_mpi_data, ONLY: is_mpi_root USE lmdz_phys_omp_data, ONLY: is_omp_root USE lmdz_phys_para USE phys_state_var_mod USE phys_local_var_mod USE aero_mod USE dimphy USE lmdz_print_control, ONLY: prt_level, lunout USE lmdz_xios USE lmdz_abort_physic, ONLY: abort_physic IMPLICIT NONE include "YOMCST.h" ! Variable input LOGICAL debut ! Variables locales INTEGER n_lat ! number of latitudes in the input data INTEGER n_lon ! number of longitudes in the input data INTEGER n_lev ! number of levels in the input data INTEGER n_month ! number of months in the input data REAL, ALLOCATABLE :: latitude(:) REAL, ALLOCATABLE :: longitude(:) REAL, ALLOCATABLE :: time(:) REAL, ALLOCATABLE :: lev(:) INTEGER i, k, band, wave INTEGER, save :: mth_pre = 1 !$OMP THREADPRIVATE(mth_pre) REAL, ALLOCATABLE, DIMENSION(:, :), save :: tau_aer_strat !$OMP THREADPRIVATE(tau_aer_strat) ! Champs reconstitues REAL, ALLOCATABLE :: tauaerstrat(:, :, :, :) REAL, ALLOCATABLE :: tauaerstrat_mois(:, :, :) REAL, ALLOCATABLE :: tauaerstrat_mois_glo(:, :) REAL, ALLOCATABLE :: tau_aer_strat_mpi(:, :) ! For NetCDF: INTEGER ncid_in ! IDs for input files INTEGER varid, ncerr ! Stratospheric aerosols optical properties ! alpha_strat over the 2 bands is normalised by the 550 nm extinction coefficient ! alpha_strat_wave is *not* normalised by the 550 nm extinction coefficient REAL, DIMENSION(nbands) :: alpha_strat, piz_strat, cg_strat data alpha_strat/0.9922547, 0.7114912 / data piz_strat /0.9999998, 0.99762493/ data cg_strat /0.73107845, 0.73229635/ REAL, DIMENSION(nwave_sw) :: alpha_strat_wave data alpha_strat_wave/3.36780953, 3.34667683, 3.20444202, 3.0293026, 2.82108808/ CHARACTER (len = 20) :: modname = 'readaerosolstrato' CHARACTER (len = 80) :: abort_message !-------------------------------------------------------- IF (.NOT.ALLOCATED(tau_aer_strat)) ALLOCATE(tau_aer_strat(klon, klev)) !--only read file if beginning of run or start of new month IF (debut.OR.mth_cur/=mth_pre) THEN !--only root reads IF (is_mpi_root.AND.is_omp_root) THEN IF (nbands/=2) THEN abort_message = 'nbands doit etre egal a 2 dans readaerosolstrat' CALL abort_physic(modname, abort_message, 1) ENDIF CALL nf95_open("taustrat.nc", nf90_nowrite, ncid_in) CALL nf95_inq_varid(ncid_in, "LEV", varid) CALL nf95_gw_var(ncid_in, varid, lev) n_lev = size(lev) IF (n_lev/=klev) THEN abort_message = 'Le nombre de niveaux n est pas egal a klev' CALL abort_physic(modname, abort_message, 1) ENDIF CALL nf95_inq_varid(ncid_in, "LAT", varid) CALL nf95_gw_var(ncid_in, varid, latitude) n_lat = size(latitude) WRITE(lunout, *) 'LAT aerosol strato=', n_lat, latitude IF (grid_type/=unstructured) THEN IF (n_lat/=nbp_lat) THEN abort_message = 'Le nombre de lat n est pas egal a nbp_lat' CALL abort_physic(modname, abort_message, 1) ENDIF ENDIF CALL nf95_inq_varid(ncid_in, "LON", varid) CALL nf95_gw_var(ncid_in, varid, longitude) n_lon = size(longitude) IF (grid_type/=unstructured) THEN WRITE(lunout, *) 'LON aerosol strato=', n_lon, longitude IF (n_lon/=nbp_lon) THEN abort_message = 'Le nombre de lon n est pas egal a nbp_lon' CALL abort_physic(modname, abort_message, 1) ENDIF ENDIF CALL nf95_inq_varid(ncid_in, "TIME", varid) CALL nf95_gw_var(ncid_in, varid, time) n_month = size(time) WRITE(lunout, *) 'TIME aerosol strato=', n_month, time IF (n_month/=12) THEN abort_message = 'Le nombre de month n est pas egal a 12' CALL abort_physic(modname, abort_message, 1) ENDIF IF (.NOT.ALLOCATED(tauaerstrat)) ALLOCATE(tauaerstrat(n_lon, n_lat, n_lev, n_month)) IF (.NOT.ALLOCATED(tauaerstrat_mois)) ALLOCATE(tauaerstrat_mois(n_lon, n_lat, n_lev)) IF (.NOT.ALLOCATED(tauaerstrat_mois_glo)) ALLOCATE(tauaerstrat_mois_glo(klon_glo, n_lev)) !--reading stratospheric AOD at 550 nm CALL nf95_inq_varid(ncid_in, "TAUSTRAT", varid) ncerr = nf90_get_var(ncid_in, varid, tauaerstrat) WRITE(lunout, *) 'code erreur readaerosolstrato=', ncerr, varid CALL nf95_close(ncid_in) !---select the correct month IF (mth_cur<1.OR.mth_cur>12) THEN WRITE(lunout, *) 'probleme avec le mois dans readaerosolstrat =', mth_cur ENDIF tauaerstrat_mois(:, :, :) = tauaerstrat(:, :, :, mth_cur) !---reduce to a klon_glo grid CALL grid2dTo1d_glo(tauaerstrat_mois, tauaerstrat_mois_glo) ELSE ALLOCATE(tauaerstrat_mois(0, 0, 0)) ENDIF !--is_mpi_root and is_omp_root !$OMP BARRIER IF (grid_type==unstructured) THEN IF (is_omp_master) THEN CALL xios_send_field("taustrat_in", tauaerstrat_mois) ALLOCATE(tau_aer_strat_mpi(klon_mpi, klev)) CALL xios_recv_field("taustrat_out", tau_aer_strat_mpi) ELSE ALLOCATE(tau_aer_strat_mpi(0, 0)) ENDIF CALL scatter_omp(tau_aer_strat_mpi, tau_aer_strat) ELSE !--scatter on all proc CALL scatter(tauaerstrat_mois_glo, tau_aer_strat) ENDIF !--keep memory of previous month mth_pre = mth_cur IF (is_mpi_root.AND.is_omp_root) THEN DEALLOCATE(tauaerstrat) DEALLOCATE(tauaerstrat_mois) DEALLOCATE(tauaerstrat_mois_glo) ENDIF !-is_mpi_root and is_omp_root !$OMP BARRIER ENDIF !--debut ou nouveau mois !--total vertical aod at the 6 wavelengths DO wave = 1, nwave_sw DO k = 1, klev tausum_aero(:, wave, id_STRAT_phy) = tausum_aero(:, wave, id_STRAT_phy) + tau_aer_strat(:, k) * alpha_strat_wave(wave) / alpha_strat_wave(2) ENDDO ENDDO !--weighted average for cg, piz and tau, adding strat aerosols on top of tropospheric ones DO band = 1, nbands !--anthropogenic aerosols bands 1 and 2 cg_aero(:, :, 3, band) = (cg_aero(:, :, 3, band) * piz_aero(:, :, 3, band) * tau_aero(:, :, 3, band) + & cg_strat(band) * piz_strat(band) * alpha_strat(band) * tau_aer_strat(:, :)) / & MAX(piz_aero(:, :, 3, band) * tau_aero(:, :, 3, band) + & piz_strat(band) * alpha_strat(band) * tau_aer_strat(:, :), 1.e-15) piz_aero(:, :, 3, band) = (piz_aero(:, :, 3, band) * tau_aero(:, :, 3, band) + & piz_strat(band) * alpha_strat(band) * tau_aer_strat(:, :)) / & MAX(tau_aero(:, :, 3, band) + alpha_strat(band) * tau_aer_strat(:, :), 1.e-15) tau_aero(:, :, 3, band) = tau_aero(:, :, 3, band) + alpha_strat(band) * tau_aer_strat(:, :) !--natural aerosols bands 1 and 2 cg_aero(:, :, 2, band) = (cg_aero(:, :, 2, band) * piz_aero(:, :, 2, band) * tau_aero(:, :, 2, band) + & cg_strat(band) * piz_strat(band) * alpha_strat(band) * tau_aer_strat(:, :)) / & MAX(piz_aero(:, :, 2, band) * tau_aero(:, :, 2, band) + & piz_strat(band) * alpha_strat(band) * tau_aer_strat(:, :), 1.e-15) piz_aero(:, :, 2, band) = (piz_aero(:, :, 2, band) * tau_aero(:, :, 2, band) + & piz_strat(band) * alpha_strat(band) * tau_aer_strat(:, :)) / & MAX(tau_aero(:, :, 2, band) + alpha_strat(band) * tau_aer_strat(:, :), 1.e-15) tau_aero(:, :, 2, band) = tau_aero(:, :, 2, band) + alpha_strat(band) * tau_aer_strat(:, :) ENDDO END SUBROUTINE readaerosolstrato