My Project
Functions/Subroutines
genmap_lsf.f90 File Reference

Go to the source code of this file.

Functions/Subroutines

subroutine genmap_lsf
 

Function/Subroutine Documentation

◆ genmap_lsf()

subroutine genmap_lsf ( )

Definition at line 42 of file genmap_lsf.f90.

42 !==============================================================================|
43 ! OBC Node Number
44 ! TS OBC Type
45 ! OBC Node list and types
46 !==============================================================================|
47  USE mod_par
48  USE lims
49  USE control
50  USE all_vars
51  IMPLICIT NONE
52  integer :: SENDER,RECVER, ierr, I, NCNT, NSZE, I1
53 
54  INTEGER, POINTER :: TEMP1(:),TEMP2(:)
55  INTEGER, POINTER :: TEMP3(:),TEMP4(:)
56 
57  REAL(SP), POINTER :: FTMP1(:),FTMP2(:)
58  REAL(SP), POINTER :: FTMP3(:),FTMP4(:)
59 
60 
61  if (dbg_set(dbg_sbr)) &
62  & write(ipt,*) "START: SETUP_LSFMAP"
63 
64  IF(serial) THEN
66 
67  ALLOCATE(ibclsf(nobclsf))
69  DEALLOCATE(ibclsf_gl)
70 
71  ALLOCATE(rbc_geo(nobclsf))
73  DEALLOCATE(rbc_geo_gl)
74 
75  ALLOCATE(rbc_wdf(nobclsf))
77  DEALLOCATE(rbc_wdf_gl)
78 
79  ALLOCATE(ibclsf_output(nobclsf))
81 
82  if (dbg_set(dbg_sbr)) &
83  & write(ipt,*) "END: GENMAP_LSF - serial"
84  return
85  END IF
86 
87 
88  if (dbg_set(dbg_sbr)) &
89  & write(ipt,*) "END: SETUP_LSFMAP - parallel"
90  RETURN
logical serial
Definition: mod_main.f90:100
real(sp), dimension(:), allocatable, target rbc_geo_gl
Definition: mod_main.f90:1075
integer, dimension(:), allocatable, target ibclsf
Definition: mod_main.f90:1080
logical function dbg_set(vrb)
Definition: mod_utils.f90:182
integer, dimension(:), allocatable, target ibclsf_output
Definition: mod_main.f90:1081
real(sp), dimension(:), allocatable, target rbc_wdf_gl
Definition: mod_main.f90:1076
integer nobclsf
Definition: mod_main.f90:58
real(sp), dimension(:), allocatable, target rbc_geo
Definition: mod_main.f90:1083
real(sp), dimension(:), allocatable, target rbc_wdf
Definition: mod_main.f90:1084
integer ipt
Definition: mod_main.f90:922
integer, parameter dbg_sbr
Definition: mod_utils.f90:69
integer nobclsf_gl
Definition: mod_main.f90:52
integer, dimension(:), allocatable, target ibclsf_gl
Definition: mod_main.f90:1074
Here is the caller graph for this function: