source: LMDZ6/branches/Amaury_dev/libf/dyn3dmem/bernoui_loc.f90

Last change on this file was 5159, checked in by abarral, 7 weeks ago

Put dimensions.h and paramet.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
File size: 1.7 KB
Line 
1SUBROUTINE bernoui_loc(ngrid,nlay,pphi,pecin,pbern)
2  USE parallel_lmdz
3  USE lmdz_filtreg_p
4  USE lmdz_dimensions, ONLY: iim, jjm, llm, ndm
5  USE lmdz_paramet
6  IMPLICIT NONE
7
8  !=======================================================================
9
10  !   Auteur:   P. Le Van
11  !   -------
12
13  !   Objet:
14  !   ------
15  ! calcul de la fonction de Bernouilli aux niveaux s  .....
16  ! phi  et  ecin  sont des arguments d'entree pour le s-pg .......
17  !      bern       est un  argument de sortie pour le s-pg  ......
18
19  !    fonction de Bernouilli = bern = filtre de( geopotentiel +
20  !                          energ.cinet.)
21
22  !=======================================================================
23
24  !-----------------------------------------------------------------------
25  !   Decalrations:
26  !   -------------
27  !
28
29
30
31  !   Arguments:
32  !   ----------
33
34  INTEGER :: nlay,ngrid
35  REAL :: pphi(ijb_u:ije_u,nlay),pecin(ijb_u:ije_u,nlay)
36  REAL :: pbern(ijb_u:ije_u,nlay)
37
38  !   Local:
39  !   ------
40
41  INTEGER :: ij,l,ijb,ije,jjb,jje
42
43  !-----------------------------------------------------------------------
44  !   calcul de Bernouilli:
45  !   ---------------------
46
47  ijb=ij_begin
48  ije=ij_end+iip1
49  IF (pole_sud) ije=ij_end
50
51  jjb=jj_begin
52  jje=jj_end+1
53  IF (pole_sud) jje=jj_end
54
55!$OMP DO SCHEDULE(STATIC,OMP_CHUNK)
56  DO l=1,llm
57
58    DO ij = ijb,ije
59      pbern( ij,l ) =  pphi( ij,l ) + pecin( ij,l )
60  END DO
61
62   ENDDO
63!$OMP END DO NOWAIT
64
65  !-----------------------------------------------------------------------
66  !   filtre:
67  !   -------
68  !
69
70
71    CALL filtreg_p( pbern,jjb_u,jje_u,jjb,jje, jjp1, llm, &
72          2,1, .TRUE., 1 )
73
74  !-----------------------------------------------------------------------
75
76
77
78END SUBROUTINE bernoui_loc
Note: See TracBrowser for help on using the repository browser.