Ignore:
Timestamp:
Oct 25, 2018, 5:25:58 PM (6 years ago)
Author:
jvatant
Message:

Radiative transfer init minor change
-> Make L_NGAUSS be read by master in g.dat by sugas_corrk as for L_NPREF,L_NTREF ...
-- JVO.

Location:
trunk/LMDZ.TITAN/libf/phytitan
Files:
4 edited

Legend:

Unmodified
Added
Removed
  • trunk/LMDZ.TITAN/libf/phytitan/callcorrk.F90

    r1947 r2026  
    461461        IF( ALLOCATED( tgasref ) ) DEALLOCATE( tgasref )
    462462        IF( ALLOCATED( pfgasref ) ) DEALLOCATE( pfgasref )
     463        IF( ALLOCATED( gweight ) ) DEALLOCATE( gweight )
    463464!$OMP END MASTER
    464465!$OMP BARRIER
  • trunk/LMDZ.TITAN/libf/phytitan/radcommon_h.F90

    r1947 r2026  
    5555      !!! ALLOCATABLE STUFF SO THAT DIMENSIONS ARE READ in *.dat FILES -- AS 12/2011 
    5656      REAL*8, DIMENSION(:,:,:,:,:), ALLOCATABLE :: gasi, gasv
    57       REAL*8, DIMENSION(:), ALLOCATABLE :: PGASREF, TGASREF, PFGASREF
     57      REAL*8, DIMENSION(:), ALLOCATABLE :: PGASREF, TGASREF, PFGASREF, GWEIGHT
    5858      real*8 FZEROI(L_NSPECTI)
    5959      real*8 FZEROV(L_NSPECTV)
     
    7373      real*8,parameter :: UBARI = 0.5D0
    7474
    75       real*8,save :: gweight(L_NGAUSS)
    7675!$OMP THREADPRIVATE(QREFvis,QREFir,omegaREFvis,omegaREFir,&     ! gweight read by master in sugas_corrk
    7776                !$OMP tstellar,planckir,PTOP)
  • trunk/LMDZ.TITAN/libf/phytitan/radinc_h.F90

    r1822 r2026  
    5858      ! These are set in sugas_corrk
    5959      ! [uses allocatable arrays] -- AS 12/2011
    60       integer :: L_NPREF, L_NTREF, L_REFVAR, L_PINT   !L_NPREF, L_NTREF, L_REFVAR, L_PINT read by master in sugas_corrk
    61 
    62       integer, parameter :: L_NGAUSS  = 17
     60      integer :: L_NPREF, L_NTREF, L_REFVAR, L_PINT, L_NGAUSS  !L_NPREF, L_NTREF, L_REFVAR, L_PINT, L_NGAUSS read by master in sugas_corrk
    6361
    6462      integer, parameter :: L_NSPECTI = NBinfrared
  • trunk/LMDZ.TITAN/libf/phytitan/sugas_corrk.F90

    r1822 r2026  
    3737
    3838      integer n, nt, np, nh, ng, nw, m, i
    39       integer L_NGAUSScheck
    4039
    4140      character(len=200) :: file_id
     
    107106      ! check the array size is correct, load the coefficients
    108107      open(111,file=TRIM(file_path),form='formatted')
    109       read(111,*) L_NGAUSScheck
    110       if(.not.(L_NGAUSScheck.eq.L_NGAUSS)) then
    111          print*,'The size of your radiative transfer g-space array does '
    112          print*,'not match the value given in g.dat, exiting.'
    113          call abort
    114       endif
     108      read(111,*) L_NGAUSS
     109      IF( .NOT. ALLOCATED( gweight ) ) ALLOCATE( GWEIGHT(L_NGAUSS) )
    115110      read(111,*) gweight
    116111      close(111)
Note: See TracChangeset for help on using the changeset viewer.