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.
solver.F90 in trunk/NEMOGCM/NEMO/OPA_SRC/SOL – NEMO

source: trunk/NEMOGCM/NEMO/OPA_SRC/SOL/solver.F90 @ 2715

Last change on this file since 2715 was 2715, checked in by rblod, 13 years ago

First attempt to put dynamic allocation on the trunk

  • Property svn:keywords set to Id
File size: 6.1 KB
Line 
1MODULE solver
2   !!======================================================================
3   !!                     ***  MODULE  solver  ***
4   !! Ocean solver :  initialization of ocean solver
5   !!=====================================================================
6   !! History :  OPA  ! 1990-10  (G. Madec)  Original code           
7   !!                 ! 1993-02  (O. Marti)                         
8   !!                 ! 1997-02  (G. Madec)  local depth inverse computation
9   !!                 ! 1998-10  (G. Roullet, G. Madec)  free surface
10   !!   NEMO     1.0  ! 2003-07  (G. Madec)  free form, F90
11   !!            3.2  ! 2009-07  (R. Benshila) suppression of rigid-lid & FETI solver
12   !!----------------------------------------------------------------------
13#if defined key_dynspg_flt   ||   defined key_esopa 
14   !!----------------------------------------------------------------------
15   !!   'key_dynspg_flt'                              filtered free surface
16   !!----------------------------------------------------------------------
17   !!   solver_init: solver initialization
18   !!----------------------------------------------------------------------
19   USE oce             ! ocean dynamics and tracers variables
20   USE dom_oce         ! ocean space and time domain variables
21   USE zdf_oce         ! ocean vertical physics variables
22   USE sol_oce         ! solver variables
23   USE dynspg_oce      ! choice/control of key cpp for surface pressure gradient
24   USE solmat          ! matrix of the solver
25   USE obc_oce         ! Lateral open boundary condition
26   USE in_out_manager  ! I/O manager
27   USE lbclnk          ! ocean lateral boundary conditions (or mpp link)
28   USE lib_mpp         ! MPP library
29
30   IMPLICIT NONE
31
32   !!----------------------------------------------------------------------
33   !! NEMO/OPA 3.3 , NEMO Consortium (2010)
34   !! $Id$
35   !! Software governed by the CeCILL licence     (NEMOGCM/NEMO_CeCILL.txt)
36   !!----------------------------------------------------------------------
37CONTAINS
38
39   SUBROUTINE solver_init( kt )
40      !!----------------------------------------------------------------------
41      !!                  ***  ROUTINE solver_init  ***
42      !!                   
43      !! ** Purpose :   Initialization of the elliptic solver
44      !!     
45      !! ** Method  :   a solver is required when using the filtered free
46      !!              surface.
47      !!
48      !! ** Action  : - c_solver_pt : nature of the gridpoint at which the solver is applied
49      !!
50      !! References : Jensen, 1986: Adv. Phys. Oceanogr. Num. Mod.,Ed. O Brien,87-110.
51      !!----------------------------------------------------------------------
52      INTEGER, INTENT(in) :: kt
53      !!
54      NAMELIST/namsol/ nn_solv, nn_sol_arp, nn_nmin, nn_nmax, nn_nmod, rn_eps, rn_resmax, rn_sor
55      !!----------------------------------------------------------------------
56
57      IF(lwp) THEN                  !* open elliptic solver statistics file (only on the printing processors)
58         CALL ctl_opn( numsol, 'solver.stat', 'REPLACE', 'FORMATTED', 'SEQUENTIAL', -1, numout, lwp, narea )
59      ENDIF
60
61      REWIND( numnam )              !* Namelist namsol : elliptic solver / free surface
62      READ  ( numnam, namsol )
63
64      IF(lwp) THEN                  !* Control print
65         WRITE(numout,*)
66         WRITE(numout,*) 'solver_init : solver to compute the surface pressure gradient'
67         WRITE(numout,*) '~~~~~~~~~~~'
68         WRITE(numout,*) '   Namelist namsol : set solver parameters'
69         WRITE(numout,*) '      type of elliptic solver            nn_solv    = ', nn_solv
70         WRITE(numout,*) '      absolute/relative (0/1) precision  nn_sol_arp = ', nn_sol_arp
71         WRITE(numout,*) '      minimum iterations for solver      nn_nmin    = ', nn_nmin
72         WRITE(numout,*) '      maximum iterations for solver      nn_nmax    = ', nn_nmax
73         WRITE(numout,*) '      frequency for test                 nn_nmod    = ', nn_nmod
74         WRITE(numout,*) '      absolute precision of solver       rn_eps     = ', rn_eps
75         WRITE(numout,*) '      absolute precision for SOR solver  rn_resmax  = ', rn_resmax
76         WRITE(numout,*) '      optimal coefficient of sor         rn_sor     = ', rn_sor
77         WRITE(numout,*)
78      ENDIF
79      eps = rn_eps
80
81      !                              ! allocate solver arrays
82      IF( sol_oce_alloc() /= 0 )   CALL ctl_stop( 'STOP', 'solver_init : unable to allocate sol_oce arrays' )
83
84      SELECT CASE( nn_solv )          !* parameter check
85      !
86      CASE ( 1 )                          ! preconditioned conjugate gradient solver
87         IF(lwp) WRITE(numout,*) '   a preconditioned conjugate gradient solver is used'
88         IF( jpr2di /= 0 .AND. jpr2dj /= 0 )   CALL ctl_stop( ' jpr2di and jpr2dj should be equal to zero' )
89         !
90      CASE ( 2 )                          ! successive-over-relaxation solver
91         IF(lwp) WRITE(numout,*) '   a successive-over-relaxation solver with extra outer halo is used'
92         IF(lwp) WRITE(numout,*) '   with jpr2di =', jpr2di, ' and  jpr2dj =', jpr2dj
93         IF( .NOT. lk_mpp .AND. jpr2di /= 0 .AND. jpr2dj /= 0 ) THEN
94             CALL ctl_stop( 'jpr2di and jpr2dj are not equal to zero',   &
95             &              'In this case the algorithm should be used only with the key_mpp_... option' )
96         ELSE
97            IF( ( ( jperio == 1 .OR. jperio == 4 .OR. jperio == 6 ) .OR. ( jpni /= 1 ) ) &
98              &  .AND. ( jpr2di /= jpr2dj ) )   CALL ctl_stop( 'jpr2di should be equal to jpr2dj' )
99         ENDIF
100         !
101      CASE DEFAULT                        ! error in parameter
102         WRITE(ctmp1,*) '          bad flag value for nn_solv = ', nn_solv
103         CALL ctl_stop( ctmp1 )
104      END SELECT
105      !
106
107      !                             !* Grid-point at which the solver is applied
108!!gm  c_solver_pt should be removed: nomore bsf, only T-point is used
109      c_solver_pt = 'T'                   ! always T-point (ssh solver only, not anymore bsf)
110
111      CALL sol_mat( kt )            !* Construction of the elliptic system matrix
112      !
113   END SUBROUTINE solver_init
114#endif
115
116   !!======================================================================
117END MODULE solver
Note: See TracBrowser for help on using the repository browser.