FE-Project
Loading...
Searching...
No Matches
scale_model_meshbase_manager.F90
Go to the documentation of this file.
1!-------------------------------------------------------------------------------
10!-------------------------------------------------------------------------------
11#include "scaleFElib.h"
13 !-----------------------------------------------------------------------------
14 !
15 !++ Used modules
16 !
17 use scale_precision
18 use scale_io
19 use scale_prc, only: &
20 prc_abort
21
23 use scale_mesh_base, only: meshbase
27
31
32 use scale_sparsemat, only: sparsemat
33
34 !-----------------------------------------------------------------------------
35 implicit none
36 private
37
38 !-----------------------------------------------------------------------------
39 !
40 !++ Public type & procedures
41 !
42
43 type, abstract, public :: modelmeshbase
44 type(sparsemat), allocatable :: doptrmat(:)
45 type(sparsemat), allocatable :: soptrmat(:)
46 type(sparsemat) :: liftoptrmat
47 class(elementoperationbase3d), pointer :: element3d_operation
48
49 integer :: communicator_num
50 contains
51 procedure :: modelmeshbase_init
52 procedure :: modelmeshbase_final
53 procedure :: get_communicatorid => modelmeshbase_get_communicatorid
54 procedure(modelmeshbase_get_modelmesh), public, deferred :: getmodelmesh
55 end type modelmeshbase
56
57 interface
58 subroutine modelmeshbase_get_modelmesh( this, ptr_mesh )
59 import modelmeshbase
60 import meshbase
61 class(modelmeshbase), target, intent(in) :: this
62 class(meshbase), pointer, intent(out) :: ptr_mesh
63 end subroutine modelmeshbase_get_modelmesh
64 end interface
65
66 type, extends(modelmeshbase), public :: modelmeshbase1d
67 class(meshbase1d), pointer :: ptr_mesh
68 contains
69 procedure, public :: modelmeshbase1d_init
70 procedure, public :: modelmeshbase1d_final
71 procedure, public :: getmodelmesh => modelmeshbase1d_get_modelmesh
72 end type modelmeshbase1d
73
74 type, extends(modelmeshbase), public :: modelmeshbase2d
75 class(meshbase2d), pointer :: ptr_mesh
76 contains
77 procedure, public :: modelmeshbase2d_init
78 procedure, public :: modelmeshbase2d_final
79 procedure, public :: getmodelmesh => modelmeshbase2d_get_modelmesh
80 end type modelmeshbase2d
81
82 type, extends(modelmeshbase), abstract, public :: modelmeshbase3d
83 class(meshbase3d), pointer :: ptr_mesh
84 type(elementoperationgeneral) :: element_operation_general
85 class(elementoperationtensorprod3d), allocatable :: element_operation_tensorprod
86 logical :: initialized_element_operation
87 contains
88 procedure, public :: modelmeshbase3d_init
89 procedure, public :: modelmeshbase3d_final
90 procedure, public :: prepairelementoperation => modelmeshbase3d_prepair_elementoperation
91 procedure, public :: getmodelmesh => modelmeshbase3d_get_modelmesh
92 end type modelmeshbase3d
93
94 !-----------------------------------------------------------------------------
95 !
96 !++ Public parameters & variables
97 !
98
99 !-----------------------------------------------------------------------------
100 !
101 !++ Private procedures & variables
102 !
103 !------------------
104
105contains
106!OCL SERIAL
107 subroutine modelmeshbase_init( this, nDim )
108 implicit none
109 class(modelmeshbase), intent(inout) :: this
110 integer, intent(in) :: nDim
111
112 integer :: d
113 !--------------------------------------------
114
115 this%communicator_num = 0
116 allocate( this%SOptrMat(ndim), this%DOptrMat(ndim) )
117
118 return
119 end subroutine modelmeshbase_init
120
121!OCL SERIAL
122 function modelmeshbase_get_communicatorid( this, max_communicator_num ) result(commid)
123 implicit none
124 class(modelmeshbase), intent(inout) :: this
125 integer, intent(in) :: max_communicator_num
126 integer :: commid
127 !--------------------------------------------
128
129 this%communicator_num = this%communicator_num + 1
130 commid = this%communicator_num
131
132 if ( commid > max_communicator_num ) then
133 log_error('ModelMeshBase_get_communicatorID',*) 'The number of communicator exceeds expectation. Check!'
134 call prc_abort
135 end if
136
137 return
138 end function modelmeshbase_get_communicatorid
139
140!OCL SERIAL
141 subroutine modelmeshbase_final( this )
142 implicit none
143 class(modelmeshbase), intent(inout) :: this
144
145 integer :: d
146 !--------------------------------------------
147
148 do d = 1, size(this%DOptrMat)
149 call this%DOptrMat(d)%Final()
150 call this%SOptrMat(d)%Final()
151 end do
152 deallocate( this%SOptrMat, this%DOptrMat )
153
154 call this%LiftOptrMat%Final()
155
156 return
157 end subroutine modelmeshbase_final
158
159 !* 1D *************************************************************
160
161 subroutine modelmeshbase1d_init( this, mesh )
162 implicit none
163 class(modelmeshbase1d), target, intent(inout) :: this
164 class(meshbase1d), target, intent(in) :: mesh
165 !-----------------------------------------------------
166
167 this%ptr_mesh => mesh
168 call this%ModelMeshBase_Init(1)
169
170 return
171 end subroutine modelmeshbase1d_init
172
173!OCL SERIAL
174 subroutine modelmeshbase1d_final( this )
175 implicit none
176 class(modelmeshbase1d), target, intent(inout) :: this
177
178 integer :: d
179 !-----------------------------------------------------
180
181 nullify( this%ptr_mesh )
182 call this%ModelMeshBase_Final()
183
184 return
185 end subroutine modelmeshbase1d_final
186
187!OCL SERIAL
188 subroutine modelmeshbase1d_get_modelmesh( this, ptr_mesh )
189 implicit none
190 class(modelmeshbase1d), target, intent(in) :: this
191 class(meshbase), pointer, intent(out) :: ptr_mesh
192 !-----------------------------------------------------
193
194 ptr_mesh => this%ptr_mesh
195
196 return
197 end subroutine modelmeshbase1d_get_modelmesh
198
199 !* 2D *************************************************************
200
201!OCL SERIAL
202 subroutine modelmeshbase2d_init( this, mesh )
203 implicit none
204 class(modelmeshbase2d), target, intent(inout) :: this
205 class(meshbase2d), target, intent(in) :: mesh
206 !-----------------------------------------------------
207
208 this%ptr_mesh => mesh
209 call this%ModelMeshBase_Init(2)
210
211 return
212 end subroutine modelmeshbase2d_init
213
214!OCL SERIAL
215 subroutine modelmeshbase2d_final( this )
216 implicit none
217 class(modelmeshbase2d), target, intent(inout) :: this
218 !-----------------------------------------------------
219
220 nullify( this%ptr_mesh )
221 call this%ModelMeshBase_Final()
222
223 return
224 end subroutine modelmeshbase2d_final
225
226!OCL SERIAL
227 subroutine modelmeshbase2d_get_modelmesh( this, ptr_mesh )
228 implicit none
229 class(modelmeshbase2d), target, intent(in) :: this
230 class(meshbase), pointer, intent(out) :: ptr_mesh
231 !-----------------------------------------------------
232
233 ptr_mesh => this%ptr_mesh
234 return
235 end subroutine modelmeshbase2d_get_modelmesh
236
237 !* 3D *************************************************************
238
239!OCL SERIAL
240 subroutine modelmeshbase3d_init( this, mesh )
241 implicit none
242 class(modelmeshbase3d), target, intent(inout) :: this
243 class(meshbase3d), target, intent(in) :: mesh
244 !-----------------------------------------------------
245
246 this%ptr_mesh => mesh
247 call this%ModelMeshBase_Init(3)
248
249 this%initialized_element_operation = .false.
250
251 return
252 end subroutine modelmeshbase3d_init
253
254!OCL SERIAL
255 subroutine modelmeshbase3d_final( this )
256 implicit none
257 class(modelmeshbase3d), target, intent(inout) :: this
258 !-----------------------------------------------------
259
260 if ( this%initialized_element_operation ) then
261 call this%element3D_operation%Final()
262 end if
263
264 nullify( this%ptr_mesh )
265 call this%ModelMeshBase_Final()
266
267 return
268 end subroutine modelmeshbase3d_final
269
270!OCL SERIAL
271 subroutine modelmeshbase3d_prepair_elementoperation( this, element_operation_type, &
272 SpMV_storage_format_ )
273 use scale_prc, only: prc_abort
275 implicit none
276 class(modelmeshbase3d), intent(inout), target :: this
277 character(len=*), intent(in), optional :: element_operation_type
278 character(len=*), intent(in), optional :: SpMV_storage_format_
279
280 character(len=H_SHORT) :: element_operation_type_
281 character(len=H_SHORT) :: SpMV_storage_format
282
283 class(elementbase3d), pointer :: elem3D
284 !-----------------------------------------------------
285
286 if ( present(element_operation_type) ) then
287 element_operation_type_ = element_operation_type
288 else
289 element_operation_type_ = "General"
290 end if
291 spmv_storage_format = "ELL"
292 elem3d => this%ptr_mesh%refElem3D
293 call this%DOptrMat(1)%Init( elem3d%Dx1, storage_format=spmv_storage_format )
294 call this%DOptrMat(2)%Init( elem3d%Dx2, storage_format=spmv_storage_format )
295 call this%DOptrMat(3)%Init( elem3d%Dx3, storage_format=spmv_storage_format )
296
297 call this%SOptrMat(1)%Init( elem3d%Sx1, storage_format=spmv_storage_format )
298 call this%SOptrMat(2)%Init( elem3d%Sx2, storage_format=spmv_storage_format )
299 call this%SOptrMat(3)%Init( elem3d%Sx3, storage_format=spmv_storage_format )
300
301 call this%LiftOptrMat%Init( elem3d%Lift, storage_format=spmv_storage_format )
302
303 select case(element_operation_type_)
304 case ("General")
305 call this%element_operation_general%Init( elem3d, this%DOptrMat(1), this%DOptrMat(2), this%DOptrMat(3), this%LiftOptrMat )
306 this%element3D_operation => this%element_operation_general
307 case ("TensorProd3D")
309 this%element_operation_tensorprod ) ! (out)
310 this%element3D_operation => this%element_operation_tensorprod
311 case default
312 log_info("ModelMeshBase3D_prepair_ElementOperation",*) "The specified element_operation_type is not supported. Check!", trim(element_operation_type_)
313 call prc_abort
314 end select
315
316 this%initialized_element_operation = .true.
317
318 return
319 end subroutine modelmeshbase3d_prepair_elementoperation
320
321!OCL SERIAL
322 subroutine modelmeshbase3d_get_modelmesh( this, ptr_mesh )
323 implicit none
324 class(modelmeshbase3d), target, intent(in) :: this
325 class(meshbase), pointer, intent(out) :: ptr_mesh
326 !-----------------------------------------------------
327
328 ptr_mesh => this%ptr_mesh
329 return
330 end subroutine modelmeshbase3d_get_modelmesh
331
332end module scale_model_meshbase_manager
module FElib / Element / Base
module FElib / Element / Operation / Base
module FElib / Element / Operation with arbitary elements
module FElib / Element / Operation with 3D tensor product elements
subroutine, public elementoperationtensorprod3d_create(elem3d, obj)
module FElib / Mesh / Base 1D
module FElib / Mesh / Base 2D
module FElib / Mesh / Base 3D
module FElib / Mesh / Base
FElib / model framework / mesh manager (base)
module common / sparsemat