New URL for NEMO forge!   http://forge.nemo-ocean.eu

Since March 2022 along with NEMO 4.2 release, the code development moved to a self-hosted GitLab.
This present forge is now archived and remained online for history.
domcfg.f90 in utils/tools/DOMAINcfg/src – NEMO

source: utils/tools/DOMAINcfg/src/domcfg.f90

Last change on this file was 14623, checked in by ldebreu, 3 years ago

AGFdomcfg: 1) Update DOMAINcfg to be compliant with the removal of halo cells 2) Update most of the LBC ... subroutines to a recent NEMO 4 version #2638

File size: 2.8 KB
Line 
1MODULE domcfg
2   !!==============================================================================
3   !!                       ***  MODULE domcfg   ***
4   !! Ocean initialization : domain configuration initialization
5   !!==============================================================================
6   !! History :  1.0  ! 2003-09  (G. Madec)  Original code
7   !!            3.2  ! 2009-07  (R. Benshila) Suppression of rigid-lid option
8   !!----------------------------------------------------------------------
9
10   !!----------------------------------------------------------------------
11   !!   dom_cfg        : initialize the domain configuration
12   !!----------------------------------------------------------------------
13   USE dom_oce         ! ocean space and time domain
14   USE phycst          ! physical constants
15   USE in_out_manager  ! I/O manager
16   USE lib_mpp         ! distributed memory computing library
17
18   IMPLICIT NONE
19   PRIVATE
20
21   PUBLIC   dom_cfg    ! called by opa.F90
22
23   !!----------------------------------------------------------------------
24   !! NEMO/OPA 3.2 , LODYC-IPSL  (2009)
25   !! $Id: domcfg.F90 6140 2015-12-21 11:35:23Z timgraham $
26   !! Software governed by the CeCILL licence     (./LICENSE)
27   !!----------------------------------------------------------------------
28CONTAINS
29
30   SUBROUTINE dom_cfg
31      !!----------------------------------------------------------------------
32      !!                  ***  ROUTINE dom_cfg  ***
33      !!                   
34      !! ** Purpose :   set the domain configuration
35      !!
36      !!----------------------------------------------------------------------
37      !
38      IF(lwp) THEN                   ! Control print
39         WRITE(numout,*)
40         WRITE(numout,*) 'dom_cfg : set the ocean configuration'
41         WRITE(numout,*) '~~~~~~~ '
42         WRITE(numout,*) '   ocean model configuration used :   cp_cfg = ', cp_cfg, ' jp_cfg = ', jp_cfg
43         !
44         WRITE(numout,*) '   global domain lateral boundaries'
45         !
46         IF( jperio == 0 )   WRITE(numout,*) '      jperio= 0, closed'
47         IF( jperio == 1 )   WRITE(numout,*) '      jperio= 1, cyclic east-west'
48         IF( jperio == 2 )   WRITE(numout,*) '      jperio= 2, equatorial symmetric'
49         IF( jperio == 3 )   WRITE(numout,*) '      jperio= 3, north fold with T-point pivot'
50         IF( jperio == 4 )   WRITE(numout,*) '      jperio= 4, cyclic east-west and north fold with T-point pivot'
51         IF( jperio == 5 )   WRITE(numout,*) '      jperio= 5, north fold with F-point pivot'
52         IF( jperio == 6 )   WRITE(numout,*) '      jperio= 6, cyclic east-west and north fold with F-point pivot'
53      ENDIF
54      !
55      IF( jperio <  0 .OR. jperio > 6 )   CALL ctl_stop( 'jperio is out of range' )
56      !
57   END SUBROUTINE dom_cfg
58
59   !!======================================================================
60END MODULE domcfg
Note: See TracBrowser for help on using the repository browser.