Ignore:
Timestamp:
Apr 8, 2019 6:41:49 PM (5 years ago)
Author:
knoop
Message:

Moved "photolysis_scheme", "chem_species" and "phot_frequen" to chem_modules

File:
1 edited

Legend:

Unmodified
Added
Removed
  • palm/trunk/SOURCE/multi_agent_system_mod.f90

    r3833 r3876  
    27752775           ONLY:  u, v, pt, exner
    27762776
    2777 !       USE chemistry_model_mod,                                                &
    2778 !           ONLY:  chem_species
    2779 
    2780 !       USE control_parameters,                                                 &
    2781 !              ONLY:  air_chemistry
    2782 
    27832777       IMPLICIT NONE
    27842778
     
    28462840!--                Calculate temperature at agent position
    28472841                   agents(nl)%t = pt(kl,jl,il) * exner(kl)
    2848 ! !
    2849 ! !--                Get PM10 concentration at agent position, if possible
    2850 !                    IF ( ind_pm10 == -9 ) THEN
    2851 !                       agents(nl)%pm10 = 0.0_wp
    2852 !                    ELSE
    2853 !                       agents(nl)%pm10 = chem_species(ind_pm10)%conc(kl,jl,il)
    2854 !                    ENDIF
    2855 ! !
    2856 ! !--                Get PM10 concentration at agent position, if possible
    2857 !                    IF ( ind_pm25 == -9 ) THEN
    2858 !                       agents(nl)%pm25 = 0.0_wp
    2859 !                    ELSE
    2860 !                       agents(nl)%pm25 = chem_species(ind_pm25)%conc(kl,jl,il)
    2861 !                    ENDIF
     2842
    28622843                ENDDO
    28632844
     
    30172998    SUBROUTINE mas_init
    30182999
    3019 !       USE chem_gasphase_mod,                                                  &
    3020 !           ONLY:  nvar
    3021 
    3022 !       USE chemistry_model_mod,                                                &
    3023 !           ONLY:  chem_species
    3024 
    30253000       USE control_parameters,                                                 &
    30263001           ONLY:  coupling_char, initializing_actions, io_blocks, io_group
     
    31083083          ENDDO
    31093084       ENDDO
    3110 ! !
    3111 ! !--    Get indices of PM10 and PM2.5 species, if active
    3112 !        IF ( air_chemistry ) THEN
    3113 !           DO il = 1, nvar
    3114 ! print*,chem_species(il)%name
    3115 ! !              IF ( spec_name(1:4) == 'PM10' ) THEN 
    3116 ! !                 ind_pm10 = il
    3117 ! !              ELSEIF ( spec_name(1:4) == 'PM25' ) THEN
    3118 ! !                 ind_pm25 = il
    3119 ! !              ENDIF
    3120 !
    3121 !           ENDDO
    3122 !        ENDIF
    3123 ! stop
     3085
    31243086       CALL mas_create_obstacle_flags
    31253087
Note: See TracChangeset for help on using the changeset viewer.