10#include "scaleFElib.h"
19 use scale_const,
only: &
20 undef8 => const_undef8, &
36 real(rp),
allocatable :: val(:)
37 integer,
allocatable :: colidx(:)
40 integer,
allocatable :: rowptr(:)
46 integer,
private :: storage_format_id
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
57 module procedure sparsemat_matmul1
58 module procedure sparsemat_matmul2
73 private :: sparsemat_matmul_csr_1
74 private :: sparsemat_matmul_csr_2
75 private :: sparsemat_matmul_ell_1
76 private :: sparsemat_matmul_ell_2
86 subroutine sparsemat_init( this, mat, &
91 real(rp),
intent(in) :: mat(:,:)
92 real(rp),
optional,
intent(in) :: eps
93 character(len=*),
optional,
intent(in) :: storage_format
99 integer :: val_counter
100 integer :: rowptr_counter
102 real(dp) :: tmp_val(size(mat)+1)
103 integer :: tmp_colind(size(mat)+1)
104 integer :: tmp_rowptr(0:size(mat,1)+1)
107 character(len=H_MID) :: storage_format_ =
'CSR'
109 integer :: row_nonzero_counter(size(mat,1))
110 integer :: col_size_l
122 if (
present(eps))
then
125 eps_ = const_eps * 500.0_rp
128 if (
present(storage_format))
then
129 storage_format_ = storage_format
132 select case (storage_format_)
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
144 rowptr_counter = rowptr_counter + 1
145 tmp_rowptr(rowptr_counter) = val_counter
151 row_nonzero_counter(i) = 0
153 if ( abs(mat(i,j)) >= eps_ ) &
154 row_nonzero_counter(i) = row_nonzero_counter(i) + 1
157 this%col_size = maxval(row_nonzero_counter(:))
158 val_counter = this%M * this%col_size
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)
174 log_error(
"SparseMat_Init",*)
'Not appropriate names of storage format. Check!', trim(storage_format_)
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)
184 select case (storage_format_)
186 allocate( this%rowPtr(rowptr_counter) )
187 this%rowPtr(:) = tmp_rowptr(1:rowptr_counter)
188 this%rowPtrSize = rowptr_counter
191 if (this%colIdx(l) == -1)
then
192 this%colIdx(l) = this%colIdx(l-1)
211 end subroutine sparsemat_init
213 subroutine sparsemat_final(this)
219 deallocate( this%val )
220 deallocate( this%colIdx )
222 select case( this%storage_format_id )
224 deallocate( this%rowPtr )
228 end subroutine sparsemat_final
230 function sparsemat_getval(A, i, j)
result(v)
232 integer,
intent(in) :: i, j
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
250 if (a%colIdx(n) == j)
then
257 end function sparsemat_getval
259 subroutine sparsemat_replceval(A, i, j, v)
262 integer,
intent(in) :: i, j
263 real(rp),
intent(in) ::v
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
279 if (a%colIdx(n) == j)
then
286 end subroutine sparsemat_replceval
288 subroutine sparsemat_print(A)
292 real(rp) :: row_val(a%n)
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(:)
304 write(*,*)
"colInd:", a%colIdx(:)
307 select case ( a%storage_format_id )
310 do p=1, a%rowPtrSize-1
313 row_val(a%colIdx(j1:j2-1)) = a%val(j1:j2-1)
314 write(*,*) row_val(:)
322 row_val(a%colIdx(j2)) = a%val(j2)
324 write(*,*) row_val(:)
329 end subroutine sparsemat_print
331 function sparsemat_get_storage_format_id( A )
result(id)
337 id = a%storage_format_id
339 end function sparsemat_get_storage_format_id
342 subroutine sparsemat_matmul1(A, b, c)
346 real(RP),
intent(in ) :: b(:)
347 real(RP),
intent(out) :: c(A%M)
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 )
361 end subroutine sparsemat_matmul1
364 subroutine sparsemat_matmul2(A, b, c)
368 real(RP),
intent(in ) :: b(:,:)
369 real(RP),
intent(out) :: c(size(b,1),A%M)
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) )
383 end subroutine sparsemat_matmul2
388 subroutine sparsemat_matmul_csr_1(A, col_Ind, rowPtr, b, c, M, N, buf_size, rowPtr_size)
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)
408 do p=1, rowptr_size-1
412 c(p) = c(p) + a(j) * b(col_ind(j))
418 end subroutine sparsemat_matmul_csr_1
421 subroutine sparsemat_matmul_csr_2(A, col_Ind, rowPtr, b, c, M, N, buf_size, rowPtr_size, NQ)
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)
443 do p=1, rowptr_size-1
446 c(:,p) = c(:,p) + a(j) * b(:,col_ind(j))
452 end subroutine sparsemat_matmul_csr_2
455 subroutine sparsemat_matmul_ell_1(A, col_Ind, b, c, M, N, buf_size, col_size)
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)
476 c(i) = c(i) + a(j_ptr) * b(col_ind(j_ptr))
481 end subroutine sparsemat_matmul_ell_1
484 subroutine sparsemat_matmul_ell_2(A, col_Ind, b, c, M, N, buf_size, col_size, NQ)
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)
506 c(:,i) = c(:,i) + a(j_ptr) * b(:,col_ind(j_ptr))
511 end subroutine sparsemat_matmul_ell_2
module common / sparsemat
integer, parameter, public sparsemat_storage_typeid_csr
integer, parameter, public sparsemat_storage_typeid_ell