My Project
load_grid.f90
Go to the documentation of this file.
1 
2 
3 
4 
5 
6 
7 
8 
9 
10 
11 
12 !/===========================================================================/
13 ! Copyright (c) 2007, The University of Massachusetts Dartmouth
14 ! Produced at the School of Marine Science & Technology
15 ! Marine Ecosystem Dynamics Modeling group
16 ! All rights reserved.
17 !
18 ! FVCOM has been developed by the joint UMASSD-WHOI research team. For
19 ! details of authorship and attribution of credit please see the FVCOM
20 ! technical manual or contact the MEDM group.
21 !
22 !
23 ! This file is part of FVCOM. For details, see http://fvcom.smast.umassd.edu
24 ! The full copyright notice is contained in the file COPYRIGHT located in the
25 ! root directory of the FVCOM code. This original header must be maintained
26 ! in all distributed versions.
27 !
28 ! THIS SOFTWARE IS PROVIDED BY THE COPYRIGHT HOLDERS AND CONTRIBUTORS "AS IS"
29 ! AND ANY EXPRESS OR IMPLIED WARRANTIES, INCLUDING, BUT NOT LIMITED TO,
30 ! THE IMPLIED WARRANTIES OF MERCHANTABILITY AND FITNESS FOR A PARTICULAR
31 ! PURPOSE ARE DISCLAIMED.
32 !
33 !/---------------------------------------------------------------------------/
34 ! CVS VERSION INFORMATION
35 ! $Id$
36 ! $Name$
37 ! $Revision$
38 !/===========================================================================/
39 
40 SUBROUTINE load_grid
41 !===============================================================================!
42 ! GET THE GRID CONNECTIVITY AND OBC NODE LIST FOR DOMAIN
43 ! DECOMPOSITION AND GENMAP
44 !===============================================================================!
45  USE control
46  USE mod_input
47  USE mod_obcs
48  USE all_vars
49  USE mod_nesting
50  IMPLICIT NONE
51  integer i
52 
53 
54  SELECT CASE(startup_type)
55  !=================================================
56  ! HOTSTART
57  CASE("hotstart")
58  !=================================================
59  if(dbg_set(dbg_log)) then
60  WRITE(ipt,*)'! READING GRID FOR HOTSTART !'
61  WRITE(ipt,*)'! !'
62  end if
63 
64  CALL load_restart_grid(nvg) ! SET DIMENSIONS HERE
65 
66  CALL load_restart_obc_grid(iobcn_gl,i_obc_gl, type_obc_gl)
67 
69 
70 
71  !=================================================
72  ! CRASHSTART
73  CASE("crashrestart")
74  !=================================================
75  if(dbg_set(dbg_log)) then
76  WRITE(ipt,*)'! READING GRID FOR CRASHSTART !'
77  WRITE(ipt,*)'! !'
78  end if
79 
80  CALL load_restart_grid(nvg) ! SET DIMENSIONS HERE
81 
82  CALL load_restart_obc_grid(iobcn_gl,i_obc_gl, type_obc_gl)
83 
85 
86  !=================================================
87  ! COLDSTART
88  CASE("coldstart")
89  !=================================================
90  if(dbg_set(dbg_log)) then
91  WRITE(ipt,*)'! READING GRID FOR COLDSTART !'
92  WRITE(ipt,*)'! !'
93  end if
94 
95  ! SET DIMENSIONS HERE
97 
99 
100  CALL load_coldstart_obc_grid(iobcn_gl,i_obc_gl, type_obc_gl)
101 
103 
104  END SELECT
105 
106 
107 END SUBROUTINE load_grid
real(sp), dimension(:), allocatable, target rbc_geo_gl
Definition: mod_main.f90:1075
subroutine load_coldstart_obc_grid(IOBCN_GL, I_OBC_GL, TYPE_OBC_GL)
Definition: mod_input.f90:2392
character(len=80) startup_type
Definition: mod_main.f90:141
subroutine load_restart_obc_grid(IOBCN_GL, I_OBC_GL, TYPE_OBC_GL)
Definition: mod_input.f90:2130
subroutine load_coldstart_grid(NVG)
Definition: mod_input.f90:2373
subroutine load_coldstart_sigma
Definition: mod_input.f90:2558
subroutine load_restart_grid(NVG)
Definition: mod_input.f90:2052
subroutine load_restart_lsf_grid(N_GL, I_GL, GEO_GL, WDF_GL)
Definition: mod_input.f90:2183
integer, dimension(:,:), allocatable nvg
Definition: mod_main.f90:969
real(sp), dimension(:), allocatable, target rbc_wdf_gl
Definition: mod_main.f90:1076
subroutine load_coldstart_lsf(N_GL, I_GL, GEO_GL, WDF_GL)
Definition: mod_input.f90:2417
subroutine load_grid
Definition: load_grid.f90:41
integer ipt
Definition: mod_main.f90:922
integer, dimension(:), allocatable, target ibclsf_gl
Definition: mod_main.f90:1074