My Project
mod_main_wave.f90
Go to the documentation of this file.
1 
2 
3 
4 
5 
6 
7 
8 
9 
10 
11 
12 !==============================================================================|
13 
14 MODULE vars_wave
15 
16  USE all_vars
17  USE mod_obcs
18 
19  IMPLICIT NONE
20  SAVE
21 
23 
24  REAL, ALLOCATABLE :: ac2(:,:,:),compda(:,:)
25 ! REAL, ALLOCATABLE :: ALPHA(:)
26 
27  LOGICAL :: nesting
28 
29  CHARACTER(LEN=80) ugswan_version !!STRING DESCRIBING VERSION
30 
31  INTEGER, ALLOCATABLE :: cross(:,:)
32  INTEGER, ALLOCATABLE :: bgridp(:)
33  REAL , ALLOCATABLE :: bspecs(:,:,:,:)
34  REAL , ALLOCATABLE :: ac1(:,:,:)
35  REAL, ALLOCATABLE :: sice(:,:,:)
36 
37  REAL , ALLOCATABLE :: blknd(:), blkndc(:), ourqt(:)
38  INTEGER :: itw,it0
39 
40  REAL(sp) , ALLOCATABLE :: hsc1(:), dirdeg1(:), tpeak(:), wlen(:),qb1(:)
41  REAL, ALLOCATABLE :: obc_hs(:,:),obc_dir(:,:),obc_tpeak(:,:)
42 
43  REAL , ALLOCATABLE :: pwave_bot(:),ub_swan(:)
44  REAL , ALLOCATABLE :: dwave(:) !Surface wind induced wave direction (radians)
45  REAL(sp), ALLOCATABLE :: dirbot(:)
46  REAL(sp), ALLOCATABLE :: spec_density(:,:)
47 
48  REAL(sp), ALLOCATABLE :: uwwind(:) !SURFACE X-WIND FOR WAVE MODEL
49  REAL(sp), ALLOCATABLE :: vwwind(:) !SURFACE Y-WIND FOR WAVE MODEL
50 
51  TYPE(time) :: wavetime,imdtw
52 
54  CHARACTER(LEN=4) comput
55 
56  REAL(sp), ALLOCATABLE :: hs_wind(:),dirdeg_wind(:),tpeak_wind(:)
57  INTEGER, ALLOCATABLE :: tpeak_wind_pos(:)
58  REAL(sp), ALLOCATABLE :: hs_swell_all(:,:),dirdeg_swell_all(:,:),tpeak_swell_all(:,:)
59  INTEGER, ALLOCATABLE :: tpeak_swell_pos_all(:,:)
60 
61 END MODULE vars_wave
integer inp_wi_ntime
real, dimension(:,:,:,:), allocatable bspecs
character(len=80) ugswan_version
integer inp_wlev_ntime
real(sp), dimension(:), allocatable hsc1
real(sp), dimension(:,:), allocatable hs_swell_all
real, dimension(:,:), allocatable obc_tpeak
real(sp), dimension(:), allocatable vwwind
real(sp), dimension(:), allocatable dirbot
real(sp), dimension(:), allocatable tpeak_wind
real(sp), dimension(:,:), allocatable tpeak_swell_all
real, dimension(:,:,:), allocatable ac2
real(sp), dimension(:,:), allocatable spec_density
real, dimension(:,:,:), allocatable sice
real(sp), dimension(:), allocatable dirdeg1
real, dimension(:), allocatable ub_swan
real, dimension(:), allocatable blkndc
real(sp), dimension(:), allocatable hs_wind
integer it0
real, dimension(:,:,:), allocatable ac1
real(sp), dimension(:), allocatable qb1
type(time) imdtw
real, dimension(:), allocatable blknd
integer, dimension(:,:), allocatable tpeak_swell_pos_all
integer, dimension(:,:), allocatable cross
real, dimension(:), allocatable dwave
type(time) wavetime
real source_dtmax
integer inp_cur_ntime
real, dimension(:,:), allocatable obc_dir
integer inp_fr_ntime
integer, dimension(:), allocatable tpeak_wind_pos
real, dimension(:,:), allocatable obc_hs
real, dimension(:), allocatable ourqt
real, dimension(:), allocatable pwave_bot
real(sp), dimension(:), allocatable dirdeg_wind
integer itw
character(len=4) comput
real source_dtmin
real(sp), dimension(:), allocatable wlen
integer, dimension(:), allocatable bgridp
logical nesting
real(sp), dimension(:), allocatable tpeak
real(sp), dimension(:,:), allocatable dirdeg_swell_all
real, dimension(:,:), allocatable compda
real(sp), dimension(:), allocatable uwwind