source: LMDZ6/branches/Amaury_dev/libf/dyn3d_common/interpost.f90 @ 5157

Last change on this file since 5157 was 5136, checked in by abarral, 4 months ago

Put comgeom.h, comgeom2.h into modules

  • Property copyright set to
    Name of program: LMDZ
    Creation date: 1984
    Version: LMDZ5
    License: CeCILL version 2
    Holder: Laboratoire de m\'et\'eorologie dynamique, CNRS, UMR 8539
    See the license file in the root directory
  • Property svn:eol-style set to native
  • Property svn:keywords set to Author Date Id Revision
File size: 761 bytes
RevLine 
[524]1! $Header$
[5099]2
[5136]3SUBROUTINE interpost(q, qppm)
4  USE lmdz_comgeom2
[524]5
[5136]6  IMPLICIT NONE
[524]7
[5134]8  INCLUDE "dimensions.h"
9  INCLUDE "paramet.h"
[524]10
[5105]11  ! Arguments
[5136]12  REAL :: q(iip1, jjp1, llm)
13  REAL :: qppm(iim, jjp1, llm)
[5105]14  ! Local
[5136]15  INTEGER :: l, i, j
[524]16
[5105]17  ! RE-INVERSION DES NIVEAUX
18  ! le programme ppm3d travaille avec une 3ème coordonnée inversée par rapport
19  ! de celle du LMDZ: z=1<=>niveau max, z=llm+1<=>surface
20  ! On passe donc des niveaux de Lin à ceux du LMDZ
21
[5136]22  do l = 1, llm
23    do j = 1, jjp1
24      do i = 1, iim
25        q(i, j, l) = qppm(i, j, llm - l + 1)
[5105]26      enddo
[5136]27    enddo
28  enddo
[524]29
[5105]30  ! BOUCLAGE EN LONGITUDE PAS EFFECTUE DANS PPM3D
31
[5136]32  do l = 1, llm
33    do j = 1, jjp1
34      q(iip1, j, l) = q(1, j, l)
35    enddo
36  enddo
[5105]37
[5136]38  return
[5105]39
[5116]40END SUBROUTINE interpost
Note: See TracBrowser for help on using the repository browser.