source: branches/publications/ORCHIDEE-GMv3.2/ORCHIDEE/src_global/grid_var.f90 @ 6940

Last change on this file since 6940 was 6940, checked in by jinfeng.chang, 4 years ago

add missing files for ORCHIDEE-GMv3.2

File size: 1.9 KB
Line 
1! ===============================================================================================================================
2! MODULE       : grid_var
3!
4! CONTACT      : orchidee-help _at_ listes.ipsl.fr
5!
6! LICENCE      : IPSL (2006)
7! This software is governed by the CeCILL licence see ORCHIDEE/ORCHIDEE_CeCILL.LIC
8!
9!>\BRIEF
10!!
11!! \n DESCRIPTION : This module define variables for the grid module.
12!!                The module is already USE in module grid. Therefor no need to use it seperatly if use grid is already done.
13
14!!
15!! RECENT CHANGE(S): These variables were previously in grid module. They have been moved here to avoid dependency
16!!                   problems when the variables are needed in the parallelization modules.
17!!
18!!
19!! SVN
20!! $HeadURL: svn://forge.ipsl.jussieu.fr/orchidee/branches/ORCHIDEE-MICT/ORCHIDEE/src_global/grid_var.f90 $
21!! $Date: 2017-07-17 12:59:54 +0200 (Mon, 17 Jul 2017) $
22!! $Revision: 4507 $
23!! \n
24!_ ================================================================================================================================
25
26MODULE grid_var
27
28  IMPLICIT NONE
29
30  !=================================================================================
31  !
32  ! Horizontal grid information
33  !
34  !=================================================================================
35
36  CHARACTER(LEN=20), SAVE                           :: GridType    !! Describes the grid it can be RegLonLat, RegXY or UnStruct
37!$OMP THREADPRIVATE(GridType)
38
39  CHARACTER(LEN=20), SAVE                           :: GridName    !! Name of the grid
40!$OMP THREADPRIVATE(GridName)
41
42  INTEGER, SAVE                                     :: NbSegments  !! Number of segments in
43                                                                   !! the polygone defining the grid box
44!$OMP THREADPRIVATE(NbSegments)
45 
46  INTEGER, SAVE                                     :: NbNeighb    !! Number of neighbours
47!$OMP THREADPRIVATE(NbNeighb)
48 
49END MODULE grid_var
Note: See TracBrowser for help on using the repository browser.