FE-Project
Loading...
Searching...
No Matches
scale_sparsemat.F90
Go to the documentation of this file.
1!-------------------------------------------------------------------------------
10#include "scaleFElib.h"
12 !-----------------------------------------------------------------------------
13 !
14 !++ used modules
15 !
16 use scale_precision
17 use scale_io
18 use scale_prc
19 use scale_const, only: &
20 undef8 => const_undef8, &
21 const_eps
22
23 !-----------------------------------------------------------------------------
24 implicit none
25 private
26
27 !-----------------------------------------------------------------------------
28 !
29 !++ Public type & procedure
30 !
31
32 type, public :: sparsemat
33 integer :: m
34 integer :: n
35 integer :: nnz
36 real(rp), allocatable :: val(:)
37 integer, allocatable :: colidx(:)
38
39 ! for CSR format
40 integer, allocatable :: rowptr(:)
41 integer :: rowptrsize
42
43 ! for ELL format
44 integer :: col_size
45
46 integer, private :: storage_format_id
47 contains
48 procedure, public :: init => sparsemat_init
49 procedure, public :: final => sparsemat_final
50 procedure, public :: print => sparsemat_print
51 procedure, public :: replaceval => sparsemat_replceval
52 procedure, public :: getval => sparsemat_getval
53 procedure, public :: getstorageformatid => sparsemat_get_storage_format_id
54 end type sparsemat
55
57 module procedure sparsemat_matmul1
58 module procedure sparsemat_matmul2
59 end interface
60 public :: sparsemat_matmul
61
62 !-----------------------------------------------------------------------------
63 !
64 !++ Public parameters & variables
65 !
66 integer, public, parameter :: sparsemat_storage_typeid_csr = 1
67 integer, public, parameter :: sparsemat_storage_typeid_ell = 2
68
69 !-----------------------------------------------------------------------------
70 !
71 !++ Private procedure
72 !
73 private :: sparsemat_matmul_csr_1
74 private :: sparsemat_matmul_csr_2
75 private :: sparsemat_matmul_ell_1
76 private :: sparsemat_matmul_ell_2
77
78 !-----------------------------------------------------------------------------
79 !
80 !++ Private parameters & variables
81 !
82
83 !-----------------------------------------------------------------------------
84
85contains
86 subroutine sparsemat_init( this, mat, &
87 EPS, storage_format )
88 implicit none
89
90 class(sparsemat), intent(inout) :: this
91 real(rp), intent(in) :: mat(:,:)
92 real(rp), optional, intent(in) :: eps
93 character(len=*), optional, intent(in) :: storage_format
94
95 integer :: i
96 integer :: j
97 integer :: l
98
99 integer :: val_counter
100 integer :: rowptr_counter
101
102 real(dp) :: tmp_val(size(mat)+1)
103 integer :: tmp_colind(size(mat)+1)
104 integer :: tmp_rowptr(0:size(mat,1)+1)
105
106 real(rp) :: eps_
107 character(len=H_MID) :: storage_format_ = 'CSR'
108
109 integer :: row_nonzero_counter(size(mat,1))
110 integer :: col_size_l
111
112 !---------------------------------------------------------------------------
113
114 this%M = size(mat,1)
115 this%N = size(mat,2)
116
117 val_counter = 1
118 rowptr_counter = 1
119 tmp_rowptr(1) = 1
120 tmp_val(:) = 0.0_rp
121
122 if (present(eps)) then
123 eps_ = eps
124 else
125 eps_ = const_eps * 500.0_rp ! ~ 1x10^-13
126 end if
127
128 if (present(storage_format)) then
129 storage_format_ = storage_format
130 end if
131
132 select case (storage_format_)
133 case ('CSR')
134 this%storage_format_id = sparsemat_storage_typeid_csr
135
136 do i=1, this%M
137 do j=1, this%N
138 if ( abs(mat(i,j)) > eps_ ) then
139 tmp_val(val_counter) = mat(i,j)
140 tmp_colind(val_counter) = j
141 val_counter = val_counter + 1
142 end if
143 end do
144 rowptr_counter = rowptr_counter + 1
145 tmp_rowptr(rowptr_counter) = val_counter
146 end do
147 case ('ELL')
148 this%storage_format_id = sparsemat_storage_typeid_ell
149
150 do i=1, this%M
151 row_nonzero_counter(i) = 0
152 do j=1, this%N
153 if ( abs(mat(i,j)) >= eps_ ) &
154 row_nonzero_counter(i) = row_nonzero_counter(i) + 1
155 end do
156 end do
157 this%col_size = maxval(row_nonzero_counter(:))
158 val_counter = this%M * this%col_size
159
160 tmp_val(:) = 0.0_rp
161 tmp_colind(:) = -1
162 do i=1, this%M
163 col_size_l = 0
164 do j=1,this%N
165 if ( abs(mat(i,j)) >= eps_ ) then
166 col_size_l = col_size_l + 1
167 l = i+(col_size_l-1)*this%M
168 tmp_val(l) = mat(i,j)
169 tmp_colind(l) = j
170 end if
171 end do
172 end do
173 case default
174 log_error("SparseMat_Init",*) 'Not appropriate names of storage format. Check!', trim(storage_format_)
175 call prc_abort
176 end select
177
178 this%nnz = val_counter
179 allocate( this%val(val_counter) )
180 allocate( this%colIdx(val_counter) )
181 this%val(:) = tmp_val(1:val_counter)
182 this%colIdx(:) = tmp_colind(1:val_counter)
183
184 select case (storage_format_)
185 case ('CSR')
186 allocate( this%rowPtr(rowptr_counter) )
187 this%rowPtr(:) = tmp_rowptr(1:rowptr_counter)
188 this%rowPtrSize = rowptr_counter
189 case('ELL')
190 do l=2, val_counter
191 if (this%colIdx(l) == -1) then
192 this%colIdx(l) = this%colIdx(l-1)
193 end if
194 end do
195 end select
196
197 !write(*,*) "--- Mat ------"
198 !write(*,*) "shape:", shape(mat)
199 !write(*,*) "size:", size(mat)
200 ! do j=1, size(mat,2)
201 ! write(*,*) mat(:,j)
202 ! end do
203 !write(*,*) "--- Compressed Mat ------"
204 !write(*,*) "shape (Mat, colInd, rowPtr):", &
205 ! & shape(this%val), shape(this%colInd), shape(this%rowPtr)
206 ! write(*,*) "val:", this%val(:)
207 ! write(*,*) "colInd:", this%colInd(:)
208 ! write(*,*) "rowPtr:", this%rowPtr(:)
209
210 return
211 end subroutine sparsemat_init
212
213 subroutine sparsemat_final(this)
214 implicit none
215 class(sparsemat), intent(inout) :: this
216
217 !---------------------------------------------------------------------------
218
219 deallocate( this%val )
220 deallocate( this%colIdx )
221
222 select case( this%storage_format_id )
224 deallocate( this%rowPtr )
225 end select
226
227 return
228 end subroutine sparsemat_final
229
230 function sparsemat_getval(A, i, j) result(v)
231 class(sparsemat), intent(in) :: a
232 integer, intent(in) :: i, j
233
234 real(dp) ::v
235 integer :: n
236 integer :: jj
237 !---------------------------------------------------------------------------
238
239 v = undef8
240 select case( a%storage_format_id )
242 do n=a%rowPtr(i),a%rowPtr(i+1)-1
243 if (a%colIdx(n) == j) then
244 v = a%val(n); exit
245 end if
246 end do
248 do jj=1, a%col_size
249 n = i + (jj-1)*a%M
250 if (a%colIdx(n) == j) then
251 v = a%val(n); exit
252 end if
253 end do
254 end select
255
256 return
257 end function sparsemat_getval
258
259 subroutine sparsemat_replceval(A, i, j, v)
260
261 class(sparsemat), intent(inout) :: a
262 integer, intent(in) :: i, j
263 real(rp), intent(in) ::v
264
265 integer :: n
266 integer :: jj
267 !---------------------------------------------------------------------------
268
269 select case ( a%storage_format_id )
271 do n=a%rowPtr(i),a%rowPtr(i+1)-1
272 if (a%colIdx(n) == j) then
273 a%val(n) = v; exit
274 end if
275 end do
277 do jj=1, a%col_size
278 n = i + (jj-1)*a%M
279 if (a%colIdx(n) == j) then
280 a%val(n) = v; exit
281 end if
282 end do
283 end select
284
285 return
286 end subroutine sparsemat_replceval
287
288 subroutine sparsemat_print(A)
289 implicit none
290 class(sparsemat), intent(in) :: a
291
292 real(rp) :: row_val(a%n)
293 integer :: p
294 integer :: j1, j2
295 !---------------------------------------------------------------------------
296
297 write(*,*) "-- print matrix:"
298 write(*,'(a,i5,a,i5)') "orginal matrix shape:", a%M, 'x', a%N
299 write(*,'(a,i5)') "size of compressed matrix:", a%nnz
300 select case ( a%storage_format_id )
302 write(*,*) "rowPtr:", a%rowPtr(:)
303 end select
304 write(*,*) "colInd:", a%colIdx(:)
305 write(*,*) "val:"
306
307 select case ( a%storage_format_id )
309 j1 = a%rowPtr(1)
310 do p=1, a%rowPtrSize-1
311 j2 = a%rowPtr(p+1)
312 row_val(:) = 0.0_rp
313 row_val(a%colIdx(j1:j2-1)) = a%val(j1:j2-1)
314 write(*,*) row_val(:)
315 j1 = j2
316 end do
318 do p=1, a%M
319 row_val(:) = 0.0_rp
320 do j1=1, a%col_size
321 j2 = p + (j1-1)*a%M
322 row_val(a%colIdx(j2)) = a%val(j2)
323 end do
324 write(*,*) row_val(:)
325 end do
326 end select
327
328 return
329 end subroutine sparsemat_print
330
331 function sparsemat_get_storage_format_id( A ) result(id)
332 implicit none
333 class(sparsemat), intent(in) :: a
334 real(rp) :: id
335 !------------------------------------------------------
336
337 id = a%storage_format_id
338 return
339 end function sparsemat_get_storage_format_id
340
341!OCL SERIAL
342 subroutine sparsemat_matmul1(A, b, c)
343 implicit none
344
345 type(sparsemat), intent(in) :: A
346 real(RP), intent(in ) :: b(:)
347 real(RP), intent(out) :: c(A%M)
348
349 !---------------------------------------------------------------------------
350
351 select case( a%storage_format_id )
353 call sparsemat_matmul_csr_1( a%val, a%colIdx, a%rowPtr, b, c, &
354 a%M, a%N, a%nnz, a%rowPtrSize )
356 call sparsemat_matmul_ell_1( a%val, a%colIdx, b, c, &
357 a%M, a%N, a%nnz, a%col_size )
358 end select
359
360 return
361 end subroutine sparsemat_matmul1
362
363!OCL SERIAL
364 subroutine sparsemat_matmul2(A, b, c)
365 implicit none
366
367 type(sparsemat), intent(in) :: A
368 real(RP), intent(in ) :: b(:,:)
369 real(RP), intent(out) :: c(size(b,1),A%M)
370
371 !---------------------------------------------------------------------------
372
373 select case( a%storage_format_id )
375 call sparsemat_matmul_csr_2( a%val, a%colIdx, a%rowPtr, b, c, &
376 a%M, a%N, a%nnz, a%rowPtrSize, size(b,1) )
378 call sparsemat_matmul_ell_2( a%val, a%colIdx, b, c, &
379 a%M, a%N, a%nnz, a%col_size, size(b,1) )
380 end select
381
382 return
383 end subroutine sparsemat_matmul2
384
385!--- private ----------------------------------------------
386
387!OCL SERIAL
388 subroutine sparsemat_matmul_csr_1(A, col_Ind, rowPtr, b, c, M, N, buf_size, rowPtr_size)
389 implicit none
390
391 integer, intent(in) :: M
392 integer, intent(in) :: N
393 integer, intent(in) :: buf_size
394 integer, intent(in) :: rowPtr_size
395 real(RP), intent(in) :: A(buf_size)
396 integer, intent(in) :: col_Ind(buf_size)
397 integer, intent(in) :: rowPtr(rowPtr_size)
398 real(RP), intent(in ) :: b(N)
399 real(RP), intent(out) :: c(M)
400
401 integer :: p, j
402 integer :: j1, j2
403
404 !---------------------------------------------------------------------------
405
406 !call mkl_dcsrgemv( 'N', rowPtr_size-1, A, rowPtr, col_Ind, b, c)
407 j1 = rowptr(1)
408 do p=1, rowptr_size-1
409 j2 = rowptr(p+1)
410 c(p) = 0.0_rp
411 do j=j1, j2-1
412 c(p) = c(p) + a(j) * b(col_ind(j))
413 end do
414 j1 = j2
415 end do
416
417 return
418 end subroutine sparsemat_matmul_csr_1
419
420!OCL SERIAL
421 subroutine sparsemat_matmul_csr_2(A, col_Ind, rowPtr, b, c, M, N, buf_size, rowPtr_size, NQ)
422 implicit none
423
424 integer, intent(in) :: M
425 integer, intent(in) :: N
426 integer, intent(in) :: NQ
427 integer, intent(in) :: buf_size
428 integer, intent(in) :: rowPtr_size
429 real(RP), intent(in) :: A(buf_size)
430 integer, intent(in) :: col_Ind(buf_size)
431 integer, intent(in) :: rowPtr(rowPtr_size)
432 real(RP), intent(in ) :: b(NQ,N)
433 real(RP), intent(out) :: c(NQ,M)
434
435 integer :: p, j
436 integer :: j1, j2
437
438 !---------------------------------------------------------------------------
439
440 !call mkl_dcsrgemv( 'N', rowPtr_size-1, A, rowPtr, col_Ind, b, c)
441 j1 = rowptr(1)
442 c(:,:) = 0.0_rp
443 do p=1, rowptr_size-1
444 j2 = rowptr(p+1)
445 do j=j1, j2-1
446 c(:,p) = c(:,p) + a(j) * b(:,col_ind(j))
447 end do
448 j1 = j2
449 end do
450
451 return
452 end subroutine sparsemat_matmul_csr_2
453
454!OCL SERIAL
455 subroutine sparsemat_matmul_ell_1(A, col_Ind, b, c, M, N, buf_size, col_size)
456 implicit none
457
458 integer, intent(in) :: M
459 integer, intent(in) :: N
460 integer, intent(in) :: buf_size
461 integer, intent(in) :: col_size
462 real(RP), intent(in) :: A(buf_size)
463 integer, intent(in) :: col_Ind(buf_size)
464 real(RP), intent(in ) :: b(N)
465 real(RP), intent(out) :: c(M)
466
467 integer :: k, kk, i
468 integer :: j_ptr
469 !---------------------------------------------------------------------------
470
471 c(:) = 0.0_rp
472 do k=1, col_size
473 kk = m * (k-1)
474 do i=1, m
475 j_ptr = kk + i
476 c(i) = c(i) + a(j_ptr) * b(col_ind(j_ptr))
477 end do
478 end do
479
480 return
481 end subroutine sparsemat_matmul_ell_1
482
483!OCL SERIAL
484 subroutine sparsemat_matmul_ell_2(A, col_Ind, b, c, M, N, buf_size, col_size, NQ)
485 implicit none
486
487 integer, intent(in) :: M
488 integer, intent(in) :: N
489 integer, intent(in) :: buf_size
490 integer, intent(in) :: col_size
491 integer, intent(in) :: NQ
492 real(RP), intent(in) :: A(buf_size)
493 integer, intent(in) :: col_Ind(buf_size)
494 real(RP), intent(in ) :: b(NQ,N)
495 real(RP), intent(out) :: c(NQ,M)
496
497 integer :: k, kk, i
498 integer :: j_ptr
499 !---------------------------------------------------------------------------
500
501 c(:,:) = 0.0_rp
502 do k=1, col_size
503 kk = m * (k-1)
504 do i=1, m
505 j_ptr = kk + i
506 c(:,i) = c(:,i) + a(j_ptr) * b(:,col_ind(j_ptr))
507 end do
508 end do
509
510 return
511 end subroutine sparsemat_matmul_ell_2
512
513end module scale_sparsemat
514
module common / sparsemat
integer, parameter, public sparsemat_storage_typeid_csr
integer, parameter, public sparsemat_storage_typeid_ell