Changeset 1441


Ignore:
Timestamp:
Jun 4, 2015, 10:21:20 AM (9 years ago)
Author:
emillour
Message:

Updates in common dynamics (seq and ) to keep up with updates
in LMDZ5 (up to LMDZ5 trunk, rev 2250):

  • compilation:
  • added test in grid/dimension/makdim to check that # of longitudes is a multiple of 8
  • dyn3d_common:

Bug correction concerning zoom (cf LMDZ5 rev 2218)

  • coefpoly.F becomes coefpoly_m.F90 (in misc)
  • fxhyp.F => fxhyp_m.F90 , fyhyp.F => fyhyp_m.F90
  • new routines for zoom: invert_zoom_x_m.F90 and principal_cshift_m.F90
  • inigeom.F adapted to new zoom definition routines
  • fluxstokenc.F : got rid of calls to initial0()
  • dyn3d:
  • advtrac.F90 : got rid of calls to initial0()
  • conf_gcm.F90 : cosmetic changes and change in default dzoomx,dzoomy values
  • guide_mod.F90 : followed updates from Earth Model
  • gcm.F is now gcm.F90
  • dyn3dpar:
  • advtrac_p.F90, covcont_p.F90, mod_hallo.F90 : cosmetic changes
  • conf_gcm.F90 : cosmetic and changed in default dzoomx,dzoomy values
  • parallel_lmdz.F90 : updates to keep up with Earth model
  • misc:
  • arth.F90 becomes arth_m.F90
  • wxios.F90 updated wrt Earth model changes
  • nrtype.F90 and coefpoly_m.F90 added
  • ran1.F, sort.F, minmax.F, minmax2.F, juldate.F moved over from dyn3d_common

EM

Location:
trunk
Files:
3 added
15 edited
10 moved

Legend:

Unmodified
Added
Removed
  • trunk/DOC/chantiers/commit_importants.log

    r1403 r1441  
    15231523* phy***/dyn1d: this subdirectory contains the 1D model using physics
    15241524  from phy***
     1525
     1526**********************
     1527**** commit_v1441 ****
     1528**********************
     1529Ehouarn: Updates in the dynamics (seq and //) to keep up with updates
     1530in LMDZ5 (up to LMDZ5 trunk, rev 2250):
     1531* compilation:
     1532- added test in grid/dimension/makdim to check that # of longitudes
     1533  is a multiple of 8
     1534
     1535* dyn3d_common:
     1536Bug correction concerning zoom (cf LMDZ5 rev 2218)
     1537- coefpoly.F becomes coefpoly_m.F90 (in misc)
     1538- fxhyp.F => fxhyp_m.F90 , fyhyp.F => fyhyp_m.F90
     1539- new routines for zoom: invert_zoom_x_m.F90 and principal_cshift_m.F90 
     1540- inigeom.F adapted to new zoom definition routines
     1541- fluxstokenc.F : got rid of calls to initial0()
     1542
     1543* dyn3d:
     1544- advtrac.F90 : got rid of calls to initial0()
     1545- conf_gcm.F90 : cosmetic changes and change in default dzoomx,dzoomy values
     1546- guide_mod.F90 : followed updates from Earth Model
     1547- gcm.F is now gcm.F90
     1548
     1549* dyn3dpar:
     1550- advtrac_p.F90, covcont_p.F90, mod_hallo.F90 : cosmetic changes
     1551- conf_gcm.F90 : cosmetic and changed in default dzoomx,dzoomy values
     1552- parallel_lmdz.F90 : updates to keep up with Earth model
     1553
     1554* misc:
     1555- arth.F90 becomes arth_m.F90
     1556- wxios.F90 updated wrt Earth model changes
     1557- nrtype.F90 and coefpoly_m.F90 added
     1558- ran1.F, sort.F, minmax.F, minmax2.F, juldate.F moved over from dyn3d_common
     1559
  • trunk/LMDZ.COMMON/libf/dyn3d/advtrac.F90

    r1422 r1441  
    7474
    7575  IF(iadvtr.EQ.0) THEN
    76      CALL initial0(ijp1llm,pbaruc)
    77      CALL initial0(ijmllm,pbarvc)
     76     pbaruc(:,:)=0
     77     pbarvc(:,:)=0
    7878  ENDIF
    7979
  • trunk/LMDZ.COMMON/libf/dyn3d/conf_gcm.F90

    r1422 r1441  
    3434!     -metres  du zoom  avec  celles lues sur le fichier start .
    3535!
    36   LOGICAL etatinit
    37   INTEGER tapedef
     36  LOGICAL,INTENT(IN) :: etatinit
     37  INTEGER,INTENT(IN) :: tapedef
    3838
    3939!   Declarations :
     
    4444  include "iniprint.h"
    4545
    46 ! FH 2008/05/09 On elimine toutes les clefs physiques dans la dynamique
    47 ! #include "clesphys.h"
    48 !
    49 !
    5046!   local:
    5147!   ------
     
    858854     !Config  Help = extension en longitude  de la zone du zoom 
    859855     !Config         ( fraction de la zone totale)
    860      dzoomx = 0.0
     856     dzoomx = 0.2
    861857     CALL getin('dzoomx',dzoomx)
     858     call assert(dzoomx < 1, "conf_gcm: dzoomx must be < 1")
    862859
    863860     !Config  Key  = dzoomy
     
    866863     !Config  Help = extension en latitude de la zone  du zoom 
    867864     !Config         ( fraction de la zone totale)
    868      dzoomy = 0.0
     865     dzoomy = 0.2
    869866     CALL getin('dzoomy',dzoomy)
     867     call assert(dzoomy < 1, "conf_gcm: dzoomy must be < 1")
    870868
    871869     !Config  Key  = taux
  • trunk/LMDZ.COMMON/libf/dyn3d/fluxstokenc.F

    r1422 r1441  
    8080
    8181      IF(iadvtr.EQ.0) THEN
    82          CALL initial0(ijp1llm,phic)
    83          CALL initial0(ijp1llm,tetac)
    84          CALL initial0(ijp1llm,pbaruc)
    85          CALL initial0(ijmllm,pbarvc)
     82         phic(:,:)=0
     83         tetac(:,:)=0
     84         pbaruc(:,:)=0
     85         pbarvc(:,:)=0
    8686      ENDIF
    8787
  • trunk/LMDZ.COMMON/libf/dyn3d/gcm.F90

    r1440 r1441  
    22! $Id: gcm.F 1446 2010-10-22 09:27:25Z emillour $
    33!
    4 c
    5 c
    6       PROGRAM gcm
     4!
     5!
     6PROGRAM gcm
    77
    88#ifdef CPP_IOIPSL
    9       USE IOIPSL
     9  USE IOIPSL
    1010#else
    11 ! if not using IOIPSL, we still need to use (a local version of) getin
    12       USE ioipsl_getincom
     11  ! if not using IOIPSL, we still need to use (a local version of) getin
     12  USE ioipsl_getincom
    1313#endif
    1414
    1515
    1616#ifdef CPP_XIOS
    17     ! ug Pour les sorties XIOS
    18         USE wxios
    19 #endif
    20 
    21       USE filtreg_mod
    22       USE infotrac
    23       USE control_mod, only: planet_type,nday,day_step,iperiod,iphysiq,
    24      &                       raz_date,anneeref,starttime,dayref,
    25      &                       ok_dyn_ins,ok_dyn_ave,iecri,periodav,
    26      &                       less1day,fractday,ndynstep,nsplit_phys
    27       use cpdet_mod, only: ini_cpdet
    28       USE temps_mod, ONLY: calend,start_time,annee_ref,day_ref,
    29      .          itau_dyn,itau_phy,day_ini,jD_ref,jH_ref,day_end
     17  ! ug Pour les sorties XIOS
     18  USE wxios
     19#endif
     20
     21  USE filtreg_mod
     22  USE infotrac
     23  USE control_mod, only: planet_type,nday,day_step,iperiod,iphysiq, &
     24                             raz_date,anneeref,starttime,dayref,    &
     25                             ok_dyn_ins,ok_dyn_ave,iecri,periodav,  &
     26                             less1day,fractday,ndynstep,nsplit_phys
     27  use cpdet_mod, only: ini_cpdet
     28  USE temps_mod, ONLY: calend,start_time,annee_ref,day_ref, &
     29                itau_dyn,itau_phy,day_ini,jD_ref,jH_ref,day_end
    3030
    3131#ifdef INCA
    3232! Only INCA needs these informations (from the Earth's physics)
    33       USE indice_sol_mod
     33  USE indice_sol_mod
     34  USE mod_phys_lmdz_para, ONLY : klon_mpi_para_nb
    3435#endif
    3536
     
    4344!      USE comgeomphy, ONLY: initcomgeomphy
    4445#endif
    45 #ifdef INCA
    46       USE mod_phys_lmdz_para, ONLY : klon_mpi_para_nb
    47 #endif
    48       USE comconst_mod, ONLY: daysec,dtvr,dtphys,rad,g,r,cpp
    49       USE logic_mod, ONLY: read_start,iflag_phys,ok_guide,ecripar
     46
     47  USE comconst_mod, ONLY: daysec,dtvr,dtphys,rad,g,r,cpp
     48  USE logic_mod, ONLY: read_start,iflag_phys,ok_guide,ecripar
    5049
    5150!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    5251
    53       IMPLICIT NONE
    54 
    55 c      ......   Version  du 10/01/98    ..........
    56 
    57 c             avec  coordonnees  verticales hybrides
    58 c   avec nouveaux operat. dissipation * ( gradiv2,divgrad2,nxgraro2 )
    59 
    60 c=======================================================================
    61 c
    62 c   Auteur:  P. Le Van /L. Fairhead/F.Hourdin
    63 c   -------
    64 c
    65 c   Objet:
    66 c   ------
    67 c
    68 c   GCM LMD nouvelle grille
    69 c
    70 c=======================================================================
    71 c
    72 c  ... Dans inigeom , nouveaux calculs pour les elongations  cu , cv
    73 c      et possibilite d'appeler une fonction f(y)  a derivee tangente
    74 c      hyperbolique a la  place de la fonction a derivee sinusoidale.
    75 c  ... Possibilite de choisir le schema pour l'advection de
    76 c        q  , en modifiant iadv dans traceur.def  (MAF,10/02) .
    77 c
    78 c      Pour Van-Leer + Vapeur d'eau saturee, iadv(1)=4. (F.Codron,10/99)
    79 c      Pour Van-Leer iadv=10
    80 c
    81 c-----------------------------------------------------------------------
    82 c   Declarations:
    83 c   -------------
    84 
    85 #include "dimensions.h"
    86 #include "paramet.h"
    87 #include "comdissnew.h"
    88 #include "comgeom.h"
     52  IMPLICIT NONE
     53
     54  !      ......   Version  du 10/01/98    ..........
     55
     56  !             avec  coordonnees  verticales hybrides
     57  !   avec nouveaux operat. dissipation * ( gradiv2,divgrad2,nxgraro2 )
     58
     59  !=======================================================================
     60  !
     61  !   Auteur:  P. Le Van /L. Fairhead/F.Hourdin
     62  !   -------
     63  !
     64  !   Objet:
     65  !   ------
     66  !
     67  !   GCM LMD nouvelle grille
     68  !
     69  !=======================================================================
     70  !
     71  !  ... Dans inigeom , nouveaux calculs pour les elongations  cu , cv
     72  !      et possibilite d'appeler une fonction f(y)  a derivee tangente
     73  !      hyperbolique a la  place de la fonction a derivee sinusoidale.
     74  !  ... Possibilite de choisir le schema pour l'advection de
     75  !        q  , en modifiant iadv dans traceur.def  (MAF,10/02) .
     76  !
     77  !      Pour Van-Leer + Vapeur d'eau saturee, iadv(1)=4. (F.Codron,10/99)
     78  !      Pour Van-Leer iadv=10
     79  !
     80  !-----------------------------------------------------------------------
     81  !   Declarations:
     82  !   -------------
     83
     84  include "dimensions.h"
     85  include "paramet.h"
     86  include "comdissnew.h"
     87  include "comgeom.h"
    8988!!!!!!!!!!!#include "control.h"
    9089!#include "com_io_dyn.h"
    91 #include "iniprint.h"
    92 #include "tracstoke.h"
     90  include "iniprint.h"
     91  include "tracstoke.h"
    9392#ifdef INCA
    9493! Only INCA needs these informations (from the Earth's physics)
     
    9796
    9897
    99       REAL zdtvr
    100 
    101 c   variables dynamiques
    102       REAL vcov(ip1jm,llm),ucov(ip1jmp1,llm) ! vents covariants
    103       REAL teta(ip1jmp1,llm)                 ! temperature potentielle
    104       REAL, ALLOCATABLE, DIMENSION(:,:,:):: q! champs advectes
    105       REAL ps(ip1jmp1)                       ! pression  au sol
    106       REAL p (ip1jmp1,llmp1  )               ! pression aux interfac.des couches
    107       REAL masse(ip1jmp1,llm)                ! masse d'air
    108       REAL phis(ip1jmp1)                     ! geopotentiel au sol
    109       REAL phi(ip1jmp1,llm)                  ! geopotentiel
    110       REAL w(ip1jmp1,llm)                    ! vitesse verticale
    111 
    112 c variables dynamiques intermediaire pour le transport
    113 
    114 c   variables pour le fichier histoire
    115       REAL dtav      ! intervalle de temps elementaire
    116 
    117       REAL time_0
    118 
    119       LOGICAL lafin
    120       INTEGER ij,iq,l,i,j
    121 
    122 
    123       real time_step, t_wrt, t_ops
    124 
    125       LOGICAL first
    126 
    127 !      LOGICAL call_iniphys
    128 !      data call_iniphys/.true./
    129 
    130 c+jld variables test conservation energie
    131 c      REAL ecin(ip1jmp1,llm),ecin0(ip1jmp1,llm)
    132 C     Tendance de la temp. potentiel d (theta)/ d t due a la
    133 C     tansformation d'energie cinetique en energie thermique
    134 C     cree par la dissipation
    135       REAL dhecdt(ip1jmp1,llm)
    136 c      REAL vcont(ip1jm,llm),ucont(ip1jmp1,llm)
    137 c      REAL      d_h_vcol, d_qt, d_qw, d_ql, d_ec
    138       CHARACTER (len=15) :: ztit
    139 c-jld
    140 
    141 
    142       character (len=80) :: dynhist_file, dynhistave_file
    143       character (len=20) :: modname
    144       character (len=80) :: abort_message
    145 ! locales pour gestion du temps
    146       INTEGER :: an, mois, jour
    147       REAL :: heure
    148 
    149 
    150 c-----------------------------------------------------------------------
    151 c    variables pour l'initialisation de la physique :
    152 c    ------------------------------------------------
    153 !      INTEGER ngridmx
    154 !      PARAMETER( ngridmx = 2+(jjm-1)*iim - 1/jjm   )
    155 !      REAL zcufi(ngridmx),zcvfi(ngridmx)
    156 !      REAL latfi(ngridmx),lonfi(ngridmx)
    157 !      REAL airefi(ngridmx)
    158 !      SAVE latfi, lonfi, airefi
    159 
    160 c-----------------------------------------------------------------------
    161 c   Initialisations:
    162 c   ----------------
    163 
    164       abort_message = 'last timestep reached'
    165       modname = 'gcm'
    166       lafin    = .FALSE.
    167       dynhist_file = 'dyn_hist.nc'
    168       dynhistave_file = 'dyn_hist_ave.nc'
    169 
    170 
    171 
    172 c----------------------------------------------------------------------
    173 c  lecture des fichiers gcm.def ou run.def
    174 c  ---------------------------------------
    175 c
    176 ! Ehouarn: dump possibility of using defrun
    177 !#ifdef CPP_IOIPSL
    178       CALL conf_gcm( 99, .TRUE. )
    179       if (mod(iphysiq, iperiod) /= 0) call abort_gcm("conf_gcm",
    180      s "iphysiq must be a multiple of iperiod", 1)
    181 !#else
    182 !      CALL defrun( 99, .TRUE. , clesphy0 )
    183 !#endif
     98  REAL zdtvr
     99
     100  !   variables dynamiques
     101  REAL vcov(ip1jm,llm),ucov(ip1jmp1,llm) ! vents covariants
     102  REAL teta(ip1jmp1,llm)                 ! temperature potentielle
     103  REAL, ALLOCATABLE, DIMENSION(:,:,:):: q! champs advectes
     104  REAL ps(ip1jmp1)                       ! pression  au sol
     105  REAL p (ip1jmp1,llmp1  )               ! pression aux interfac.des couches
     106  REAL masse(ip1jmp1,llm)                ! masse d'air
     107  REAL phis(ip1jmp1)                     ! geopotentiel au sol
     108  REAL phi(ip1jmp1,llm)                  ! geopotentiel
     109  REAL w(ip1jmp1,llm)                    ! vitesse verticale
     110
     111  ! variables dynamiques intermediaire pour le transport
     112
     113  !   variables pour le fichier histoire
     114  REAL dtav      ! intervalle de temps elementaire
     115
     116  REAL time_0
     117
     118  LOGICAL lafin
     119  INTEGER ij,iq,l,i,j
     120
     121
     122  real time_step, t_wrt, t_ops
     123
     124  LOGICAL first
     125
     126  !      LOGICAL call_iniphys
     127  !      data call_iniphys/.true./
     128
     129  !+jld variables test conservation energie
     130  !      REAL ecin(ip1jmp1,llm),ecin0(ip1jmp1,llm)
     131  !     Tendance de la temp. potentiel d (theta)/ d t due a la
     132  !     tansformation d'energie cinetique en energie thermique
     133  !     cree par la dissipation
     134  REAL dhecdt(ip1jmp1,llm)
     135  !      REAL vcont(ip1jm,llm),ucont(ip1jmp1,llm)
     136  !      REAL      d_h_vcol, d_qt, d_qw, d_ql, d_ec
     137  CHARACTER (len=15) :: ztit
     138  !-jld
     139
     140
     141  character (len=80) :: dynhist_file, dynhistave_file
     142  character (len=20) :: modname
     143  character (len=80) :: abort_message
     144  ! locales pour gestion du temps
     145  INTEGER :: an, mois, jour
     146  REAL :: heure
     147  logical use_filtre_fft
     148
     149!-----------------------------------------------------------------------
     150!   Initialisations:
     151!   ----------------
     152
     153  abort_message = 'last timestep reached'
     154  modname = 'gcm'
     155  lafin    = .FALSE.
     156  dynhist_file = 'dyn_hist.nc'
     157  dynhistave_file = 'dyn_hist_ave.nc'
     158
     159
     160
     161!----------------------------------------------------------------------
     162!  lecture des fichiers gcm.def ou run.def
     163!  ---------------------------------------
     164!
     165  CALL conf_gcm( 99, .TRUE. )
     166  if (mod(iphysiq, iperiod) /= 0) call abort_gcm("conf_gcm", &
     167       "iphysiq must be a multiple of iperiod", 1)
     168
     169  use_filtre_fft=.FALSE.
     170  CALL getin('use_filtre_fft',use_filtre_fft)
     171  IF (use_filtre_fft) call abort_gcm('FFT filter is not available in the ' &
     172          // 'sequential version of the dynamics.', 1)
    184173
    185174!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
     
    188177
    189178#ifdef CPP_XIOS
    190         CALL wxios_init("LMDZ")
     179  CALL wxios_init("LMDZ")
    191180#endif
    192181
     
    197186! dynamique -> physique pour l'initialisation
    198187#ifdef CPP_PHYS
    199       CALL init_phys_lmdz(iim,jjp1,llm,1,(/(jjm-1)*iim+2/))
     188  CALL init_phys_lmdz(iim,jjp1,llm,1,(/(jjm-1)*iim+2/))
    200189!      call initcomgeomphy ! now done in iniphysiq
    201190#endif
    202191!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    203 c
    204 c Initialisations pour Cp(T) Venus
    205       call ini_cpdet
    206 c
    207 c-----------------------------------------------------------------------
    208 c   Choix du calendrier
    209 c   -------------------
    210 
    211 c      calend = 'earth_365d'
     192!
     193! Initialisations pour Cp(T) Venus
     194  call ini_cpdet
     195!
     196!-----------------------------------------------------------------------
     197!   Choix du calendrier
     198!   -------------------
     199
     200!      calend = 'earth_365d'
    212201
    213202#ifdef CPP_IOIPSL
    214       if (calend == 'earth_360d') then
    215         call ioconf_calendar('360d')
    216         write(lunout,*)'CALENDRIER CHOISI: Terrestre a 360 jours/an'
    217       else if (calend == 'earth_365d') then
    218         call ioconf_calendar('noleap')
    219         write(lunout,*)'CALENDRIER CHOISI: Terrestre a 365 jours/an'
    220       else if (calend == 'earth_366d') then
    221         call ioconf_calendar('gregorian')
    222         write(lunout,*)'CALENDRIER CHOISI: Terrestre bissextile'
    223       else if (calend == 'titan') then
     203  if (calend == 'earth_360d') then
     204    call ioconf_calendar('360d')
     205    write(lunout,*)'CALENDRIER CHOISI: Terrestre a 360 jours/an'
     206  else if (calend == 'earth_365d') then
     207    call ioconf_calendar('noleap')
     208    write(lunout,*)'CALENDRIER CHOISI: Terrestre a 365 jours/an'
     209  else if (calend == 'earth_366d') then
     210    call ioconf_calendar('gregorian')
     211    write(lunout,*)'CALENDRIER CHOISI: Terrestre bissextile'
     212  else if (calend == 'titan') then
    224213!        call ioconf_calendar('titan')
    225         write(lunout,*)'CALENDRIER CHOISI: Titan'
    226         abort_message = 'A FAIRE...'
    227         call abort_gcm(modname,abort_message,1)
    228       else if (calend == 'venus') then
     214    write(lunout,*)'CALENDRIER CHOISI: Titan'
     215    abort_message = 'A FAIRE...'
     216    call abort_gcm(modname,abort_message,1)
     217  else if (calend == 'venus') then
    229218!        call ioconf_calendar('venus')
    230         write(lunout,*)'CALENDRIER CHOISI: Venus'
    231         abort_message = 'A FAIRE...'
    232         call abort_gcm(modname,abort_message,1)
    233       else
    234         abort_message = 'Mauvais choix de calendrier'
    235         call abort_gcm(modname,abort_message,1)
    236       endif
    237 #endif
    238 c-----------------------------------------------------------------------
    239 
    240       IF (type_trac == 'inca') THEN
     219    write(lunout,*)'CALENDRIER CHOISI: Venus'
     220    abort_message = 'A FAIRE...'
     221    call abort_gcm(modname,abort_message,1)
     222  else
     223    abort_message = 'Mauvais choix de calendrier'
     224    call abort_gcm(modname,abort_message,1)
     225  endif
     226#endif
     227!-----------------------------------------------------------------------
     228
     229  IF (type_trac == 'inca') THEN
    241230#ifdef INCA
    242       call init_const_lmdz(nbtr,anneeref,dayref,iphysiq,day_step,nday,
    243      $        nbsrf, is_oce,is_sic,is_ter,is_lic)
    244       call init_inca_para(iim,jjm+1,klon,1,klon_mpi_para_nb,0)
    245 #endif
    246       END IF
    247 c
    248 c
    249 c------------------------------------
    250 c   Initialisation partie parallele
    251 c------------------------------------
    252 
    253 c
    254 c
    255 c-----------------------------------------------------------------------
    256 c   Initialisation des traceurs
    257 c   ---------------------------
    258 c  Choix du nombre de traceurs et du schema pour l'advection
    259 c  dans fichier traceur.def, par default ou via INCA
    260       call infotrac_init
    261 
    262 c Allocation de la tableau q : champs advectes   
    263       allocate(q(ip1jmp1,llm,nqtot))
    264 
    265 c-----------------------------------------------------------------------
    266 c   Lecture de l'etat initial :
    267 c   ---------------------------
    268 
    269 c  lecture du fichier start.nc
    270       if (read_start) then
    271       ! we still need to run iniacademic to initialize some
    272       ! constants & fields, if we run the 'newtonian' or 'SW' cases:
    273         if (iflag_phys.ne.1) then
    274           CALL iniacademic(vcov,ucov,teta,q,masse,ps,phis,time_0)
    275         endif
    276 
    277         CALL dynetat0("start.nc",vcov,ucov,
    278      &              teta,q,masse,ps,phis, time_0)
     231    call init_const_lmdz(nbtr,anneeref,dayref,iphysiq,day_step,nday, &
     232         nbsrf, is_oce,is_sic,is_ter,is_lic)
     233    call init_inca_para(iim,jjm+1,klon,1,klon_mpi_para_nb,0)
     234#endif
     235  END IF
     236  !
     237  !
     238  !------------------------------------
     239  !   Initialisation partie parallele
     240  !------------------------------------
     241
     242  !
     243  !
     244  !-----------------------------------------------------------------------
     245  !   Initialisation des traceurs
     246  !   ---------------------------
     247  !  Choix du nombre de traceurs et du schema pour l'advection
     248  !  dans fichier traceur.def, par default ou via INCA
     249  call infotrac_init
     250
     251  ! Allocation de la tableau q : champs advectes   
     252  allocate(q(ip1jmp1,llm,nqtot))
     253
     254  !-----------------------------------------------------------------------
     255  !   Lecture de l'etat initial :
     256  !   ---------------------------
     257
     258  !  lecture du fichier start.nc
     259  if (read_start) then
     260     ! we still need to run iniacademic to initialize some
     261     ! constants & fields, if we run the 'newtonian' or 'SW' cases:
     262     if (iflag_phys.ne.1) then
     263        CALL iniacademic(vcov,ucov,teta,q,masse,ps,phis,time_0)
     264     endif
     265
     266     CALL dynetat0("start.nc",vcov,ucov, &
     267                    teta,q,masse,ps,phis, time_0)
    279268       
    280         ! Load relaxation fields (simple nudging). AS 09/2013
    281         ! ---------------------------------------------------
    282         if (planet_type.eq."generic") then
    283          if (ok_guide) then
    284            CALL relaxetat0("relax.nc")
    285          endif
    286         endif
     269     ! Load relaxation fields (simple nudging). AS 09/2013
     270     ! ---------------------------------------------------
     271     if (planet_type.eq."generic") then
     272       if (ok_guide) then
     273         CALL relaxetat0("relax.nc")
     274       endif
     275     endif
    287276 
    288 c       write(73,*) 'ucov',ucov
    289 c       write(74,*) 'vcov',vcov
    290 c       write(75,*) 'teta',teta
    291 c       write(76,*) 'ps',ps
    292 c       write(77,*) 'q',q
    293 
    294       endif ! of if (read_start)
    295 
    296       IF (type_trac == 'inca') THEN
     277     !       write(73,*) 'ucov',ucov
     278     !       write(74,*) 'vcov',vcov
     279     !       write(75,*) 'teta',teta
     280     !       write(76,*) 'ps',ps
     281     !       write(77,*) 'q',q
     282
     283  endif ! of if (read_start)
     284
     285  IF (type_trac == 'inca') THEN
    297286#ifdef INCA
    298          call init_inca_dim(klon,llm,iim,jjm,
    299      $        rlonu,rlatu,rlonv,rlatv)
    300 #endif
    301       END IF
    302 
    303 
    304 c le cas echeant, creation d un etat initial
    305       IF (prt_level > 9) WRITE(lunout,*)
    306      .              'GCM: AVANT iniacademic AVANT AVANT AVANT AVANT'
    307       if (.not.read_start) then
    308          CALL iniacademic(vcov,ucov,teta,q,masse,ps,phis,time_0)
    309       endif
    310 
    311 
    312 c-----------------------------------------------------------------------
    313 c   Lecture des parametres de controle pour la simulation :
    314 c   -------------------------------------------------------
    315 c  on recalcule eventuellement le pas de temps
    316 
    317       IF(MOD(day_step,iperiod).NE.0) THEN
    318         abort_message =
    319      .  'Il faut choisir un nb de pas par jour multiple de iperiod'
    320         call abort_gcm(modname,abort_message,1)
    321       ENDIF
    322 
    323       IF(MOD(day_step,iphysiq).NE.0) THEN
    324         abort_message =
    325      * 'Il faut choisir un nb de pas par jour multiple de iphysiq'
    326         call abort_gcm(modname,abort_message,1)
    327       ENDIF
    328 
    329       zdtvr    = daysec/REAL(day_step)
    330         IF(dtvr.NE.zdtvr) THEN
    331          WRITE(lunout,*)
    332      .    'WARNING!!! changement de pas de temps',dtvr,'>',zdtvr
    333         ENDIF
    334 
    335 C
    336 C on remet le calendrier à zero si demande
    337 c
    338       IF (start_time /= starttime) then
    339         WRITE(lunout,*)' GCM: Attention l''heure de depart lue dans le'
    340      &,' fichier restart ne correspond pas à celle lue dans le run.def'
    341         IF (raz_date == 1) then
    342           WRITE(lunout,*)'Je prends l''heure lue dans run.def'
    343           start_time = starttime
    344         ELSE
    345           call abort_gcm("gcm", "'Je m''arrete'", 1)
    346         ENDIF
    347       ENDIF
    348       IF (raz_date == 1) THEN
    349         annee_ref = anneeref
    350         day_ref = dayref
    351         day_ini = dayref
    352         itau_dyn = 0
    353         itau_phy = 0
    354         time_0 = 0.
    355         write(lunout,*)
    356      .   'GCM: On reinitialise a la date lue dans gcm.def'
    357       ELSE IF (annee_ref .ne. anneeref .or. day_ref .ne. dayref) THEN
    358         write(lunout,*)
    359      .  'GCM: Attention les dates initiales lues dans le fichier'
    360         write(lunout,*)
    361      .  ' restart ne correspondent pas a celles lues dans '
    362         write(lunout,*)' gcm.def'
    363         write(lunout,*)' annee_ref=',annee_ref," anneeref=",anneeref
    364         write(lunout,*)' day_ref=',day_ref," dayref=",dayref
    365         write(lunout,*)' Pas de remise a zero'
    366       ENDIF
    367 
    368 c      if (annee_ref .ne. anneeref .or. day_ref .ne. dayref) then
    369 c        write(lunout,*)
    370 c     .  'GCM: Attention les dates initiales lues dans le fichier'
    371 c        write(lunout,*)
    372 c     .  ' restart ne correspondent pas a celles lues dans '
    373 c        write(lunout,*)' gcm.def'
    374 c        write(lunout,*)' annee_ref=',annee_ref," anneeref=",anneeref
    375 c        write(lunout,*)' day_ref=',day_ref," dayref=",dayref
    376 c        if (raz_date .ne. 1) then
    377 c          write(lunout,*)
    378 c     .    'GCM: On garde les dates du fichier restart'
    379 c        else
    380 c          annee_ref = anneeref
    381 c          day_ref = dayref
    382 c          day_ini = dayref
    383 c          itau_dyn = 0
    384 c          itau_phy = 0
    385 c          time_0 = 0.
    386 c          write(lunout,*)
    387 c     .   'GCM: On reinitialise a la date lue dans gcm.def'
    388 c        endif
    389 c      ELSE
    390 c        raz_date = 0
    391 c      endif
     287     call init_inca_dim(klon,llm,iim,jjm, &
     288          rlonu,rlatu,rlonv,rlatv)
     289#endif
     290  END IF
     291
     292
     293  ! le cas echeant, creation d un etat initial
     294  IF (prt_level > 9) WRITE(lunout,*) &
     295       'GCM: AVANT iniacademic AVANT AVANT AVANT AVANT'
     296  if (.not.read_start) then
     297     CALL iniacademic(vcov,ucov,teta,q,masse,ps,phis,time_0)
     298  endif
     299
     300
     301  !-----------------------------------------------------------------------
     302  !   Lecture des parametres de controle pour la simulation :
     303  !   -------------------------------------------------------
     304  !  on recalcule eventuellement le pas de temps
     305
     306  IF(MOD(day_step,iperiod).NE.0) THEN
     307     abort_message = &
     308       'Il faut choisir un nb de pas par jour multiple de iperiod'
     309     call abort_gcm(modname,abort_message,1)
     310  ENDIF
     311
     312  IF(MOD(day_step,iphysiq).NE.0) THEN
     313     abort_message = &
     314       'Il faut choisir un nb de pas par jour multiple de iphysiq'
     315     call abort_gcm(modname,abort_message,1)
     316  ENDIF
     317
     318  zdtvr    = daysec/REAL(day_step)
     319  IF(dtvr.NE.zdtvr) THEN
     320     WRITE(lunout,*) &
     321          'WARNING!!! changement de pas de temps',dtvr,'>',zdtvr
     322  ENDIF
     323
     324  !
     325  ! on remet le calendrier à zero si demande
     326  !
     327  IF (start_time /= starttime) then
     328     WRITE(lunout,*)' GCM: Attention l''heure de depart lue dans le' &
     329     ,' fichier restart ne correspond pas à celle lue dans le run.def'
     330     IF (raz_date == 1) then
     331        WRITE(lunout,*)'Je prends l''heure lue dans run.def'
     332        start_time = starttime
     333     ELSE
     334        call abort_gcm("gcm", "'Je m''arrete'", 1)
     335     ENDIF
     336  ENDIF
     337  IF (raz_date == 1) THEN
     338     annee_ref = anneeref
     339     day_ref = dayref
     340     day_ini = dayref
     341     itau_dyn = 0
     342     itau_phy = 0
     343     time_0 = 0.
     344     write(lunout,*) &
     345         'GCM: On reinitialise a la date lue dans gcm.def'
     346  ELSE IF (annee_ref .ne. anneeref .or. day_ref .ne. dayref) THEN
     347     write(lunout,*) &
     348        'GCM: Attention les dates initiales lues dans le fichier'
     349     write(lunout,*) &
     350        ' restart ne correspondent pas a celles lues dans '
     351     write(lunout,*)' gcm.def'
     352     write(lunout,*)' annee_ref=',annee_ref," anneeref=",anneeref
     353     write(lunout,*)' day_ref=',day_ref," dayref=",dayref
     354     write(lunout,*)' Pas de remise a zero'
     355  ENDIF
     356
     357!      if (annee_ref .ne. anneeref .or. day_ref .ne. dayref) then
     358!        write(lunout,*)
     359!     .  'GCM: Attention les dates initiales lues dans le fichier'
     360!        write(lunout,*)
     361!     .  ' restart ne correspondent pas a celles lues dans '
     362!        write(lunout,*)' gcm.def'
     363!        write(lunout,*)' annee_ref=',annee_ref," anneeref=",anneeref
     364!        write(lunout,*)' day_ref=',day_ref," dayref=",dayref
     365!        if (raz_date .ne. 1) then
     366!          write(lunout,*)
     367!     .    'GCM: On garde les dates du fichier restart'
     368!        else
     369!          annee_ref = anneeref
     370!          day_ref = dayref
     371!          day_ini = dayref
     372!          itau_dyn = 0
     373!          itau_phy = 0
     374!          time_0 = 0.
     375!          write(lunout,*)
     376!     .   'GCM: On reinitialise a la date lue dans gcm.def'
     377!        endif
     378!      ELSE
     379!        raz_date = 0
     380!      endif
    392381
    393382#ifdef CPP_IOIPSL
    394       mois = 1
    395       heure = 0.
     383  mois = 1
     384  heure = 0.
    396385! Ce n'est defini pour l'instant que pour la Terre...
    397       if (planet_type.eq.'earth') then
    398       call ymds2ju(annee_ref, mois, day_ref, heure, jD_ref)
    399       jH_ref = jD_ref - int(jD_ref)
    400       jD_ref = int(jD_ref)
    401 
    402       call ioconf_startdate(INT(jD_ref), jH_ref)
    403 
    404       write(lunout,*)'DEBUG'
    405       write(lunout,*)'annee_ref, mois, day_ref, heure, jD_ref'
    406       write(lunout,*)annee_ref, mois, day_ref, heure, jD_ref
    407       call ju2ymds(jD_ref+jH_ref,an, mois, jour, heure)
    408       write(lunout,*)'jD_ref+jH_ref,an, mois, jour, heure'
    409       write(lunout,*)jD_ref+jH_ref,an, mois, jour, heure
    410       else
     386  if (planet_type.eq.'earth') then
     387    call ymds2ju(annee_ref, mois, day_ref, heure, jD_ref)
     388    jH_ref = jD_ref - int(jD_ref)
     389    jD_ref = int(jD_ref)
     390
     391    call ioconf_startdate(INT(jD_ref), jH_ref)
     392
     393    write(lunout,*)'DEBUG'
     394    write(lunout,*)'annee_ref, mois, day_ref, heure, jD_ref'
     395    write(lunout,*)annee_ref, mois, day_ref, heure, jD_ref
     396    call ju2ymds(jD_ref+jH_ref,an, mois, jour, heure)
     397    write(lunout,*)'jD_ref+jH_ref,an, mois, jour, heure'
     398    write(lunout,*)jD_ref+jH_ref,an, mois, jour, heure
     399  else
    411400! A voir pour Titan et Venus
    412         jD_ref=0
    413         jH_ref=0
    414       write(lunout,*)'A VOIR POUR VENUS ET TITAN: jD_ref, jH_ref'
    415       write(lunout,*)jD_ref,jH_ref
    416       endif ! planet_type
     401    jD_ref=0
     402    jH_ref=0
     403    write(lunout,*)'A VOIR POUR VENUS ET TITAN: jD_ref, jH_ref'
     404    write(lunout,*)jD_ref,jH_ref
     405  endif ! planet_type
    417406#else
    418 ! Ehouarn: we still need to define JD_ref and JH_ref
    419 ! and since we don't know how many days there are in a year
    420 ! we set JD_ref to 0 (this should be improved ...)
    421       jD_ref=0
    422       jH_ref=0
    423 #endif
    424 
    425       if (iflag_phys.eq.1) then
    426       ! these initialisations have already been done (via iniacademic)
    427       ! if running in SW or Newtonian mode
    428 c-----------------------------------------------------------------------
    429 c   Initialisation des constantes dynamiques :
    430 c   ------------------------------------------
    431         dtvr = zdtvr
    432         CALL iniconst
    433 
    434 c-----------------------------------------------------------------------
    435 c   Initialisation de la geometrie :
    436 c   --------------------------------
    437         CALL inigeom
    438 
    439 c-----------------------------------------------------------------------
    440 c   Initialisation du filtre :
    441 c   --------------------------
    442         CALL inifilr
    443       endif ! of if (iflag_phys.eq.1)
    444 c
    445 c-----------------------------------------------------------------------
    446 c   Initialisation de la dissipation :
    447 c   ----------------------------------
    448 
    449       CALL inidissip( lstardis, nitergdiv, nitergrot, niterh   ,
    450      *                tetagdiv, tetagrot , tetatemp, vert_prof_dissip)
    451 
    452 c-----------------------------------------------------------------------
    453 c   Initialisation de la physique :
    454 c   -------------------------------
    455 
    456       IF ((iflag_phys==1).or.(iflag_phys>=100)) THEN
    457 !      IF (call_iniphys.and.(iflag_phys==1.or.iflag_phys>=100)) THEN
    458 !         latfi(1)=rlatu(1)
    459 !         lonfi(1)=0.
    460 !         zcufi(1) = cu(1)
    461 !         zcvfi(1) = cv(1)
    462 !         DO j=2,jjm
    463 !            DO i=1,iim
    464 !               latfi((j-2)*iim+1+i)= rlatu(j)
    465 !               lonfi((j-2)*iim+1+i)= rlonv(i)
    466 !               zcufi((j-2)*iim+1+i) = cu((j-1)*iip1+i)
    467 !               zcvfi((j-2)*iim+1+i) = cv((j-1)*iip1+i)
    468 !            ENDDO
    469 !         ENDDO
    470 !         latfi(ngridmx)= rlatu(jjp1)
    471 !         lonfi(ngridmx)= 0.
    472 !         zcufi(ngridmx) = cu(ip1jm+1)
    473 !         zcvfi(ngridmx) = cv(ip1jm-iim)
    474 
    475          ! build airefi(), mesh area on physics grid
    476 !         CALL gr_dyn_fi(1,iip1,jjp1,ngridmx,aire,airefi)
    477          ! Poles are single points on physics grid
    478 !         airefi(1)=airefi(1)*iim
    479 !         airefi(ngridmx)=airefi(ngridmx)*iim
    480 
    481 ! Initialisation de la physique: pose probleme quand on tourne
    482 ! SANS physique, car iniphysiq.F est dans le repertoire phy[]...
    483 ! Il faut une cle CPP_PHYS
     407  ! Ehouarn: we still need to define JD_ref and JH_ref
     408  ! and since we don't know how many days there are in a year
     409  ! we set JD_ref to 0 (this should be improved ...)
     410  jD_ref=0
     411  jH_ref=0
     412#endif
     413
     414  if (iflag_phys.eq.1) then
     415     ! these initialisations have already been done (via iniacademic)
     416     ! if running in SW or Newtonian mode
     417     !-----------------------------------------------------------------------
     418     !   Initialisation des constantes dynamiques :
     419     !   ------------------------------------------
     420     dtvr = zdtvr
     421     CALL iniconst
     422
     423     !-----------------------------------------------------------------------
     424     !   Initialisation de la geometrie :
     425     !   --------------------------------
     426     CALL inigeom
     427
     428     !-----------------------------------------------------------------------
     429     !   Initialisation du filtre :
     430     !   --------------------------
     431     CALL inifilr
     432  endif ! of if (iflag_phys.eq.1)
     433  !
     434  !-----------------------------------------------------------------------
     435  !   Initialisation de la dissipation :
     436  !   ----------------------------------
     437
     438  CALL inidissip( lstardis, nitergdiv, nitergrot, niterh   , &
     439                  tetagdiv, tetagrot , tetatemp, vert_prof_dissip)
     440
     441  !-----------------------------------------------------------------------
     442  !   Initialisation de la physique :
     443  !   -------------------------------
     444
     445  IF ((iflag_phys==1).or.(iflag_phys>=100)) THEN
     446     ! Physics:
    484447#ifdef CPP_PHYS
    485 !         CALL iniphysiq(ngridmx,llm,daysec,day_ini,dtphys/nsplit_phys,
    486 !     &                latfi,lonfi,airefi,zcufi,zcvfi,rad,g,r,cpp,
    487 !     &                iflag_phys)
    488          CALL iniphysiq(iim,jjm,llm,daysec,day_ini,dtphys/nsplit_phys,
    489      &                rlatu,rlonv,aire,cu,cv,rad,g,r,cpp,
    490      &                iflag_phys)
    491 #endif
    492 !         call_iniphys=.false.
    493       ENDIF ! of IF ((iflag_phys==1).or.(iflag_phys>=100))
    494 
    495 c  numero de stockage pour les fichiers de redemarrage:
    496 
    497 c-----------------------------------------------------------------------
    498 c   Initialisation des I/O :
    499 c   ------------------------
    500 
    501       if (nday>=0) then ! standard case
    502         day_end=day_ini+nday
    503       else ! special case when nday <0, run -nday dynamical steps
    504         day_end=day_ini-nday/day_step
    505       endif
    506       if (less1day) then
    507         day_end=day_ini+floor(time_0+fractday)
    508       endif
    509       if (ndynstep.gt.0) then
    510         day_end=day_ini+floor(time_0+float(ndynstep)/float(day_step))
    511       endif
     448         CALL iniphysiq(iim,jjm,llm,daysec,day_ini,dtphys/nsplit_phys, &
     449                      rlatu,rlonv,aire,cu,cv,rad,g,r,cpp, &
     450                      iflag_phys)
     451#endif
     452  ENDIF ! of IF ((iflag_phys==1).or.(iflag_phys>=100))
     453
     454  !-----------------------------------------------------------------------
     455  !   Initialisation des I/O :
     456  !   ------------------------
     457
     458  if (nday>=0) then ! standard case
     459     day_end=day_ini+nday
     460  else ! special case when nday <0, run -nday dynamical steps
     461     day_end=day_ini-nday/day_step
     462  endif
     463  if (less1day) then
     464     day_end=day_ini+floor(time_0+fractday)
     465  endif
     466  if (ndynstep.gt.0) then
     467     day_end=day_ini+floor(time_0+float(ndynstep)/float(day_step))
     468  endif
    512469     
    513       WRITE(lunout,'(a,i7,a,i7)')
    514      &             "run from day ",day_ini,"  to day",day_end
     470  WRITE(lunout,'(a,i7,a,i7)') &
     471               "run from day ",day_ini,"  to day",day_end
    515472
    516473#ifdef CPP_IOIPSL
    517 ! Ce n'est defini pour l'instant que pour la Terre...
    518       if (planet_type.eq.'earth') then
    519       call ju2ymds(jD_ref + day_ini - day_ref, an, mois, jour, heure)
    520       write (lunout,301)jour, mois, an
    521       call ju2ymds(jD_ref + day_end - day_ref, an, mois, jour, heure)
    522       write (lunout,302)jour, mois, an
    523       else
    524 ! A voir pour Titan et Venus
    525       write(lunout,*)'A VOIR POUR VENUS/TITAN: separation en annees...'
    526       endif ! planet_type
    527 
    528  301  FORMAT('1'/,15x,'run du ', i2,'/',i2,'/',i4)
    529  302  FORMAT('1'/,15x,'    au ', i2,'/',i2,'/',i4)
    530 #endif
    531 
    532       if (planet_type=="mars") then
    533         ! For Mars we transmit day_ini
    534         CALL dynredem0("restart.nc", day_ini, phis)
    535       else
    536         CALL dynredem0("restart.nc", day_end, phis)
    537       endif
    538       ecripar = .TRUE.
     474  ! Ce n'est defini pour l'instant que pour la Terre...
     475  if (planet_type.eq.'earth') then
     476    call ju2ymds(jD_ref + day_ini - day_ref, an, mois, jour, heure)
     477    write (lunout,301)jour, mois, an
     478    call ju2ymds(jD_ref + day_end - day_ref, an, mois, jour, heure)
     479    write (lunout,302)jour, mois, an
     480  else
     481  ! A voir pour Titan et Venus
     482    write(lunout,*)'A VOIR POUR VENUS/TITAN: separation en annees...'
     483  endif ! planet_type
     484301  FORMAT('1'/,15x,'run du ', i2,'/',i2,'/',i4)
     485302  FORMAT('1'/,15x,'    au ', i2,'/',i2,'/',i4)
     486#endif
     487
     488  if (planet_type=="mars") then
     489    ! For Mars we transmit day_ini
     490    CALL dynredem0("restart.nc", day_ini, phis)
     491  else
     492    CALL dynredem0("restart.nc", day_end, phis)
     493  endif
     494  ecripar = .TRUE.
    539495
    540496#ifdef CPP_IOIPSL
    541       time_step = zdtvr
    542       if (ok_dyn_ins) then
    543         ! initialize output file for instantaneous outputs
    544         ! t_ops = iecri * daysec ! do operations every t_ops
    545         t_ops =((1.0*iecri)/day_step) * daysec 
    546         t_wrt = daysec ! iecri * daysec ! write output every t_wrt
    547         CALL inithist(day_ref,annee_ref,time_step,
    548      &              t_ops,t_wrt)
    549       endif
    550 
    551       IF (ok_dyn_ave) THEN
    552         ! initialize output file for averaged outputs
    553         t_ops = iperiod * time_step ! do operations every t_ops
    554         t_wrt = periodav * daysec   ! write output every t_wrt
    555         CALL initdynav(day_ref,annee_ref,time_step,
    556      &       t_ops,t_wrt)
    557       END IF
    558       dtav = iperiod*dtvr/daysec
     497  time_step = zdtvr
     498  if (ok_dyn_ins) then
     499    ! initialize output file for instantaneous outputs
     500    ! t_ops = iecri * daysec ! do operations every t_ops
     501    t_ops =((1.0*iecri)/day_step) * daysec 
     502    t_wrt = daysec ! iecri * daysec ! write output every t_wrt
     503    CALL inithist(day_ref,annee_ref,time_step, &
     504                   t_ops,t_wrt)
     505  endif
     506
     507  IF (ok_dyn_ave) THEN
     508    ! initialize output file for averaged outputs
     509    t_ops = iperiod * time_step ! do operations every t_ops
     510    t_wrt = periodav * daysec   ! write output every t_wrt
     511    CALL initdynav(day_ref,annee_ref,time_step, &
     512            t_ops,t_wrt)
     513  END IF
     514  dtav = iperiod*dtvr/daysec
    559515#endif
    560516! #endif of #ifdef CPP_IOIPSL
    561517
    562 c  Choix des frequences de stokage pour le offline
    563 c      istdyn=day_step/4     ! stockage toutes les 6h=1jour/4
    564 c      istdyn=day_step/12     ! stockage toutes les 2h=1jour/12
    565       istdyn=day_step/4     ! stockage toutes les 6h=1jour/12
    566       istphy=istdyn/iphysiq     
    567 
    568 
    569 c
    570 c-----------------------------------------------------------------------
    571 c   Integration temporelle du modele :
    572 c   ----------------------------------
    573 
    574 c       write(78,*) 'ucov',ucov
    575 c       write(78,*) 'vcov',vcov
    576 c       write(78,*) 'teta',teta
    577 c       write(78,*) 'ps',ps
    578 c       write(78,*) 'q',q
    579 
    580 
    581       CALL leapfrog(ucov,vcov,teta,ps,masse,phis,q,
    582      .              time_0)
    583 
    584       END
    585 
     518  !  Choix des frequences de stokage pour le offline
     519  !      istdyn=day_step/4     ! stockage toutes les 6h=1jour/4
     520  !      istdyn=day_step/12     ! stockage toutes les 2h=1jour/12
     521  istdyn=day_step/4     ! stockage toutes les 6h=1jour/12
     522  istphy=istdyn/iphysiq     
     523
     524
     525  !
     526  !-----------------------------------------------------------------------
     527  !   Integration temporelle du modele :
     528  !   ----------------------------------
     529
     530  !       write(78,*) 'ucov',ucov
     531  !       write(78,*) 'vcov',vcov
     532  !       write(78,*) 'teta',teta
     533  !       write(78,*) 'ps',ps
     534  !       write(78,*) 'q',q
     535
     536
     537  CALL leapfrog(ucov,vcov,teta,ps,masse,phis,q,time_0)
     538
     539END PROGRAM gcm
     540
  • trunk/LMDZ.COMMON/libf/dyn3d/guide_mod.F90

    r1422 r1441  
    154154          rcod=nf90_open('apbp.nc',Nf90_NOWRITe, ncidpl)
    155155          if (rcod.NE.NF_NOERR) THEN
    156              print *,'Guide: probleme -> pas de fichier apbp.nc'
    157              CALL abort_gcm(modname,abort_message,1)
     156             CALL abort_gcm(modname, &
     157                  'Guide: probleme -> pas de fichier apbp.nc',1)
    158158          endif
    159159       endif
     
    163163               rcod=nf90_open('u.nc',Nf90_NOWRITe,ncidpl)
    164164               if (rcod.NE.NF_NOERR) THEN
    165                   print *,'Guide: probleme -> pas de fichier u.nc'
    166                   CALL abort_gcm(modname,abort_message,1)
     165                  CALL abort_gcm(modname, &
     166                       'Guide: probleme -> pas de fichier u.nc',1)
    167167               endif
    168168           endif
     
    171171               rcod=nf90_open('v.nc',nf90_nowrite,ncidpl)
    172172               if (rcod.NE.NF_NOERR) THEN
    173                   print *,'Guide: probleme -> pas de fichier v.nc'
    174                   CALL abort_gcm(modname,abort_message,1)
     173                  CALL abort_gcm(modname, &
     174                       'Guide: probleme -> pas de fichier v.nc',1)
    175175               endif
    176176           endif
     
    179179               rcod=nf90_open('T.nc',nf90_nowrite,ncidpl)
    180180               if (rcod.NE.NF_NOERR) THEN
    181                   print *,'Guide: probleme -> pas de fichier T.nc'
    182                   CALL abort_gcm(modname,abort_message,1)
     181                  CALL abort_gcm(modname, &
     182                       'Guide: probleme -> pas de fichier T.nc',1)
    183183               endif
    184184           endif
     
    187187               rcod=nf90_open('hur.nc',nf90_nowrite, ncidpl)
    188188               if (rcod.NE.NF_NOERR) THEN
    189                   print *,'Guide: probleme -> pas de fichier hur.nc'
    190                   CALL abort_gcm(modname,abort_message,1)
     189                  CALL abort_gcm(modname, &
     190                       'Guide: probleme -> pas de fichier hur.nc',1)
    191191               endif
    192192           endif
     
    196196    IF (error.NE.NF_NOERR) error=NF_INQ_DIMID(ncidpl,'PRESSURE',rid)
    197197    IF (error.NE.NF_NOERR) THEN
    198         print *,'Guide: probleme lecture niveaux pression'
    199         CALL abort_gcm(modname,abort_message,1)
     198        CALL abort_gcm(modname,'Guide: probleme lecture niveaux pression',1)
    200199    ENDIF
    201200    error=NF_INQ_DIMLEN(ncidpl,rid,nlevnc)
  • trunk/LMDZ.COMMON/libf/dyn3d_common/fxhyp_m.F90

    r1440 r1441  
    1 !
    2 ! $Id: fxhyp.F 1674 2012-10-29 16:27:03Z emillour $
    3 !
    4 c
    5 c
    6        SUBROUTINE fxhyp ( xzoomdeg,grossism,dzooma,tau ,
    7      , rlonm025,xprimm025,rlonv,xprimv,rlonu,xprimu,rlonp025,xprimp025,
    8      , champmin,champmax                                               )
    9 
    10 c      Auteur :  P. Le Van
    11 
    12        IMPLICIT NONE
    13 
    14 c    Calcule les longitudes et derivees dans la grille du GCM pour une
    15 c     fonction f(x) a tangente  hyperbolique  .
    16 c
    17 c     grossism etant le grossissement ( = 2 si 2 fois, = 3 si 3 fois,etc.)
    18 c     dzoom  etant  la distance totale de la zone du zoom
    19 c     tau  la raideur de la transition de l'interieur a l'exterieur du zoom
    20 c
    21 c    On doit avoir grossism x dzoom <  pi ( radians )   , en longitude.
    22 c   ********************************************************************
    23 
    24 
    25        INTEGER nmax, nmax2
    26        PARAMETER (  nmax = 30000, nmax2 = 2*nmax )
    27 c
    28        LOGICAL scal180
    29        PARAMETER ( scal180 = .TRUE. )
    30 
    31 c      scal180 = .TRUE.  si on veut avoir le premier point scalaire pour   
    32 c      une grille reguliere ( grossism = 1.,tau=0.,clon=0. ) a -180. degres.
    33 c      sinon scal180 = .FALSE.
    34 
    35 #include "dimensions.h"
    36 #include "paramet.h"
    37        
    38 c     ......  arguments  d'entree   .......
    39 c
    40        REAL xzoomdeg,dzooma,tau,grossism
    41 
    42 c    ......   arguments  de  sortie  ......
    43 
    44        REAL rlonm025(iip1),xprimm025(iip1),rlonv(iip1),xprimv(iip1),
    45      ,  rlonu(iip1),xprimu(iip1),rlonp025(iip1),xprimp025(iip1)
    46 
    47 c     .... variables locales  ....
    48 c
    49        REAL   dzoom
    50        REAL(KIND=8) xlon(iip1),xprimm(iip1),xuv
    51        REAL(KIND=8) xtild(0:nmax2)
    52        REAL(KIND=8) fhyp(0:nmax2),ffdx,beta,Xprimt(0:nmax2)
    53        REAL(KIND=8) Xf(0:nmax2),xxpr(0:nmax2)
    54        REAL(KIND=8) xvrai(iip1),xxprim(iip1)
    55        REAL(KIND=8) pi,depi,epsilon,xzoom,fa,fb
    56        REAL(KIND=8) Xf1, Xfi , a0,a1,a2,a3,xi2
    57        INTEGER i,it,ik,iter,ii,idif,ii1,ii2
    58        REAL(KIND=8) xi,xo1,xmoy,xlon2,fxm,Xprimin
    59        REAL(KIND=8) champmin,champmax,decalx
    60        INTEGER is2
    61        SAVE is2
    62 
    63        REAL(KIND=8) heavyside
    64 
    65        pi       = 2. * ASIN(1.)
    66        depi     = 2. * pi
    67        epsilon  = 1.e-3
    68        xzoom    = xzoomdeg * pi/180.
    69 c
    70        if (iim==1) then
    71 
    72           rlonm025(1)=-pi/2.
    73           rlonv(1)=0.
    74           rlonu(1)=pi
    75           rlonp025(1)=pi/2.
    76           rlonm025(2)=rlonm025(1)+depi
    77           rlonv(2)=rlonv(1)+depi
    78           rlonu(2)=rlonu(1)+depi
    79           rlonp025(2)=rlonp025(1)+depi
    80 
    81           xprimm025(:)=1.
    82           xprimv(:)=1.
    83           xprimu(:)=1.
    84           xprimp025(:)=1.
    85           champmin=depi
    86           champmax=depi
    87           return
    88 
    89        endif
    90 
    91            decalx   = .75
    92        IF( grossism.EQ.1..AND.scal180 )  THEN
    93            decalx   = 1.
    94        ENDIF
    95 
    96        WRITE(6,*) 'FXHYP scal180,decalx', scal180,decalx
    97 c
    98        IF( dzooma.LT.1.)  THEN
    99          dzoom = dzooma * depi
    100        ELSEIF( dzooma.LT. 25. ) THEN
    101          WRITE(6,*) ' Le param. dzoomx pour fxhyp est trop petit ! L aug
    102      ,menter et relancer ! '
    103          STOP 1
    104        ELSE
    105          dzoom = dzooma * pi/180.
    106        ENDIF
    107 
    108        WRITE(6,*) ' xzoom( rad.),grossism,tau,dzoom (radians)'
    109        WRITE(6,24) xzoom,grossism,tau,dzoom
    110 
    111        DO i = 0, nmax2
    112         xtild(i) = - pi + REAL(i) * depi /nmax2
    113        ENDDO
    114 
    115        DO i = nmax, nmax2
    116 
    117        fa  = tau*  ( dzoom/2.  - xtild(i) )
    118        fb  = xtild(i) *  ( pi - xtild(i) )
    119 
    120          IF( 200.* fb .LT. - fa )   THEN
    121            fhyp ( i) = - 1.
    122          ELSEIF( 200. * fb .LT. fa ) THEN
    123            fhyp ( i) =   1.
    124          ELSE
    125             IF( ABS(fa).LT.1.e-13.AND.ABS(fb).LT.1.e-13)  THEN
    126                 IF(   200.*fb + fa.LT.1.e-10 )  THEN
    127                     fhyp ( i ) = - 1.
    128                 ELSEIF( 200.*fb - fa.LT.1.e-10 )  THEN
    129                     fhyp ( i )  =   1.
    130                 ENDIF
    131             ELSE
    132                     fhyp ( i )  =  TANH ( fa/fb )
    133             ENDIF
    134          ENDIF
    135         IF ( xtild(i).EQ. 0. )  fhyp(i) =  1.
    136         IF ( xtild(i).EQ. pi )  fhyp(i) = -1.
    137 
    138        ENDDO
    139 
    140 cc  ....  Calcul  de  beta  ....
    141 
    142        ffdx = 0.
    143 
    144        DO i = nmax +1,nmax2
    145 
    146        xmoy    = 0.5 * ( xtild(i-1) + xtild( i ) )
    147        fa  = tau*  ( dzoom/2.  - xmoy )
    148        fb  = xmoy *  ( pi - xmoy )
    149 
    150        IF( 200.* fb .LT. - fa )   THEN
    151          fxm = - 1.
    152        ELSEIF( 200. * fb .LT. fa ) THEN
    153          fxm =   1.
    154        ELSE
    155             IF( ABS(fa).LT.1.e-13.AND.ABS(fb).LT.1.e-13)  THEN
    156                 IF(   200.*fb + fa.LT.1.e-10 )  THEN
    157                     fxm   = - 1.
    158                 ELSEIF( 200.*fb - fa.LT.1.e-10 )  THEN
    159                     fxm   =   1.
    160                 ENDIF
    161             ELSE
    162                     fxm   =  TANH ( fa/fb )
    163             ENDIF
    164        ENDIF
    165 
    166        IF ( xmoy.EQ. 0. )  fxm  =  1.
    167        IF ( xmoy.EQ. pi )  fxm  = -1.
    168 
    169        ffdx = ffdx + fxm * ( xtild(i) - xtild(i-1) )
    170 
    171        ENDDO
    172 
    173         beta  = ( grossism * ffdx - pi ) / ( ffdx - pi )
    174 
    175        IF( 2.*beta - grossism.LE. 0.)  THEN
    176         WRITE(6,*) ' **  Attention ! La valeur beta calculee dans la rou
    177      ,tine fxhyp est mauvaise ! '
    178         WRITE(6,*)'Modifier les valeurs de  grossismx ,tau ou dzoomx ',
    179      , ' et relancer ! ***  '
    180         CALL ABORT_GCM("FXHYP", "", 1)
    181        ENDIF
    182 c
    183 c   .....  calcul  de  Xprimt   .....
    184 c
    185        
    186        DO i = nmax, nmax2
    187         Xprimt(i) = beta  + ( grossism - beta ) * fhyp(i)
    188        ENDDO
    189 c   
    190        DO i =  nmax+1, nmax2
    191         Xprimt( nmax2 - i ) = Xprimt( i )
    192        ENDDO
    193 c
    194 
    195 c   .....  Calcul  de  Xf     ........
    196 
    197        Xf(0) = - pi
    198 
    199        DO i =  nmax +1, nmax2
    200 
    201        xmoy    = 0.5 * ( xtild(i-1) + xtild( i ) )
    202        fa  = tau*  ( dzoom/2.  - xmoy )
    203        fb  = xmoy *  ( pi - xmoy )
    204 
    205        IF( 200.* fb .LT. - fa )   THEN
    206          fxm = - 1.
    207        ELSEIF( 200. * fb .LT. fa ) THEN
    208          fxm =   1.
    209        ELSE
    210          fxm =  TANH ( fa/fb )
    211        ENDIF
    212 
    213        IF ( xmoy.EQ. 0. )  fxm =  1.
    214        IF ( xmoy.EQ. pi )  fxm = -1.
    215        xxpr(i)    = beta + ( grossism - beta ) * fxm
    216 
    217        ENDDO
    218 
    219        DO i = nmax+1, nmax2
    220         xxpr(nmax2-i+1) = xxpr(i)
    221        ENDDO
    222 
    223         DO i=1,nmax2
    224          Xf(i)   = Xf(i-1) + xxpr(i) * ( xtild(i) - xtild(i-1) )
    225         ENDDO
    226 
    227 
    228 c    *****************************************************************
    229 c
    230 
    231 c     .....  xuv = 0.   si  calcul  aux pts   scalaires   ........
    232 c     .....  xuv = 0.5  si  calcul  aux pts      U        ........
    233 c
    234       WRITE(6,18)
    235 c
    236       DO 5000  ik = 1, 4
    237 
    238        IF( ik.EQ.1 )        THEN
    239          xuv =  -0.25
    240        ELSE IF ( ik.EQ.2 )  THEN
    241          xuv =   0.
    242        ELSE IF ( ik.EQ.3 )  THEN
    243          xuv =   0.50
    244        ELSE IF ( ik.EQ.4 )  THEN
    245          xuv =   0.25
    246        ENDIF
    247 
    248       xo1   = 0.
    249 
    250       ii1=1
    251       ii2=iim
    252       IF(ik.EQ.1.and.grossism.EQ.1.) THEN
    253         ii1 = 2
    254         ii2 = iim+1
    255       ENDIF
    256       DO 1500 i = ii1, ii2
    257 
    258       xlon2 = - pi + (REAL(i) + xuv - decalx) * depi / REAL(iim)
    259 
    260       Xfi    = xlon2
    261 c
    262       DO 250 it =  nmax2,0,-1
    263       IF( Xfi.GE.Xf(it))  GO TO 350
    264 250   CONTINUE
    265 
    266       it = 0
    267 
    268 350   CONTINUE
    269 
    270 c    ......  Calcul de   Xf(xi)    ......
    271 c
    272       xi  = xtild(it)
    273 
    274       IF(it.EQ.nmax2)  THEN
    275        it       = nmax2 -1
    276        Xf(it+1) = pi
    277       ENDIF
    278 c  .....................................................................
    279 c
    280 c   Appel de la routine qui calcule les coefficients a0,a1,a2,a3 d'un
    281 c   polynome de degre 3  qui passe  par les points (Xf(it),xtild(it) )
    282 c          et (Xf(it+1),xtild(it+1) )
    283 
    284        CALL coefpoly ( Xf(it),Xf(it+1),Xprimt(it),Xprimt(it+1),
    285      ,                xtild(it),xtild(it+1),  a0, a1, a2, a3  )
    286 
    287        Xf1     = Xf(it)
    288        Xprimin = a1 + 2.* a2 * xi + 3.*a3 * xi *xi
    289 
    290        DO 500 iter = 1,300
    291         xi = xi - ( Xf1 - Xfi )/ Xprimin
    292 
    293         IF( ABS(xi-xo1).LE.epsilon)  GO TO 550
    294          xo1      = xi
    295          xi2      = xi * xi
    296          Xf1      = a0 +  a1 * xi +     a2 * xi2  +     a3 * xi2 * xi
    297          Xprimin  =       a1      + 2.* a2 *  xi  + 3.* a3 * xi2
    298 500   CONTINUE
    299         WRITE(6,*) ' Pas de solution ***** ',i,xlon2,iter
    300           STOP 6
    301 550   CONTINUE
    302 
    303        xxprim(i) = depi/ ( REAL(iim) * Xprimin )
    304        xvrai(i)  =  xi + xzoom
    305 
    306 1500   CONTINUE
    307 
    308 
    309 
    310        IF(ik.EQ.1.and.grossism.EQ.1.)  THEN
    311          xvrai(1)    = xvrai(iip1)-depi
    312          xxprim(1)   = xxprim(iip1)
    313        ENDIF
    314 
    315        DO i = 1 , iim
    316         xlon(i)     = xvrai(i)
    317         xprimm(i)   = xxprim(i)
    318        ENDDO
    319        DO i = 1, iim -1
    320         IF( xvrai(i+1). LT. xvrai(i) )  THEN
    321          WRITE(6,*) ' PBS. avec rlonu(',i+1,') plus petit que rlonu(',i,
    322      ,  ')'
    323         STOP 7
    324         ENDIF
    325        ENDDO
    326 c
    327 c   ... Reorganisation  des  longitudes  pour les avoir  entre - pi et pi ..
    328 c   ........................................................................
    329 
    330        champmin =  1.e12
    331        champmax = -1.e12
    332        DO i = 1, iim
    333         champmin = MIN( champmin,xvrai(i) )
    334         champmax = MAX( champmax,xvrai(i) )
    335        ENDDO
    336 
    337       IF(champmin .GE.-pi-0.10.and.champmax.LE.pi+0.10 )  THEN
    338                 GO TO 1600
    339       ELSE
    340        WRITE(6,*) 'Reorganisation des longitudes pour avoir entre - pi',
    341      ,  ' et pi '
    342 c
    343         IF( xzoom.LE.0.)  THEN
    344           IF( ik.EQ. 1 )  THEN
    345           DO i = 1, iim
    346            IF( xvrai(i).GE. - pi )  GO TO 80
    347           ENDDO
    348             WRITE(6,*)  ' PBS. 1 !  Xvrai plus petit que  - pi ! '
    349             STOP 8
    350  80       CONTINUE
    351           is2 = i
    352           ENDIF
    353 
    354           IF( is2.NE. 1 )  THEN
    355             DO ii = is2 , iim
    356              xlon  (ii-is2+1) = xvrai(ii)
    357              xprimm(ii-is2+1) = xxprim(ii)
    358             ENDDO
    359             DO ii = 1 , is2 -1
    360              xlon  (ii+iim-is2+1) = xvrai(ii) + depi
    361              xprimm(ii+iim-is2+1) = xxprim(ii)
    362             ENDDO
    363           ENDIF
    364         ELSE
    365           IF( ik.EQ.1 )  THEN
    366            DO i = iim,1,-1
    367              IF( xvrai(i).LE. pi ) GO TO 90
    368            ENDDO
    369              WRITE(6,*) ' PBS.  2 ! Xvrai plus grand  que   pi ! '
    370               STOP 9
    371  90        CONTINUE
    372             is2 = i
    373           ENDIF
    374            idif = iim -is2
    375            DO ii = 1, is2
    376             xlon  (ii+idif) = xvrai(ii)
    377             xprimm(ii+idif) = xxprim(ii)
    378            ENDDO
    379            DO ii = 1, idif
    380             xlon (ii)  = xvrai (ii+is2) - depi
    381             xprimm(ii) = xxprim(ii+is2)
    382            ENDDO
    383          ENDIF
    384       ENDIF
    385 c
    386 c     .........   Fin  de la reorganisation   ............................
    387 
    388  1600    CONTINUE
    389 
    390 
    391          xlon  ( iip1)  = xlon(1) + depi
    392          xprimm( iip1 ) = xprimm (1 )
    393        
    394          DO i = 1, iim+1
    395          xvrai(i) = xlon(i)*180./pi
    396          ENDDO
    397 
    398          IF( ik.EQ.1 )  THEN
    399 c          WRITE(6,*)  ' XLON aux pts. V-0.25   apres ( en  deg. ) '
    400 c          WRITE(6,18)
    401 c          WRITE(6,68) xvrai
    402 c          WRITE(6,*) ' XPRIM k ',ik
    403 c          WRITE(6,566)  xprimm
    404 
    405            DO i = 1,iim +1
    406              rlonm025(i) = xlon( i )
    407             xprimm025(i) = xprimm(i)
    408            ENDDO
    409          ELSE IF( ik.EQ.2 )  THEN
    410 c          WRITE(6,18)
    411 c          WRITE(6,*)  ' XLON aux pts. V   apres ( en  deg. ) '
    412 c          WRITE(6,68) xvrai
    413 c          WRITE(6,*) ' XPRIM k ',ik
    414 c          WRITE(6,566)  xprimm
    415 
    416            DO i = 1,iim + 1
    417              rlonv(i) = xlon( i )
    418             xprimv(i) = xprimm(i)
    419            ENDDO
    420 
    421          ELSE IF( ik.EQ.3)   THEN
    422 c          WRITE(6,18)
    423 c          WRITE(6,*)  ' XLON aux pts. U   apres ( en  deg. ) '
    424 c          WRITE(6,68) xvrai
    425 c          WRITE(6,*) ' XPRIM ik ',ik
    426 c          WRITE(6,566)  xprimm
    427 
    428            DO i = 1,iim + 1
    429              rlonu(i) = xlon( i )
    430             xprimu(i) = xprimm(i)
    431            ENDDO
    432 
    433          ELSE IF( ik.EQ.4 )  THEN
    434 c          WRITE(6,18)
    435 c          WRITE(6,*)  ' XLON aux pts. V+0.25   apres ( en  deg. ) '
    436 c          WRITE(6,68) xvrai
    437 c          WRITE(6,*) ' XPRIM ik ',ik
    438 c          WRITE(6,566)  xprimm
    439 
    440            DO i = 1,iim + 1
    441              rlonp025(i) = xlon( i )
    442             xprimp025(i) = xprimm(i)
    443            ENDDO
    444 
    445          ENDIF
    446 
    447 5000    CONTINUE
    448 c
    449        WRITE(6,18)
    450 c
    451 c    ...........  fin  de la boucle  do 5000      ............
    452 
    453         DO i = 1, iim
    454          xlon(i) = rlonv(i+1) - rlonv(i)
    455         ENDDO
    456         champmin =  1.e12
    457         champmax = -1.e12
    458         DO i = 1, iim
    459          champmin = MIN( champmin, xlon(i) )
    460          champmax = MAX( champmax, xlon(i) )
    461         ENDDO
    462          champmin = champmin * 180./pi
    463          champmax = champmax * 180./pi
    464 
    465 18     FORMAT(/)
    466 24     FORMAT(2x,'Parametres xzoom,gross,tau ,dzoom pour fxhyp ',4f8.3)
    467 68     FORMAT(1x,7f9.2)
    468 566    FORMAT(1x,7f9.4)
    469 
    470        RETURN
    471        END
     1module fxhyp_m
     2
     3  IMPLICIT NONE
     4
     5contains
     6
     7  SUBROUTINE fxhyp(xprimm025, rlonv, xprimv, rlonu, xprimu, xprimp025)
     8
     9    ! From LMDZ4/libf/dyn3d/fxhyp.F, version 1.2, 2005/06/03 09:11:32
     10    ! Author: P. Le Van, from formulas by R. Sadourny
     11
     12    ! Calcule les longitudes et dérivées dans la grille du GCM pour
     13    ! une fonction f(x) à dérivée tangente hyperbolique.
     14
     15    ! Il vaut mieux avoir : grossismx \times dzoom < pi
     16
     17    ! Le premier point scalaire pour une grille regulière (grossismx =
     18    ! 1., taux=0., clon=0.) est à - 180 degrés.
     19
     20    use arth_m, only: arth
     21    use invert_zoom_x_m, only: invert_zoom_x, nmax
     22    use nrtype, only: pi, pi_d, twopi, twopi_d, k8
     23    use principal_cshift_m, only: principal_cshift
     24
     25    include "dimensions.h"
     26    ! for iim
     27
     28    include "serre.h"
     29    ! for clon, grossismx, dzoomx, taux
     30
     31    REAL, intent(out):: xprimm025(:), rlonv(:), xprimv(:) ! (iim + 1)
     32    real, intent(out):: rlonu(:), xprimu(:), xprimp025(:) ! (iim + 1)
     33
     34    ! Local:
     35    real rlonm025(iim + 1), rlonp025(iim + 1)
     36    REAL dzoom, step
     37    real d_rlonv(iim)
     38    REAL(K8) xtild(0:2 * nmax)
     39    REAL(K8) fhyp(nmax:2 * nmax), ffdx, beta, Xprimt(0:2 * nmax)
     40    REAL(K8) Xf(0:2 * nmax), xxpr(2 * nmax)
     41    REAL(K8) fa, fb
     42    INTEGER i, is2
     43    REAL(K8) xmoy, fxm
     44
     45    !----------------------------------------------------------------------
     46
     47    print *, "Call sequence information: fxhyp"
     48
     49    test_iim: if (iim==1) then
     50       rlonv(1)=0.
     51       rlonu(1)=pi
     52       rlonv(2)=rlonv(1)+twopi
     53       rlonu(2)=rlonu(1)+twopi
     54
     55       xprimm025(:)=1.
     56       xprimv(:)=1.
     57       xprimu(:)=1.
     58       xprimp025(:)=1.
     59    else test_iim
     60       test_grossismx: if (grossismx == 1.) then
     61          step = twopi / iim
     62
     63          xprimm025(:iim) = step
     64          xprimp025(:iim) = step
     65          xprimv(:iim) = step
     66          xprimu(:iim) = step
     67
     68          rlonv(:iim) = arth(- pi + clon / 180. * pi, step, iim)
     69          rlonm025(:iim) = rlonv(:iim) - 0.25 * step
     70          rlonp025(:iim) = rlonv(:iim) + 0.25 * step
     71          rlonu(:iim) = rlonv(:iim) + 0.5 * step
     72       else test_grossismx
     73          dzoom = dzoomx * twopi_d
     74          xtild = arth(- pi_d, pi_d / nmax, 2 * nmax + 1)
     75
     76          ! Compute fhyp:
     77          DO i = nmax, 2 * nmax
     78             fa = taux * (dzoom / 2. - xtild(i))
     79             fb = xtild(i) * (pi_d - xtild(i))
     80
     81             IF (200. * fb < - fa) THEN
     82                fhyp(i) = - 1.
     83             ELSE IF (200. * fb < fa) THEN
     84                fhyp(i) = 1.
     85             ELSE
     86                IF (ABS(fa) < 1e-13 .AND. ABS(fb) < 1e-13) THEN
     87                   IF (200. * fb + fa < 1e-10) THEN
     88                      fhyp(i) = - 1.
     89                   ELSE IF (200. * fb - fa < 1e-10) THEN
     90                      fhyp(i) = 1.
     91                   END IF
     92                ELSE
     93                   fhyp(i) = TANH(fa / fb)
     94                END IF
     95             END IF
     96
     97             IF (xtild(i) == 0.) fhyp(i) = 1.
     98             IF (xtild(i) == pi_d) fhyp(i) = -1.
     99          END DO
     100
     101          ! Calcul de beta
     102
     103          ffdx = 0.
     104
     105          DO i = nmax + 1, 2 * nmax
     106             xmoy = 0.5 * (xtild(i-1) + xtild(i))
     107             fa = taux * (dzoom / 2. - xmoy)
     108             fb = xmoy * (pi_d - xmoy)
     109
     110             IF (200. * fb < - fa) THEN
     111                fxm = - 1.
     112             ELSE IF (200. * fb < fa) THEN
     113                fxm = 1.
     114             ELSE
     115                IF (ABS(fa) < 1e-13 .AND. ABS(fb) < 1e-13) THEN
     116                   IF (200. * fb + fa < 1e-10) THEN
     117                      fxm = - 1.
     118                   ELSE IF (200. * fb - fa < 1e-10) THEN
     119                      fxm = 1.
     120                   END IF
     121                ELSE
     122                   fxm = TANH(fa / fb)
     123                END IF
     124             END IF
     125
     126             IF (xmoy == 0.) fxm = 1.
     127             IF (xmoy == pi_d) fxm = -1.
     128
     129             ffdx = ffdx + fxm * (xtild(i) - xtild(i-1))
     130          END DO
     131
     132          print *, "ffdx = ", ffdx
     133          beta = (grossismx * ffdx - pi_d) / (ffdx - pi_d)
     134          print *, "beta = ", beta
     135
     136          IF (2. * beta - grossismx <= 0.) THEN
     137             print *, 'Bad choice of grossismx, taux, dzoomx.'
     138             print *, 'Decrease dzoomx or grossismx.'
     139             STOP 1
     140          END IF
     141
     142          ! calcul de Xprimt
     143          Xprimt(nmax:2 * nmax) = beta + (grossismx - beta) * fhyp
     144          xprimt(:nmax - 1) = xprimt(2 * nmax:nmax + 1:- 1)
     145
     146          ! Calcul de Xf
     147
     148          DO i = nmax + 1, 2 * nmax
     149             xmoy = 0.5 * (xtild(i-1) + xtild(i))
     150             fa = taux * (dzoom / 2. - xmoy)
     151             fb = xmoy * (pi_d - xmoy)
     152
     153             IF (200. * fb < - fa) THEN
     154                fxm = - 1.
     155             ELSE IF (200. * fb < fa) THEN
     156                fxm = 1.
     157             ELSE
     158                fxm = TANH(fa / fb)
     159             END IF
     160
     161             IF (xmoy == 0.) fxm = 1.
     162             IF (xmoy == pi_d) fxm = -1.
     163             xxpr(i) = beta + (grossismx - beta) * fxm
     164          END DO
     165
     166          xxpr(:nmax) = xxpr(2 * nmax:nmax + 1:- 1)
     167
     168          Xf(0) = - pi_d
     169
     170          DO i=1, 2 * nmax - 1
     171             Xf(i) = Xf(i-1) + xxpr(i) * (xtild(i) - xtild(i-1))
     172          END DO
     173
     174          Xf(2 * nmax) = pi_d
     175
     176          call invert_zoom_x(xf, xtild, Xprimt, rlonm025(:iim), &
     177               xprimm025(:iim), xuv = - 0.25_k8)
     178          call invert_zoom_x(xf, xtild, Xprimt, rlonv(:iim), xprimv(:iim), &
     179               xuv = 0._k8)
     180          call invert_zoom_x(xf, xtild, Xprimt, rlonu(:iim), xprimu(:iim), &
     181               xuv = 0.5_k8)
     182          call invert_zoom_x(xf, xtild, Xprimt, rlonp025(:iim), &
     183               xprimp025(:iim), xuv = 0.25_k8)
     184       end if test_grossismx
     185
     186       is2 = 0
     187
     188       IF (MINval(rlonm025(:iim)) < - pi - 0.1 &
     189            .or. MAXval(rlonm025(:iim)) > pi + 0.1) THEN
     190          IF (clon <= 0.) THEN
     191             is2 = 1
     192
     193             do while (rlonm025(is2) < - pi .and. is2 < iim)
     194                is2 = is2 + 1
     195             end do
     196
     197             if (rlonm025(is2) < - pi) then
     198                print *, 'Rlonm025 plus petit que - pi !'
     199                STOP 1
     200             end if
     201          ELSE
     202             is2 = iim
     203
     204             do while (rlonm025(is2) > pi .and. is2 > 1)
     205                is2 = is2 - 1
     206             end do
     207
     208             if (rlonm025(is2) > pi) then
     209                print *, 'Rlonm025 plus grand que pi !'
     210                STOP 1
     211             end if
     212          END IF
     213       END IF
     214
     215       call principal_cshift(is2, rlonm025, xprimm025)
     216       call principal_cshift(is2, rlonv, xprimv)
     217       call principal_cshift(is2, rlonu, xprimu)
     218       call principal_cshift(is2, rlonp025, xprimp025)
     219
     220       forall (i = 1: iim) d_rlonv(i) = rlonv(i + 1) - rlonv(i)
     221       print *, "Minimum longitude step:", MINval(d_rlonv) * 180. / pi, &
     222            "degrees"
     223       print *, "Maximum longitude step:", MAXval(d_rlonv) * 180. / pi, &
     224            "degrees"
     225
     226       ! Check that rlonm025 <= rlonv <= rlonp025 <= rlonu:
     227       DO i = 1, iim + 1
     228          IF (rlonp025(i) < rlonv(i)) THEN
     229             print *, 'rlonp025(', i, ') = ', rlonp025(i)
     230             print *, "< rlonv(", i, ") = ", rlonv(i)
     231             STOP 1
     232          END IF
     233
     234          IF (rlonv(i) < rlonm025(i)) THEN
     235             print *, 'rlonv(', i, ') = ', rlonv(i)
     236             print *, "< rlonm025(", i, ") = ", rlonm025(i)
     237             STOP 1
     238          END IF
     239
     240          IF (rlonp025(i) > rlonu(i)) THEN
     241             print *, 'rlonp025(', i, ') = ', rlonp025(i)
     242             print *, "> rlonu(", i, ") = ", rlonu(i)
     243             STOP 1
     244          END IF
     245       END DO
     246    end if test_iim
     247
     248  END SUBROUTINE fxhyp
     249
     250end module fxhyp_m
  • trunk/LMDZ.COMMON/libf/dyn3d_common/fyhyp_m.F90

    r1440 r1441  
    1 !
    2 ! $Id: fyhyp.F 1403 2010-07-01 09:02:53Z fairhead $
    3 !
    4 c
    5 c
    6        SUBROUTINE fyhyp ( yzoomdeg, grossism, dzooma,tau  , 
    7      ,  rrlatu,yyprimu,rrlatv,yyprimv,rlatu2,yprimu2,rlatu1,yprimu1 ,
    8      ,  champmin,champmax                                            )
    9 
    10 cc    ...  Version du 01/04/2001 ....
    11 
    12        IMPLICIT NONE
    13 c
    14 c    ...   Auteur :  P. Le Van  ...
    15 c
    16 c    .......    d'apres  formulations  de R. Sadourny  .......
    17 c
    18 c     Calcule les latitudes et derivees dans la grille du GCM pour une
    19 c     fonction f(y) a tangente  hyperbolique  .
    20 c
    21 c     grossism etant le grossissement ( = 2 si 2 fois, = 3 si 3 fois , etc)
    22 c     dzoom  etant  la distance totale de la zone du zoom ( en radians )
    23 c     tau  la raideur de la transition de l'interieur a l'exterieur du zoom   
    24 c
    25 c
    26 c N.B : Il vaut mieux avoir : grossism * dzoom  <  pi/2  (radians) ,en lati.
    27 c      ********************************************************************
    28 c
    29 c
    30 #include "dimensions.h"
    31 #include "paramet.h"
    32 
    33        INTEGER      nmax , nmax2
    34        PARAMETER (  nmax = 30000, nmax2 = 2*nmax )
    35 c
    36 c
    37 c     .......  arguments  d'entree    .......
    38 c
    39        REAL yzoomdeg, grossism,dzooma,tau
    40 c         ( rentres  par  run.def )
    41 
    42 c     .......  arguments  de sortie   .......
    43 c
    44        REAL rrlatu(jjp1), yyprimu(jjp1),rrlatv(jjm), yyprimv(jjm),
    45      , rlatu1(jjm), yprimu1(jjm), rlatu2(jjm), yprimu2(jjm)
    46 
    47 c
    48 c     .....     champs  locaux    .....
    49 c
    50      
    51        REAL   dzoom
    52        REAL(KIND=8) ylat(jjp1), yprim(jjp1)
    53        REAL(KIND=8) yuv
    54        REAL(KIND=8) yt(0:nmax2)
    55        REAL(KIND=8) fhyp(0:nmax2),beta,Ytprim(0:nmax2),fxm(0:nmax2)
    56        SAVE Ytprim, yt,Yf
    57        REAL(KIND=8) Yf(0:nmax2),yypr(0:nmax2)
    58        REAL(KIND=8) yvrai(jjp1), yprimm(jjp1),ylatt(jjp1)
    59        REAL(KIND=8) pi,depi,pis2,epsilon,y0,pisjm
    60        REAL(KIND=8) yo1,yi,ylon2,ymoy,Yprimin,champmin,champmax
    61        REAL(KIND=8) yfi,Yf1,ffdy
    62        REAL(KIND=8) ypn,deply,y00
    63        SAVE y00, deply
    64 
    65        INTEGER i,j,it,ik,iter,jlat
    66        INTEGER jpn,jjpn
    67        SAVE jpn
    68        REAL(KIND=8) a0,a1,a2,a3,yi2,heavyy0,heavyy0m
    69        REAL(KIND=8) fa(0:nmax2),fb(0:nmax2)
    70        REAL y0min,y0max
    71 
    72        REAL(KIND=8)     heavyside
    73 
    74        pi       = 2. * ASIN(1.)
    75        depi     = 2. * pi
    76        pis2     = pi/2.
    77        pisjm    = pi/ REAL(jjm)
    78        epsilon  = 1.e-3
    79        y0       =  yzoomdeg * pi/180.
    80 
    81        IF( dzooma.LT.1.)  THEN
    82          dzoom = dzooma * pi
    83        ELSEIF( dzooma.LT. 12. ) THEN
    84          WRITE(6,*) ' Le param. dzoomy pour fyhyp est trop petit ! L aug
    85      ,menter et relancer ! '
    86          STOP 1
     1module fyhyp_m
     2
     3  IMPLICIT NONE
     4
     5contains
     6
     7  SUBROUTINE fyhyp(rlatu, yyprimu, rlatv, rlatu2, yprimu2, rlatu1, yprimu1)
     8
     9    ! From LMDZ4/libf/dyn3d/fyhyp.F, version 1.2, 2005/06/03 09:11:32
     10
     11    ! Author: P. Le Van, from analysis by R. Sadourny
     12
     13    ! Calcule les latitudes et dérivées dans la grille du GCM pour une
     14    ! fonction f(y) à dérivée tangente hyperbolique.
     15
     16    ! Il vaut mieux avoir : grossismy * dzoom < pi / 2
     17
     18    use coefpoly_m, only: coefpoly
     19    use nrtype, only: k8
     20
     21    include "dimensions.h"
     22    ! for jjm
     23
     24    include "serre.h"
     25    ! for clat, grossismy, dzoomy, tauy
     26
     27    REAL, intent(out):: rlatu(jjm + 1), yyprimu(jjm + 1)
     28    REAL, intent(out):: rlatv(jjm)
     29    real, intent(out):: rlatu2(jjm), yprimu2(jjm), rlatu1(jjm), yprimu1(jjm)
     30
     31    ! Local:
     32
     33    REAL(K8) champmin, champmax
     34    INTEGER, PARAMETER:: nmax=30000, nmax2=2*nmax
     35    REAL dzoom ! distance totale de la zone du zoom (en radians)
     36    REAL(K8) ylat(jjm + 1), yprim(jjm + 1)
     37    REAL(K8) yuv
     38    REAL(K8), save:: yt(0:nmax2)
     39    REAL(K8) fhyp(0:nmax2), beta
     40    REAL(K8), save:: ytprim(0:nmax2)
     41    REAL(K8) fxm(0:nmax2)
     42    REAL(K8), save:: yf(0:nmax2)
     43    REAL(K8) yypr(0:nmax2)
     44    REAL(K8) yvrai(jjm + 1), yprimm(jjm + 1), ylatt(jjm + 1)
     45    REAL(K8) pi, pis2, epsilon, y0, pisjm
     46    REAL(K8) yo1, yi, ylon2, ymoy, yprimin
     47    REAL(K8) yfi, yf1, ffdy
     48    REAL(K8) ypn, deply, y00
     49    SAVE y00, deply
     50
     51    INTEGER i, j, it, ik, iter, jlat
     52    INTEGER jpn, jjpn
     53    SAVE jpn
     54    REAL(K8) a0, a1, a2, a3, yi2, heavyy0, heavyy0m
     55    REAL(K8) fa(0:nmax2), fb(0:nmax2)
     56    REAL y0min, y0max
     57
     58    REAL(K8) heavyside
     59
     60    !-------------------------------------------------------------------
     61
     62    print *, "Call sequence information: fyhyp"
     63
     64    pi = 2.*asin(1.)
     65    pis2 = pi/2.
     66    pisjm = pi/real(jjm)
     67    epsilon = 1e-3
     68    y0 = clat*pi/180.
     69    dzoom = dzoomy*pi
     70    print *, 'yzoom(rad), grossismy, tauy, dzoom (rad):'
     71    print *, y0, grossismy, tauy, dzoom
     72
     73    DO i = 0, nmax2
     74       yt(i) = -pis2 + real(i)*pi/nmax2
     75    END DO
     76
     77    heavyy0m = heavyside(-y0)
     78    heavyy0 = heavyside(y0)
     79    y0min = 2.*y0*heavyy0m - pis2
     80    y0max = 2.*y0*heavyy0 + pis2
     81
     82    fa = 999.999
     83    fb = 999.999
     84
     85    DO i = 0, nmax2
     86       IF (yt(i)<y0) THEN
     87          fa(i) = tauy*(yt(i)-y0 + dzoom/2.)
     88          fb(i) = (yt(i)-2.*y0*heavyy0m + pis2)*(y0-yt(i))
     89       ELSE IF (yt(i)>y0) THEN
     90          fa(i) = tauy*(y0-yt(i) + dzoom/2.)
     91          fb(i) = (2.*y0*heavyy0-yt(i) + pis2)*(yt(i)-y0)
     92       END IF
     93
     94       IF (200.*fb(i)<-fa(i)) THEN
     95          fhyp(i) = -1.
     96       ELSE IF (200.*fb(i)<fa(i)) THEN
     97          fhyp(i) = 1.
    8798       ELSE
    88          dzoom = dzooma * pi/180.
    89        ENDIF
    90 
    91        WRITE(6,18)
    92        WRITE(6,*) ' yzoom( rad.),grossism,tau,dzoom (radians)'
    93        WRITE(6,24) y0,grossism,tau,dzoom
    94 
    95        DO i = 0, nmax2
    96         yt(i) = - pis2  + REAL(i)* pi /nmax2
    97        ENDDO
    98 
    99        heavyy0m = heavyside( -y0 )
    100        heavyy0  = heavyside(  y0 )
    101        y0min    = 2.*y0*heavyy0m - pis2
    102        y0max    = 2.*y0*heavyy0  + pis2
    103 
    104        fa = 999.999
    105        fb = 999.999
    106        
    107        DO i = 0, nmax2
    108         IF( yt(i).LT.y0 )  THEN
    109          fa (i) = tau*  (yt(i)-y0+dzoom/2. )
    110          fb(i) =   (yt(i)-2.*y0*heavyy0m +pis2) * ( y0 - yt(i) )
    111         ELSEIF ( yt(i).GT.y0 )  THEN
    112          fa(i) =   tau *(y0-yt(i)+dzoom/2. )
    113          fb(i) = (2.*y0*heavyy0 -yt(i)+pis2) * ( yt(i) - y0 )
    114        ENDIF
    115        
    116        IF( 200.* fb(i) .LT. - fa(i) )   THEN
    117          fhyp ( i) = - 1.
    118        ELSEIF( 200. * fb(i) .LT. fa(i) ) THEN
    119          fhyp ( i) =   1.
    120        ELSE 
    121          fhyp(i) =  TANH ( fa(i)/fb(i) )
    122        ENDIF
    123 
    124        IF( yt(i).EQ.y0 )  fhyp(i) = 1.
    125        IF(yt(i).EQ. y0min. OR.yt(i).EQ. y0max ) fhyp(i) = -1.
    126 
    127        ENDDO
    128 
    129 cc  ....  Calcul  de  beta  ....
    130 c
    131        ffdy   = 0.
    132 
    133        DO i = 1, nmax2
    134         ymoy    = 0.5 * ( yt(i-1) + yt( i ) )
    135         IF( ymoy.LT.y0 )  THEN
    136          fa(i)= tau * ( ymoy-y0+dzoom/2.)
    137          fb(i) = (ymoy-2.*y0*heavyy0m +pis2) * ( y0 - ymoy )
    138         ELSEIF ( ymoy.GT.y0 )  THEN
    139          fa(i)= tau * ( y0-ymoy+dzoom/2. )
    140          fb(i) = (2.*y0*heavyy0 -ymoy+pis2) * ( ymoy - y0 )
    141         ENDIF
    142 
    143         IF( 200.* fb(i) .LT. - fa(i) )    THEN
    144          fxm ( i) = - 1.
    145         ELSEIF( 200. * fb(i) .LT. fa(i) ) THEN
    146          fxm ( i) =   1.
    147         ELSE
    148          fxm(i) =  TANH ( fa(i)/fb(i) )
    149         ENDIF
    150          IF( ymoy.EQ.y0 )  fxm(i) = 1.
    151          IF (ymoy.EQ. y0min. OR.yt(i).EQ. y0max ) fxm(i) = -1.
    152          ffdy = ffdy + fxm(i) * ( yt(i) - yt(i-1) )
    153 
    154         ENDDO
    155 
    156         beta  = ( grossism * ffdy - pi ) / ( ffdy - pi )
    157 
    158        IF( 2.*beta - grossism.LE. 0.)  THEN
    159 
    160         WRITE(6,*) ' **  Attention ! La valeur beta calculee dans la rou
    161      ,tine fyhyp est mauvaise ! '
    162         WRITE(6,*)'Modifier les valeurs de  grossismy ,tauy ou dzoomy',
    163      , ' et relancer ! ***  '
    164         CALL ABORT_GCM("FYHYP", "", 1)
    165 
    166        ENDIF
    167 c
    168 c   .....  calcul  de  Ytprim   .....
    169 c
    170        
    171        DO i = 0, nmax2
    172         Ytprim(i) = beta  + ( grossism - beta ) * fhyp(i)
    173        ENDDO
    174 
    175 c   .....  Calcul  de  Yf     ........
    176 
    177        Yf(0) = - pis2
    178        DO i = 1, nmax2
    179         yypr(i)    = beta + ( grossism - beta ) * fxm(i)
    180        ENDDO
    181 
    182        DO i=1,nmax2
    183         Yf(i)   = Yf(i-1) + yypr(i) * ( yt(i) - yt(i-1) )
    184        ENDDO
    185 
    186 c    ****************************************************************
    187 c
    188 c   .....   yuv  = 0.   si calcul des latitudes  aux pts.  U  .....
    189 c   .....   yuv  = 0.5  si calcul des latitudes  aux pts.  V  .....
    190 c
    191       WRITE(6,18)
    192 c
    193       DO 5000  ik = 1,4
    194 
    195        IF( ik.EQ.1 )  THEN
    196          yuv  = 0.
    197          jlat = jjm + 1
    198        ELSE IF ( ik.EQ.2 )  THEN
    199          yuv  = 0.5
    200          jlat = jjm
    201        ELSE IF ( ik.EQ.3 )  THEN
    202          yuv  = 0.25
    203          jlat = jjm
    204        ELSE IF ( ik.EQ.4 )  THEN
    205          yuv  = 0.75
    206          jlat = jjm
    207        ENDIF
    208 c
    209        yo1   = 0.
    210        DO 1500 j =  1,jlat
    211         yo1   = 0.
    212         ylon2 =  - pis2 + pisjm * ( REAL(j)  + yuv  -1.) 
    213         yfi    = ylon2
    214 c
    215        DO 250 it =  nmax2,0,-1
    216         IF( yfi.GE.Yf(it))  GO TO 350
    217 250    CONTINUE
    218        it = 0
    219 350    CONTINUE
    220 
    221        yi = yt(it)
    222        IF(it.EQ.nmax2)  THEN
    223         it       = nmax2 -1
    224         Yf(it+1) = pis2
    225        ENDIF
    226 c  .................................................................
    227 c  ....  Interpolation entre  yi(it) et yi(it+1)   pour avoir Y(yi) 
    228 c      .....           et   Y'(yi)                             .....
    229 c  .................................................................
    230 
    231        CALL coefpoly ( Yf(it),Yf(it+1),Ytprim(it), Ytprim(it+1),   
    232      ,                  yt(it),yt(it+1) ,   a0,a1,a2,a3   )     
    233 
    234        Yf1     = Yf(it)
    235        Yprimin = a1 + 2.* a2 * yi + 3.*a3 * yi *yi
    236 
    237        DO 500 iter = 1,300
    238          yi = yi - ( Yf1 - yfi )/ Yprimin
    239 
    240         IF( ABS(yi-yo1).LE.epsilon)  GO TO 550
    241          yo1      = yi
    242          yi2      = yi * yi
    243          Yf1      = a0 +  a1 * yi +     a2 * yi2  +     a3 * yi2 * yi
    244          Yprimin  =       a1      + 2.* a2 *  yi  + 3.* a3 * yi2
    245 500   CONTINUE
    246         WRITE(6,*) ' Pas de solution ***** ',j,ylon2,iter
    247          STOP 2
    248 550   CONTINUE
    249 c
    250        Yprimin   = a1  + 2.* a2 *  yi   + 3.* a3 * yi* yi
    251        yprim(j)  = pi / ( jjm * Yprimin )
    252        yvrai(j)  = yi
    253 
    254 1500    CONTINUE
    255 
    256        DO j = 1, jlat -1
    257         IF( yvrai(j+1). LT. yvrai(j) )  THEN
    258          WRITE(6,*) ' PBS. avec  rlat(',j+1,') plus petit que rlat(',j,
    259      ,  ')'
    260          STOP 3
    261         ENDIF
    262        ENDDO
    263 
    264        WRITE(6,*) 'Reorganisation des latitudes pour avoir entre - pi/2'
    265      , ,' et  pi/2 '
    266 c
    267         IF( ik.EQ.1 )   THEN
    268            ypn = pis2
    269           DO j = jlat,1,-1
    270            IF( yvrai(j).LE. ypn ) GO TO 1502
    271           ENDDO
    272 1502     CONTINUE
    273 
    274          jpn   = j
    275          y00   = yvrai(jpn)
    276          deply = pis2 -  y00
    277         ENDIF
    278 
    279          DO  j = 1, jjm +1 - jpn
    280            ylatt (j)  = -pis2 - y00  + yvrai(jpn+j-1)
    281            yprimm(j)  = yprim(jpn+j-1)
    282          ENDDO
    283 
    284          jjpn  = jpn
    285          IF( jlat.EQ. jjm ) jjpn = jpn -1
    286 
    287          DO j = 1,jjpn
    288           ylatt (j + jjm+1 -jpn) = yvrai(j) + deply
    289           yprimm(j + jjm+1 -jpn) = yprim(j)
    290          ENDDO
    291 
    292 c      ***********   Fin de la reorganisation     *************
    293 c
    294  1600   CONTINUE
    295 
     99          fhyp(i) = tanh(fa(i)/fb(i))
     100       END IF
     101
     102       IF (yt(i)==y0) fhyp(i) = 1.
     103       IF (yt(i)==y0min .OR. yt(i)==y0max) fhyp(i) = -1.
     104    END DO
     105
     106    ! Calcul de beta
     107
     108    ffdy = 0.
     109
     110    DO i = 1, nmax2
     111       ymoy = 0.5*(yt(i-1) + yt(i))
     112       IF (ymoy<y0) THEN
     113          fa(i) = tauy*(ymoy-y0 + dzoom/2.)
     114          fb(i) = (ymoy-2.*y0*heavyy0m + pis2)*(y0-ymoy)
     115       ELSE IF (ymoy>y0) THEN
     116          fa(i) = tauy*(y0-ymoy + dzoom/2.)
     117          fb(i) = (2.*y0*heavyy0-ymoy + pis2)*(ymoy-y0)
     118       END IF
     119
     120       IF (200.*fb(i)<-fa(i)) THEN
     121          fxm(i) = -1.
     122       ELSE IF (200.*fb(i)<fa(i)) THEN
     123          fxm(i) = 1.
     124       ELSE
     125          fxm(i) = tanh(fa(i)/fb(i))
     126       END IF
     127       IF (ymoy==y0) fxm(i) = 1.
     128       IF (ymoy==y0min .OR. yt(i)==y0max) fxm(i) = -1.
     129       ffdy = ffdy + fxm(i)*(yt(i)-yt(i-1))
     130    END DO
     131
     132    beta = (grossismy*ffdy-pi)/(ffdy-pi)
     133
     134    IF (2. * beta - grossismy <= 0.) THEN
     135       print *, 'Attention ! La valeur beta calculee dans la routine fyhyp ' &
     136            // 'est mauvaise. Modifier les valeurs de grossismy, tauy ou ' &
     137            // 'dzoomy et relancer.'
     138       STOP 1
     139    END IF
     140
     141    ! calcul de Ytprim
     142
     143    DO i = 0, nmax2
     144       ytprim(i) = beta + (grossismy-beta)*fhyp(i)
     145    END DO
     146
     147    ! Calcul de Yf
     148
     149    yf(0) = -pis2
     150    DO i = 1, nmax2
     151       yypr(i) = beta + (grossismy-beta)*fxm(i)
     152    END DO
     153
     154    DO i = 1, nmax2
     155       yf(i) = yf(i-1) + yypr(i)*(yt(i)-yt(i-1))
     156    END DO
     157
     158    ! yuv = 0. si calcul des latitudes aux pts. U
     159    ! yuv = 0.5 si calcul des latitudes aux pts. V
     160
     161    loop_ik: DO ik = 1, 4
     162       IF (ik==1) THEN
     163          yuv = 0.
     164          jlat = jjm + 1
     165       ELSE IF (ik==2) THEN
     166          yuv = 0.5
     167          jlat = jjm
     168       ELSE IF (ik==3) THEN
     169          yuv = 0.25
     170          jlat = jjm
     171       ELSE IF (ik==4) THEN
     172          yuv = 0.75
     173          jlat = jjm
     174       END IF
     175
     176       yo1 = 0.
    296177       DO j = 1, jlat
    297           ylat(j) =  ylatt( jlat +1 -j )
    298          yprim(j) = yprimm( jlat +1 -j )
    299        ENDDO
    300  
    301         DO j = 1, jlat
    302          yvrai(j) = ylat(j)*180./pi
    303         ENDDO
    304 
    305         IF( ik.EQ.1 )  THEN
    306 c         WRITE(6,18)
    307 c         WRITE(6,*)  ' YLAT  en U   apres ( en  deg. ) '
    308 c         WRITE(6,68) (yvrai(j),j=1,jlat)
    309 cc         WRITE(6,*) ' YPRIM '
    310 cc         WRITE(6,445) ( yprim(j),j=1,jlat)
    311 
    312           DO j = 1, jlat
    313             rrlatu(j) =  ylat( j )
    314            yyprimu(j) = yprim( j )
    315           ENDDO
    316 
    317         ELSE IF ( ik.EQ. 2 )  THEN
    318 c         WRITE(6,18)
    319 c         WRITE(6,*) ' YLAT   en V  apres ( en  deg. ) '
    320 c         WRITE(6,68) (yvrai(j),j=1,jlat)
    321 cc         WRITE(6,*)' YPRIM '
    322 cc         WRITE(6,445) ( yprim(j),j=1,jlat)
    323 
    324           DO j = 1, jlat
    325             rrlatv(j) =  ylat( j )
    326            yyprimv(j) = yprim( j )
    327           ENDDO
    328 
    329         ELSE IF ( ik.EQ. 3 )  THEN
    330 c         WRITE(6,18)
    331 c         WRITE(6,*)  ' YLAT  en U + 0.75  apres ( en  deg. ) '
    332 c         WRITE(6,68) (yvrai(j),j=1,jlat)
    333 cc         WRITE(6,*) ' YPRIM '
    334 cc         WRITE(6,445) ( yprim(j),j=1,jlat)
    335 
    336           DO j = 1, jlat
    337             rlatu2(j) =  ylat( j )
    338            yprimu2(j) = yprim( j )
    339           ENDDO
    340 
    341         ELSE IF ( ik.EQ. 4 )  THEN
    342 c         WRITE(6,18)
    343 c         WRITE(6,*)  ' YLAT en U + 0.25  apres ( en  deg. ) '
    344 c         WRITE(6,68)(yvrai(j),j=1,jlat)
    345 cc         WRITE(6,*) ' YPRIM '
    346 cc         WRITE(6,68) ( yprim(j),j=1,jlat)
    347 
    348           DO j = 1, jlat
    349             rlatu1(j) =  ylat( j )
    350            yprimu1(j) = yprim( j )
    351           ENDDO
    352 
    353         ENDIF
    354 
    355 5000   CONTINUE
    356 c
    357         WRITE(6,18)
    358 c
    359 c  .....     fin de la boucle  do 5000 .....
    360 
    361         DO j = 1, jjm
    362          ylat(j) = rrlatu(j) - rrlatu(j+1)
    363         ENDDO
    364         champmin =  1.e12
    365         champmax = -1.e12
    366         DO j = 1, jjm
    367          champmin = MIN( champmin, ylat(j) )
    368          champmax = MAX( champmax, ylat(j) )
    369         ENDDO
    370          champmin = champmin * 180./pi
    371          champmax = champmax * 180./pi
    372 
    373 24     FORMAT(2x,'Parametres yzoom,gross,tau ,dzoom pour fyhyp ',4f8.3)
    374 18      FORMAT(/)
    375 68      FORMAT(1x,7f9.2)
    376 
    377         RETURN
    378         END
     178          yo1 = 0.
     179          ylon2 = -pis2 + pisjm*(real(j) + yuv-1.)
     180          yfi = ylon2
     181
     182          it = nmax2
     183          DO while (it >= 1 .and. yfi < yf(it))
     184             it = it - 1
     185          END DO
     186
     187          yi = yt(it)
     188          IF (it==nmax2) THEN
     189             it = nmax2 - 1
     190             yf(it + 1) = pis2
     191          END IF
     192
     193          ! Interpolation entre yi(it) et yi(it + 1) pour avoir Y(yi)
     194          ! et Y'(yi)
     195
     196          CALL coefpoly(yf(it), yf(it + 1), ytprim(it), ytprim(it + 1), &
     197               yt(it), yt(it + 1), a0, a1, a2, a3)
     198
     199          yf1 = yf(it)
     200          yprimin = a1 + 2.*a2*yi + 3.*a3*yi*yi
     201
     202          iter = 1
     203          DO
     204             yi = yi - (yf1-yfi)/yprimin
     205             IF (abs(yi-yo1)<=epsilon .or. iter == 300) exit
     206             yo1 = yi
     207             yi2 = yi*yi
     208             yf1 = a0 + a1*yi + a2*yi2 + a3*yi2*yi
     209             yprimin = a1 + 2.*a2*yi + 3.*a3*yi2
     210          END DO
     211          if (abs(yi-yo1) > epsilon) then
     212             print *, 'Pas de solution.', j, ylon2
     213             STOP 1
     214          end if
     215
     216          yprimin = a1 + 2.*a2*yi + 3.*a3*yi*yi
     217          yprim(j) = pi/(jjm*yprimin)
     218          yvrai(j) = yi
     219       END DO
     220
     221       DO j = 1, jlat - 1
     222          IF (yvrai(j + 1)<yvrai(j)) THEN
     223             print *, 'Problème avec rlat(', j + 1, ') plus petit que rlat(', &
     224                  j, ')'
     225             STOP 1
     226          END IF
     227       END DO
     228
     229       print *, 'Reorganisation des latitudes pour avoir entre - pi/2 et pi/2'
     230
     231       IF (ik==1) THEN
     232          ypn = pis2
     233          DO j = jjm + 1, 1, -1
     234             IF (yvrai(j)<=ypn) exit
     235          END DO
     236
     237          jpn = j
     238          y00 = yvrai(jpn)
     239          deply = pis2 - y00
     240       END IF
     241
     242       DO j = 1, jjm + 1 - jpn
     243          ylatt(j) = -pis2 - y00 + yvrai(jpn + j-1)
     244          yprimm(j) = yprim(jpn + j-1)
     245       END DO
     246
     247       jjpn = jpn
     248       IF (jlat==jjm) jjpn = jpn - 1
     249
     250       DO j = 1, jjpn
     251          ylatt(j + jjm + 1-jpn) = yvrai(j) + deply
     252          yprimm(j + jjm + 1-jpn) = yprim(j)
     253       END DO
     254
     255       ! Fin de la reorganisation
     256
     257       DO j = 1, jlat
     258          ylat(j) = ylatt(jlat + 1-j)
     259          yprim(j) = yprimm(jlat + 1-j)
     260       END DO
     261
     262       DO j = 1, jlat
     263          yvrai(j) = ylat(j)*180./pi
     264       END DO
     265
     266       IF (ik==1) THEN
     267          DO j = 1, jjm + 1
     268             rlatu(j) = ylat(j)
     269             yyprimu(j) = yprim(j)
     270          END DO
     271       ELSE IF (ik==2) THEN
     272          DO j = 1, jjm
     273             rlatv(j) = ylat(j)
     274          END DO
     275       ELSE IF (ik==3) THEN
     276          DO j = 1, jjm
     277             rlatu2(j) = ylat(j)
     278             yprimu2(j) = yprim(j)
     279          END DO
     280       ELSE IF (ik==4) THEN
     281          DO j = 1, jjm
     282             rlatu1(j) = ylat(j)
     283             yprimu1(j) = yprim(j)
     284          END DO
     285       END IF
     286    END DO loop_ik
     287
     288    DO j = 1, jjm
     289       ylat(j) = rlatu(j) - rlatu(j + 1)
     290    END DO
     291    champmin = 1e12
     292    champmax = -1e12
     293    DO j = 1, jjm
     294       champmin = min(champmin, ylat(j))
     295       champmax = max(champmax, ylat(j))
     296    END DO
     297    champmin = champmin*180./pi
     298    champmax = champmax*180./pi
     299
     300    DO j = 1, jjm
     301       IF (rlatu1(j) <= rlatu2(j)) THEN
     302          print *, 'Attention ! rlatu1 < rlatu2 ', rlatu1(j), rlatu2(j), j
     303          STOP 13
     304       ENDIF
     305
     306       IF (rlatu2(j) <= rlatu(j+1)) THEN
     307          print *, 'Attention ! rlatu2 < rlatup1 ', rlatu2(j), rlatu(j+1), j
     308          STOP 14
     309       ENDIF
     310
     311       IF (rlatu(j) <= rlatu1(j)) THEN
     312          print *, ' Attention ! rlatu < rlatu1 ', rlatu(j), rlatu1(j), j
     313          STOP 15
     314       ENDIF
     315
     316       IF (rlatv(j) <= rlatu2(j)) THEN
     317          print *, ' Attention ! rlatv < rlatu2 ', rlatv(j), rlatu2(j), j
     318          STOP 16
     319       ENDIF
     320
     321       IF (rlatv(j) >= rlatu1(j)) THEN
     322          print *, ' Attention ! rlatv > rlatu1 ', rlatv(j), rlatu1(j), j
     323          STOP 17
     324       ENDIF
     325
     326       IF (rlatv(j) >= rlatu(j)) THEN
     327          print *, ' Attention ! rlatv > rlatu ', rlatv(j), rlatu(j), j
     328          STOP 18
     329       ENDIF
     330    ENDDO
     331
     332    print *, 'Latitudes'
     333    print 3, champmin, champmax
     334
     3353   Format(1x, ' Au centre du zoom, la longueur de la maille est', &
     336         ' d environ ', f0.2, ' degres ', /, &
     337         ' alors que la maille en dehors de la zone du zoom est ', &
     338         "d'environ ", f0.2, ' degres ')
     339
     340  END SUBROUTINE fyhyp
     341
     342end module fyhyp_m
  • trunk/LMDZ.COMMON/libf/dyn3d_common/grilles_gcm_netcdf_sub.F90

    r1422 r1441  
    3131  INTEGER out_latudim,out_latvdim,out_dim(3)
    3232  INTEGER out_levdim
    33 
    34   INTEGER, PARAMETER :: longcles = 20
    35   REAL  clesphy0(longcles)
    3633
    3734  INTEGER start(4),COUNT(4)
     
    5956  pa= 50000.
    6057
    61   CALL conf_gcm( 99, .TRUE. , clesphy0 )
     58  CALL conf_gcm( 99, .TRUE. )
    6259  CALL iniconst
    6360  CALL inigeom
  • trunk/LMDZ.COMMON/libf/dyn3d_common/inigeom.F

    r1422 r1441  
    2020      USE serre_mod, ONLY: clon,clat,grossismx,grossismy,dzoomx,dzoomy,
    2121     .          alphax,alphay,taux,tauy,transx,transy,pxo,pyo
     22      use fxhyp_m, only: fxhyp
     23      use fyhyp_m, only: fyhyp
    2224
    2325      IMPLICIT NONE
     
    266268      WRITE(6,*)'*** Inigeom , Y = Latitude  , der.tg. hyperbolique ***'
    267269 
    268        CALL fxyhyper( clat, grossismy, dzoomy, tauy    ,
    269      ,                clon, grossismx, dzoomx, taux    ,
    270      , rlatu,yprimu,rlatv, yprimv,rlatu1, yprimu1,rlatu2,yprimu2  ,
    271      , rlonu,xprimu,rlonv,xprimv,rlonm025,xprimm025,rlonp025,xprimp025 )
    272 
     270      CALL fyhyp(rlatu, yprimu, rlatv, rlatu2, yprimu2, rlatu1, yprimu1)
     271      CALL fxhyp(xprimm025, rlonv, xprimv, rlonu, xprimu, xprimp025)
    273272 
    274273      ENDIF
  • trunk/LMDZ.COMMON/libf/dyn3dpar/advtrac_p.F90

    r1422 r1441  
    1010  !            M.A Filiberti (04/2002)
    1111  !
    12   USE parallel_lmdz
    13   USE Write_Field_p
    14   USE Bands
     12  USE parallel_lmdz, ONLY: ij_begin,ij_end,OMP_CHUNK,pole_nord,pole_sud,&
     13                           setdistrib
     14  USE Write_Field_p, ONLY: WriteField_p
     15  USE Bands, ONLY: jj_Nb_Caldyn,jj_Nb_vanleer
    1516  USE mod_hallo
    1617  USE Vampir
  • trunk/LMDZ.COMMON/libf/dyn3dpar/conf_gcm.F90

    r1422 r1441  
    3939!     -metres  du zoom  avec  celles lues sur le fichier start .
    4040!
    41   LOGICAL etatinit
    42   INTEGER tapedef
     41  LOGICAL,INTENT(IN) :: etatinit
     42  INTEGER,INTENT(IN) :: tapedef
    4343
    4444!   Declarations :
     
    4848  include "comdissnew.h"
    4949  include "iniprint.h"
    50 
    51 ! FH 2008/05/09 On elimine toutes les clefs physiques dans la dynamique
    52 ! #include "clesphys.h"
    5350!
    5451!
     
    905902     !Config  Help = extension en longitude  de la zone du zoom 
    906903     !Config         ( fraction de la zone totale)
    907      dzoomx = 0.0
     904     dzoomx = 0.2
    908905     CALL getin('dzoomx',dzoomx)
    909906
     
    913910     !Config  Help = extension en latitude de la zone  du zoom 
    914911     !Config         ( fraction de la zone totale)
    915      dzoomy = 0.0
     912     dzoomy = 0.2
    916913     CALL getin('dzoomy',dzoomy)
    917914
  • trunk/LMDZ.COMMON/libf/dyn3dpar/covcont_p.F

    r1019 r1441  
    11      SUBROUTINE covcont_p (klevel,ucov, vcov, ucont, vcont )
    2       USE parallel_lmdz
     2      USE parallel_lmdz, ONLY: ij_begin,ij_end,OMP_CHUNK,
     3     &                         pole_nord, pole_sud
    34      IMPLICIT NONE
    45
  • trunk/LMDZ.COMMON/libf/dyn3dpar/mod_hallo.F90

    r1019 r1441  
    11module mod_Hallo
    2 USE parallel_lmdz
     2USE mod_const_mpi, ONLY: COMM_LMDZ,MPI_REAL_LMDZ
     3USE parallel_lmdz, ONLY: using_mpi, mpi_size, mpi_rank, omp_chunk, omp_rank, &
     4                         pole_nord, pole_sud, jj_begin, jj_end, &
     5                         jj_begin_para, jj_end_para
    36implicit none
    47  logical,save :: use_mpi_alloc
  • trunk/LMDZ.COMMON/libf/dyn3dpar/parallel_lmdz.F90

    r1302 r1441  
    11!
    2 ! $Id: parallel.F90 1575 2011-09-21 13:57:48Z jghattas $
     2! $Id: parallel.F90 1810 2013-07-24 08:06:39Z emillour $
    33!
    4   module parallel_lmdz
     4  MODULE parallel_lmdz
    55  USE mod_const_mpi
    66#ifdef CPP_IOIPSL
     
    3131    integer, save :: omp_size 
    3232!$OMP THREADPRIVATE(omp_rank)
     33
     34! Ehouarn: add "dummy variables" (which are in dyn3d_mem/parallel_lmdz.F90)
     35! so that calfis_loc compiles even if using dyn3dpar
     36    integer,save  :: jjb_u
     37    integer,save  :: jje_u
     38    integer,save  :: jjnb_u
     39    integer,save  :: jjb_v
     40    integer,save  :: jje_v
     41    integer,save  :: jjnb_v   
     42
     43    integer,save  :: ijb_u
     44    integer,save  :: ije_u
     45    integer,save  :: ijnb_u   
     46   
     47    integer,save  :: ijb_v
     48    integer,save  :: ije_v
     49    integer,save  :: ijnb_v   
    3350
    3451 contains
     
    167184!Config  Desc = taille des blocs openmp
    168185!Config  Def  = 1
    169 !Config  Help = defini la taille des packets d'it�ration openmp
     186!Config  Help = defini la taille des packets d'itration openmp
    170187!Config         distribue a chaque tache lors de l'entree dans une
    171188!Config         boucle parallelisee
     
    624641!      NewField(ij_be       
    625642
    626   end module parallel_lmdz
     643  end MODULE parallel_lmdz
  • trunk/LMDZ.COMMON/libf/grid/dimension/makdim

    r492 r1441  
    99 echo "  $0 [im] [jm] lm"
    1010 echo " where im, jm and lm are the dimensions"
    11  exit
     11 exit 1
     12fi
     13
     14if (($1 % 8 != 0)) && (( $# == 3 ))
     15then
     16    echo "The number of longitudes must be a multiple of 8."
     17    echo "See the files dyn3d/groupe.F and dyn3dpar/groupe_p.F."
     18    exit 1
    1219fi
    1320
  • trunk/LMDZ.COMMON/libf/misc/coefpoly_m.F90

    r1440 r1441  
    1 !
    2 ! $Header$
    3 !
    4       SUBROUTINE coefpoly ( Xf1, Xf2, Xprim1, Xprim2, xtild1,xtild2 ,
    5      ,                                          a0,a1,a2,a3         )
    6       IMPLICIT NONE
    7 c
    8 c   ...  Auteur :   P. Le Van  ...
    9 c
    10 c
    11 c    Calcul des coefficients a0, a1, a2, a3 du polynome de degre 3 qui
    12 c      satisfait aux 4 equations  suivantes :
     1module coefpoly_m
    132
    14 c    a0 + a1*xtild1 + a2*xtild1*xtild1 + a3*xtild1*xtild1*xtild1 = Xf1
    15 c    a0 + a1*xtild2 + a2*xtild2*xtild2 + a3*xtild2*xtild2*xtild2 = Xf2
    16 c               a1  +     2.*a2*xtild1 +     3.*a3*xtild1*xtild1 = Xprim1
    17 c               a1  +     2.*a2*xtild2 +     3.*a3*xtild2*xtild2 = Xprim2
     3  IMPLICIT NONE
    184
    19 c  On en revient a resoudre un systeme de 4 equat.a 4 inconnues a0,a1,a2,a3
     5contains
    206
    21       REAL(KIND=8) Xf1, Xf2,Xprim1,Xprim2, xtild1,xtild2, xi
    22       REAL(KIND=8) Xfout, Xprim
    23       REAL(KIND=8) a1,a2,a3,a0, xtil1car, xtil2car,derr,x1x2car
     7  SUBROUTINE coefpoly(xf1, xf2, xprim1, xprim2, xtild1, xtild2, a0, a1, a2, a3)
    248
    25       xtil1car = xtild1 * xtild1
    26       xtil2car = xtild2 * xtild2
     9    ! From LMDZ4/libf/dyn3d/coefpoly.F, version 1.1.1.1 2004/05/19 12:53:05
    2710
    28       derr= 2. *(Xf2-Xf1)/( xtild1-xtild2)
     11    ! Author: P. Le Van
    2912
    30       x1x2car = ( xtild1-xtild2)*(xtild1-xtild2)
     13    ! Calcul des coefficients a0, a1, a2, a3 du polynôme de degré 3 qui
     14    ! satisfait aux 4 équations suivantes :
    3115
    32       a3 = (derr + Xprim1+Xprim2 )/x1x2car
    33       a2     = ( Xprim1 - Xprim2 + 3.* a3 * ( xtil2car-xtil1car ) )    /
    34      /           (  2.* ( xtild1 - xtild2 )  )
     16    ! a0 + a1 * xtild1 + a2 * xtild1**2 + a3 * xtild1**3 = Xf1
     17    ! a0 + a1 * xtild2 + a2 * xtild2**2 + a3 * xtild2**3 = Xf2
     18    ! a1 + 2. * a2 * xtild1 + 3. * a3 * xtild1**2 = Xprim1
     19    ! a1 + 2. * a2 * xtild2 + 3. * a3 * xtild2**2 = Xprim2
    3520
    36       a1     = Xprim1 -3.* a3 * xtil1car     -2.* a2 * xtild1
    37       a0     =  Xf1 - a3 * xtild1* xtil1car -a2 * xtil1car - a1 *xtild1
     21    ! (passe par les points (Xf(it), xtild(it)) et (Xf(it + 1),
     22    ! xtild(it + 1))
    3823
    39       RETURN
    40       END
     24    ! On en revient à resoudre un système de 4 équations à 4 inconnues
     25    ! a0, a1, a2, a3.
     26
     27    use nrtype, only: k8
     28
     29    REAL(K8), intent(in):: xf1, xf2, xprim1, xprim2, xtild1, xtild2
     30    REAL(K8), intent(out):: a0, a1, a2, a3
     31
     32    ! Local:
     33    REAL(K8) xtil1car, xtil2car, derr, x1x2car
     34
     35    !------------------------------------------------------------
     36
     37    xtil1car = xtild1 * xtild1
     38    xtil2car = xtild2 * xtild2
     39
     40    derr = 2. * (xf2-xf1)/(xtild1-xtild2)
     41
     42    x1x2car = (xtild1-xtild2) * (xtild1-xtild2)
     43
     44    a3 = (derr+xprim1+xprim2)/x1x2car
     45    a2 = (xprim1-xprim2+3. * a3 * (xtil2car-xtil1car))/(2. * (xtild1-xtild2))
     46
     47    a1 = xprim1 - 3. * a3 * xtil1car - 2. * a2 * xtild1
     48    a0 = xf1 - a3 * xtild1 * xtil1car - a2 * xtil1car - a1 * xtild1
     49
     50  END SUBROUTINE coefpoly
     51
     52end module coefpoly_m
  • trunk/LMDZ.COMMON/libf/misc/wxios.F90

    r1302 r1441  
    9393    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    9494    ! Routine d'initialisation      !!!!!!!!!!!!!
    95     !     A lancer juste après mpi_init !!!!!!!!!!!!!
     95    !     A lancer juste après mpi_init !!!!!!!!!!!!!
    9696    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    9797
     
    145145        !Initialisation du contexte:
    146146        CALL xios_context_initialize(g_ctx_name, g_comm)
    147         CALL xios_get_handle(g_ctx_name, xios_ctx)    !Récupération
     147        CALL xios_get_handle(g_ctx_name, xios_ctx)    !Récupération
    148148        CALL xios_set_current_context(xios_ctx)            !Activation
    149149        g_ctx = xios_ctx
     
    153153          WRITE(lunout,*) "     now call xios_solve_inheritance()"
    154154        ENDIF
    155         !Une première analyse des héritages:
     155        !Une première analyse des héritages:
    156156        CALL xios_solve_inheritance()
    157157    END SUBROUTINE wxios_context_init
    158158
    159159    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    160     ! Routine de paramétrisation !!!!!!!!!!!!!!!!!!
    161     !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    162 
    163     SUBROUTINE wxios_set_cal(pasdetemps, calendrier, annee, mois, jour, heure)
    164         IMPLICIT NONE
    165         INCLUDE 'iniprint.h'
    166 
    167      !Paramètres:
     160    ! Routine de paramétrisation !!!!!!!!!!!!!!!!!!
     161    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
     162
     163    SUBROUTINE wxios_set_cal(pasdetemps, calendrier, annee, mois, jour, heure, ini_an, ini_mois, ini_jour, ini_heure)
     164        IMPLICIT NONE
     165        INCLUDE 'iniprint.h'
     166
     167     !Paramètres:
    168168     CHARACTER(len=*), INTENT(IN) :: calendrier
    169      INTEGER, INTENT(IN) :: annee, mois, jour
    170      REAL, INTENT(IN) :: pasdetemps, heure
     169     INTEGER, INTENT(IN) :: annee, mois, jour, ini_an, ini_mois, ini_jour
     170     REAL, INTENT(IN) :: pasdetemps, heure, ini_heure
    171171     
    172172     !Variables:
     
    181181        mdtime = xios_time(0, 0, 0, 0, 0, pasdetemps)
    182182
    183         !Réglage du calendrier:
     183        !Réglage du calendrier:
    184184        SELECT CASE (calendrier)
    185185            CASE('earth_360d')
     
    197197        END SELECT
    198198       
    199         !Formatage de la date de départ:
    200         WRITE(date, "(i4.4,'-',i2.2,'-',i2.2,' 00:00:00')") annee, mois, jour
    201        
    202         IF (prt_level >= 10) WRITE(lunout,*) "wxios_set_cal: Initial time: ", date
    203        
    204         CALL xios_set_context_attr_hdl(g_ctx, start_date= date)
     199        !Formatage de la date d'origine:
     200        WRITE(date, "(i4.4,'-',i2.2,'-',i2.2,' ',i2.2,':00:00')") annee, mois, jour, int(heure)
     201       
     202        IF (prt_level >= 10) WRITE(lunout,*) "wxios_set_cal: Time origin: ", date
     203       
     204        CALL xios_set_context_attr_hdl(g_ctx, time_origin = date)
     205
     206        !Formatage de la date de debut:
     207
     208        WRITE(date, "(i4.4,'-',i2.2,'-',i2.2,' ',i2.2,':00:00')") ini_an, ini_mois, ini_jour, int(ini_heure)
     209       
     210        IF (prt_level >= 10) WRITE(lunout,*) "wxios_set_cal: Start date: ", date
     211       
     212        CALL xios_set_context_attr_hdl(g_ctx, start_date = date)
    205213       
    206214        !Et enfin,le pas de temps:
     
    253261        LOGICAL :: boool
    254262       
    255         !Masque pour les problèmes de recouvrement MPI:
     263        !Masque pour les problèmes de recouvrement MPI:
    256264        LOGICAL :: mask(ni,nj)
    257265       
    258         !On récupère le handle:
     266        !On récupère le handle:
    259267        CALL xios_get_domain_handle(dom_id, dom)
    260268       
     
    285293
    286294         CALL xios_is_defined_domain_attr_hdl(dom,ni_glo=boool)
    287         !Vérification:
     295        !Vérification:
    288296        IF (xios_is_valid_domain(dom_id)) THEN
    289297            IF (prt_level >= 10) WRITE(lunout,*) "wxios_domain_param: Domain initialized: ", trim(dom_id), boool
     
    294302   
    295303    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    296     ! Pour déclarer un axe vertical !!!!!!!!!!!!!!!
     304    ! Pour déclarer un axe vertical !!!!!!!!!!!!!!!
    297305    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    298306    SUBROUTINE wxios_add_vaxis(axis_id, axis_size, axis_value)
     
    315323!        axis_id=trim(axisgroup_id)
    316324       
    317         !On récupère le groupe d'axes qui va bien:
     325        !On récupère le groupe d'axes qui va bien:
    318326        !CALL xios_get_axisgroup_handle(axisgroup_id, axgroup)
    319327       
    320         !On ajoute l'axe correspondant à ce fichier:
     328        !On ajoute l'axe correspondant à ce fichier:
    321329        !CALL xios_add_axis(axgroup, ax, TRIM(ADJUSTL(axis_id)))
    322330       
     
    327335        CALL xios_set_axis_attr(trim(axis_id),size=axis_size,value=axis_value)
    328336       
    329         !Vérification:
     337        !Vérification:
    330338        IF (xios_is_valid_axis(TRIM(ADJUSTL(axis_id)))) THEN
    331339            IF (prt_level >= 10) WRITE(lunout,*) "wxios_add_vaxis: Axis created: ", TRIM(ADJUSTL(axis_id))
     
    338346   
    339347    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    340     ! Pour déclarer un fichier  !!!!!!!!!!!!!!!!!!!
     348    ! Pour déclarer un fichier  !!!!!!!!!!!!!!!!!!!
    341349    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    342350    SUBROUTINE wxios_add_file(fname, ffreq, flvl)
     
    352360        CHARACTER(len=100) :: nffreq
    353361       
    354         !On regarde si le fichier n'est pas défini par XML:
     362        !On regarde si le fichier n'est pas défini par XML:
    355363        IF (.NOT.xios_is_valid_file(fname)) THEN
    356             !On créé le noeud:
     364            !On créé le noeud:
    357365            CALL xios_get_filegroup_handle("defile", x_fg)
    358366            CALL xios_add_file(x_fg, x_file, fname)
    359367       
    360             !On reformate la fréquence:
     368            !On reformate la fréquence:
    361369            CALL reformadate(ffreq, nffreq)
    362370       
     
    376384        ELSE
    377385            IF (prt_level >= 10) THEN
    378               WRITE(lunout,*) "wxios_add_file: File ",trim(fname), " défined using XML."
     386              WRITE(lunout,*) "wxios_add_file: File ",trim(fname), " défined using XML."
    379387            ENDIF
    380388            ! Ehouarn: add an enable=.true. on top of xml definitions... why???
     
    384392   
    385393    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    386     ! Pour créer un champ      !!!!!!!!!!!!!!!!!!!!
     394    ! Pour créer un champ      !!!!!!!!!!!!!!!!!!!!
    387395    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    388396    SUBROUTINE wxios_add_field(fieldname, fieldgroup, fieldlongname, fieldunit)
     
    401409        REAL(KIND=8) :: def
    402410       
    403         !La valeur par défaut des champs non définis:
     411        !La valeur par défaut des champs non définis:
    404412        def = nf90_fill_real
    405413       
     
    414422        !IF (prt_level >= 10) WRITE(lunout,*) "wxios_add_field: ",fieldname,fieldgroup, fieldlongname, fieldunit
    415423       
    416         !On rentre ses paramètres:
     424        !On rentre ses paramètres:
    417425        CALL xios_set_field_attr_hdl(field, standard_name=fieldlongname, unit=newunit, default_value=def)
    418426        IF (prt_level >= 10) WRITE(lunout,*) "wxios_add_field: Field ",trim(fieldname), "cree:"
     
    422430   
    423431    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    424     ! Pour déclarer un champ      !!!!!!!!!!!!!!!!!
    425     !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
    426     SUBROUTINE wxios_add_field_to_file(fieldname, fdim, fid, fname, fieldlongname, fieldunit, field_level, op)
     432    ! Pour déclarer un champ      !!!!!!!!!!!!!!!!!
     433    !!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!!
     434    SUBROUTINE wxios_add_field_to_file(fieldname, fdim, fid, fname, fieldlongname, fieldunit, field_level, op, nam_axvert)
    427435        IMPLICIT NONE
    428436        INCLUDE 'iniprint.h'
     
    437445       
    438446        CHARACTER(len=20) :: axis_id ! Ehouarn: dangerous...
     447        CHARACTER(len=20), INTENT(IN), OPTIONAL :: nam_axvert
    439448        CHARACTER(len=100) :: operation
    440449        TYPE(xios_file) :: f
     
    451460          axis_id="plev"
    452461        ENDIF
    453        
    454         !on prépare le nom de l'opération:
     462 
     463        IF (PRESENT(nam_axvert)) THEN
     464           axis_id=nam_axvert
     465           print*,'nam_axvert=',axis_id
     466        ENDIF
     467       
     468        !on prépare le nom de l'opération:
    455469        operation = reformaop(op)
    456470       
     
    463477        ENDIF
    464478       
    465         !On regarde si le champ à déjà été créé ou non:
     479        !On regarde si le champ à déjà été créé ou non:
    466480        IF (xios_is_valid_field(fieldname) .AND. .NOT. g_field_name == fieldname) THEN
    467             !Si ce champ existe via XML (ie, dès le premier passage, ie g_field_name != fieldname) alors rien d'autre à faire
     481            !Si ce champ existe via XML (ie, dès le premier passage, ie g_field_name != fieldname) alors rien d'autre à faire
    468482            IF (prt_level >= 10) WRITE(lunout,*) "wxios_add_field_to_file: Field ", trim(fieldname), "exists via XML"
    469483            g_flag_xml = .TRUE.
     
    471485
    472486        ELSE IF (.NOT. g_field_name == fieldname) THEN
    473             !Si premier pssage et champ indéfini, alors on le créé
     487            !Si premier pssage et champ indéfini, alors on le créé
    474488
    475489            IF (prt_level >= 10) WRITE(lunout,*) "wxios_add_field_to_file: Field ", trim(fieldname), "does not exist"
    476490           
    477             !On le créé:
     491            !On le créé:
    478492            CALL wxios_add_field(fieldname,  fieldgroup, fieldlongname, fieldunit)
    479493            IF (xios_is_valid_field(fieldname)) THEN
     
    487501
    488502        IF (.NOT. g_flag_xml) THEN
    489             !Champ existe déjà, mais pas XML, alors on l'ajoute
     503            !Champ existe déjà, mais pas XML, alors on l'ajoute
    490504            !On ajoute le champ:
    491505            CALL xios_get_file_handle(fname, f)
     
    497511
    498512           
    499             !On rentre ses paramètres:
     513            !On rentre ses paramètres:
    500514            CALL xios_set_field_attr_hdl(field, level=field_level, enabled=.TRUE.)
    501515           
     
    550564    SUBROUTINE wxios_closedef()
    551565        CALL xios_close_context_definition()
    552         CALL xios_update_calendar(0)
     566!        CALL xios_update_calendar(0)
    553567    END SUBROUTINE wxios_closedef
    554568   
     
    559573END MODULE wxios
    560574#endif
    561 
  • trunk/LMDZ.COMMON/makelmdz_fcm

    r1403 r1441  
    445445cd $LIBFGCM/grid/dimension
    446446./makdim $dim
     447if (($? != 0))
     448then
     449    exit 1
     450fi
     451
    447452cat $LIBFGCM/grid/dimensions.h
    448453cd $LMDGCM
Note: See TracChangeset for help on using the changeset viewer.