84 use mpi_f08,
only : mpi_allreduce, mpi_in_place, mpi_sum
85 use,
intrinsic :: iso_c_binding, only : c_ptr, c_size_t, &
86 c_sizeof, c_null_ptr, c_loc, c_associated
92 real(kind=
rp),
allocatable :: xx(:,:)
93 real(kind=
rp),
allocatable :: bb(:,:)
94 real(kind=
rp),
allocatable :: xbar(:)
95 type(c_ptr),
allocatable :: xx_d(:)
96 type(c_ptr),
allocatable :: bb_d(:)
97 type(c_ptr) :: xbar_d = c_null_ptr
98 type(c_ptr) :: alpha_d = c_null_ptr
99 type(c_ptr) :: xx_d_d = c_null_ptr
100 type(c_ptr) :: bb_d_d = c_null_ptr
102 real(kind=
rp) :: tol = 1e-7_rp
104 real(kind=
rp) :: proj_res
105 integer :: proj_m = 0
106 integer :: activ_step
122 integer,
intent(in) :: n
123 integer,
intent(in) :: L
124 integer,
optional,
intent(in) :: activ_step
126 integer(c_size_t) :: ptr_size
134 if (
present(activ_step))
then
135 this%activ_step = activ_step
144 if (this%L .le. 0)
then
148 allocate(this%xx(n, this%L))
149 allocate(this%bb(n, this%L))
150 allocate(this%xbar(n))
151 allocate(this%xx_d(this%L))
152 allocate(this%bb_d(this%L))
153 call rzero(this%xbar, n)
155 call rzero(this%xx(1, i), n)
156 call rzero(this%bb(1, i), n)
161 call device_alloc(this%alpha_d, int(c_sizeof(dummy)*this%L, c_size_t))
167 this%xx_d(i) = c_null_ptr
168 call device_map(this%xx(:, i), this%xx_d(i), n)
170 this%bb_d(i) = c_null_ptr
171 call device_map(this%bb(:, i), this%bb_d(i), n)
175 ptr_size = c_sizeof(c_null_ptr) * this%L
177 ptr = c_loc(this%xx_d)
181 ptr = c_loc(this%bb_d)
192 if (
allocated(this%xx))
then
195 if (
allocated(this%bb))
then
198 if (
allocated(this%xbar))
then
199 deallocate(this%xbar)
201 if (
allocated(this%xx_d))
then
203 if (c_associated(this%xx_d(i)))
then
207 deallocate(this%xx_d)
209 if (c_associated(this%xx_d_d))
then
212 if (c_associated(this%xbar_d))
then
215 if (c_associated(this%alpha_d))
then
218 if (
allocated(this%bb_d))
then
220 if (c_associated(this%bb_d(i)))
then
224 deallocate(this%bb_d)
226 if (c_associated(this%bb_d_d))
then
235 integer,
intent(inout) :: n
236 real(kind=
rp),
intent(inout),
dimension(n) :: b
237 integer,
intent(in) :: tstep
238 class(
coef_t),
intent(inout) :: coef
240 character(len=*),
optional :: string
242 if (tstep .gt. this%activ_step .and. this%L .gt. 0)
then
243 if (dt_controller%is_variable_dt)
then
245 if (dt_controller%dt_last_change .eq. 0)
then
247 else if (dt_controller%dt_last_change .gt. this%activ_step - 1)
then
250 call this%project_on(b, coef, n)
251 if (
present(string))
then
252 call this%log_info(string, tstep)
256 call this%project_on(b, coef, n)
257 if (
present(string))
then
258 call this%log_info(string, tstep)
268 integer,
intent(inout) :: n
269 class(
ax_t),
intent(inout) :: Ax
270 class(
coef_t),
intent(inout) :: coef
272 type(
gs_t),
intent(inout) :: gs_h
273 real(kind=
rp),
intent(inout),
dimension(n) :: x
274 integer,
intent(in) :: tstep
277 if (tstep .gt. this%activ_step .and. this%L .gt. 0)
then
278 if (.not.(dt_controller%is_variable_dt) .or. &
279 (dt_controller%dt_last_change .gt. this%activ_step - 1))
then
280 call this%project_back(x, ax, coef, bclst, gs_h, n)
288 integer,
intent(inout) :: n
289 class(
coef_t),
intent(inout) :: coef
290 real(kind=
rp),
intent(inout),
dimension(n) :: b
302 integer,
intent(inout) :: n
303 class(
ax_t),
intent(inout) :: Ax
304 class(
coef_t),
intent(inout) :: coef
306 type(
gs_t),
intent(inout) :: gs_h
307 real(kind=
rp),
intent(inout),
dimension(n) :: x
315 if (this%m .gt. 0)
call device_add2(x_d, this%xbar_d, n)
316 if (this%m .eq. this%L)
then
319 this%m = min(this%m+1, this%L)
325 if (this%m .gt. 0)
call add2(x, this%xbar, n)
326 if (this%m .eq. this%L)
then
329 this%m = min(this%m+1, this%L)
332 call copy(this%xx(1, this%m), x, n)
335 call ax%compute(this%bb(1, this%m), x, coef, coef%msh, coef%Xh)
336 call gs_h%gs_op_vector(this%bb(1, this%m), n, gs_op_add)
337 call bclst%apply_scalar(this%bb(1, this%m), n)
347 integer,
intent(inout) :: n
348 class(
coef_t),
intent(inout) :: coef
349 real(kind=
rp),
intent(inout),
dimension(n) :: b
350 integer :: i, j, k, l, ierr
351 real(kind=
rp) :: work(this%L), alpha(this%L), s
353 associate(xbar => this%xbar, xx => this%xx, &
356 if (this%m .le. 0)
return
359 call rzero(alpha, this%m)
360 this%proj_res = sqrt(
glsc3(b, b, coef%mult, n) / coef%volume)
367 s = s + xx(i+l, k) * coef%mult(i+l,1,1,1) * b(i+l)
369 alpha(k) = alpha(k) + s
374 call mpi_allreduce(mpi_in_place, alpha, this%m, &
377 call rzero(work, this%m)
382 xbar(i+l) = alpha(1) * xx(i+l,1)
383 b(i+l) = b(i+l) - alpha(1) * bb(i+l,1)
387 xbar(i+l) = xbar(i+l) + alpha(k) * xx(i+l,k)
388 b(i+l) = b(i+l)- alpha(k) * bb(i+l,k)
395 s = s + xx(i+l,k) * coef%mult(i+l,1,1,1) * b(i+l)
397 work(k) = work(k) + s
401 call mpi_allreduce(work, alpha, this%m, &
408 xbar(i+l) = xbar(i+l) + alpha(k) * xx(i+l,k)
409 b(i+l) = b(i+l) - alpha(k) * bb(i+l,k)
418 integer,
intent(inout) :: n
419 class(coef_t),
intent(inout) :: coef
420 real(kind=rp),
intent(inout),
dimension(n) :: b
421 real(kind=rp) :: alpha(this%L)
424 b_d = device_get_ptr(b)
426 associate(xbar_d => this%xbar_d, xx_d => this%xx_d, xx_d_d => this%xx_d_d, &
427 bb_d => this%bb_d, bb_d_d => this%bb_d_d, alpha_d => this%alpha_d)
429 if (this%m .le. 0)
return
433 this%proj_res = sqrt(device_glsc3(b_d, b_d, coef%mult_d, n)/coef%volume)
435 if (neko_device_mpi .and. (neko_bcknd_opencl .ne. 1))
then
436 call device_proj_on(alpha_d, b_d, xx_d_d, bb_d_d, &
437 coef%mult_d, xbar_d, this%m, n)
439 if (neko_bcknd_opencl .eq. 1)
then
441 alpha(i) = device_glsc3(b_d, xx_d(i), coef%mult_d, n)
444 call device_glsc3_many(alpha, b_d, xx_d_d, coef%mult_d, this%m, n)
445 call device_memcpy(alpha, alpha_d, this%m, &
446 host_to_device, sync = .false.)
448 call device_rzero(xbar_d, n)
449 if (neko_bcknd_opencl .eq. 1)
then
451 call device_add2s2(xbar_d, xx_d(i), alpha(i), n)
453 call cmult(alpha, -1.0_rp, this%m)
455 call device_add2s2_many(xbar_d, xx_d_d, alpha_d, this%m, n)
456 call device_cmult(alpha_d, -1.0_rp, this%m)
459 if (neko_bcknd_opencl .eq. 1)
then
461 call device_add2s2(b_d, bb_d(i), alpha(i), n)
462 alpha(i) = device_glsc3(b_d, xx_d(i), coef%mult_d, n)
465 call device_add2s2_many(b_d, bb_d_d, alpha_d, this%m, n)
466 call device_glsc3_many(alpha, b_d, xx_d_d, coef%mult_d, this%m, n)
467 call device_memcpy(alpha, alpha_d, this%m, &
468 host_to_device, sync = .false.)
471 if (neko_bcknd_opencl .eq. 1)
then
473 call device_add2s2(xbar_d, xx_d(i), alpha(i), n)
474 call cmult(alpha, -1.0_rp, this%m)
475 call device_add2s2(b_d, bb_d(i), alpha(i), n)
478 call device_add2s2_many(xbar_d, xx_d_d, alpha_d, this%m, n)
479 call device_cmult(alpha_d, -1.0_rp, this%m)
480 call device_add2s2_many(b_d, bb_d_d, alpha_d, this%m, n)
490 type(coef_t),
intent(in) :: coef
491 integer,
intent(in) :: n
493 if (neko_bcknd_device .eq. 1)
then
503 integer,
intent(in) :: n
504 type(c_ptr),
dimension(this%L) :: xx_d, bb_d
505 type(c_ptr),
intent(in) :: w_d
506 real(kind=rp) :: nrm, scl
507 real(kind=rp) :: alpha(this%L)
510 associate(m => this%m, xx_d_d => this%xx_d_d, &
511 bb_d_d => this%bb_d_d, alpha_d => this%alpha_d)
515 if (neko_device_mpi .and. (neko_bcknd_opencl .ne. 1))
then
516 call device_project_ortho(alpha_d, bb_d(m), xx_d_d, bb_d_d, &
517 w_d, xx_d(m), this%m, n, nrm)
519 if (neko_bcknd_opencl .eq. 1)
then
521 alpha(i) = device_glsc3(bb_d(m), xx_d(i), w_d,n)
524 call device_glsc3_many(alpha, bb_d(m), xx_d_d, w_d, m, n)
527 call cmult(alpha, -1.0_rp,m)
528 if (neko_bcknd_opencl .eq. 1)
then
530 call device_add2s2(xx_d(m), xx_d(i), alpha(i), n)
531 call device_add2s2(bb_d(m), bb_d(i), alpha(i), n)
533 alpha(i) = device_glsc3(bb_d(m), xx_d(i), w_d, n)
536 call device_memcpy(alpha, alpha_d, this%m, &
537 host_to_device, sync = .false.)
538 call device_add2s2_many(xx_d(m), xx_d_d, alpha_d, m-1, n)
539 call device_add2s2_many(bb_d(m), bb_d_d, alpha_d, m-1, n)
541 call device_glsc3_many(alpha, bb_d(m), xx_d_d, w_d, m, n)
543 call cmult(alpha, -1.0_rp,m)
544 if (neko_bcknd_opencl .eq. 1)
then
546 call device_add2s2(xx_d(m), xx_d(i), alpha(i), n)
547 call device_add2s2(bb_d(m), bb_d(i), alpha(i), n)
548 alpha(i) = device_glsc3(bb_d(m), xx_d(i), w_d, n)
551 call device_memcpy(alpha, alpha_d, m, &
552 host_to_device, sync = .false.)
553 call device_add2s2_many(xx_d(m), xx_d_d, alpha_d, m-1, n)
554 call device_add2s2_many(bb_d(m), bb_d_d, alpha_d, m-1, n)
555 call device_glsc3_many(alpha, bb_d(m), xx_d_d, w_d, m, n)
559 alpha(m) = device_glsc3(xx_d(m), w_d, bb_d(m), n)
560 alpha(m) = sqrt(alpha(m))
562 if (alpha(m) .gt. this%tol*nrm)
then
563 scl = 1.0_rp / alpha(m)
564 call device_cmult(xx_d(m), scl, n)
565 call device_cmult(bb_d(m), scl, n)
569 if (pe_rank .eq. 0)
then
570 call neko_warning(
'New vector not linearly indepependent!')
582 integer,
intent(in) :: n
583 real(kind=rp),
dimension(n, this%L),
intent(inout) :: xx, bb
584 real(kind=rp),
dimension(n),
intent(in) :: w
585 real(kind=rp) :: nrm, scl1, scl2, c, s
586 real(kind=rp) :: alpha(this%L), beta(this%L)
587 integer :: i, j, k, l, h, ierr
589 associate(m => this%m)
596 do i = 1, n, neko_blk_size
597 j = min(neko_blk_size, n-i+1)
602 s = s + xx(i+l,k) * w(i+l) * bb(i+l,m)
603 c = c + bb(i+l,k) * w(i+l) * xx(i+l,m)
605 alpha(k) = alpha(k) + 0.5_rp * (s + c)
609 call mpi_allreduce(mpi_in_place, alpha, this%m, &
610 mpi_real_precision, mpi_sum, neko_comm, ierr)
615 do i = 1, n, neko_blk_size
616 j = min(neko_blk_size, n-i+1)
619 xx(i+l,m) = xx(i+l,m) - alpha(k) * xx(i+l,k)
620 bb(i+l,m) = bb(i+l,m) - alpha(k) * bb(i+l,k)
626 do i = 1, n, neko_blk_size
627 j = min(neko_blk_size, n-i+1)
632 s = s + xx(i+l,k) * w(i+l) * bb(i+l,m)
633 c = c + bb(i+l,k) * w(i+l) * xx(i+l,m)
635 beta(k) = beta(k) + 0.5_rp * (s + c)
639 call mpi_allreduce(mpi_in_place, beta, this%m-1, &
640 mpi_real_precision, mpi_sum, neko_comm, ierr)
644 do i = 1, n, neko_blk_size
645 j = min(neko_blk_size,n-i+1)
648 xx(i+l,m) = xx(i+l,m) - beta(k) * xx(i+l,k)
649 bb(i+l,m) = bb(i+l,m) - beta(k) * bb(i+l,k)
654 s = s + xx(i+l,m) * w(i+l) * bb(i+l,m)
656 alpha(m) = alpha(m) + s
659 alpha(k) = alpha(k) + beta(k)
663 call mpi_allreduce(mpi_in_place, alpha(m), 1, &
664 mpi_real_precision, mpi_sum, neko_comm, ierr)
665 alpha(m) = sqrt(alpha(m))
668 if (alpha(m) .gt. this%tol*nrm)
then
670 scl1 = 1.0_rp / alpha(m)
672 xx(1+i,m) = scl1 * xx(1+i,m)
673 bb(1+i,m) = scl1 * bb(1+i,m)
678 if (pe_rank .eq. 0)
then
679 call neko_warning(
'New vector not linearly indepependent!')
690 character(len=*),
intent(in) :: string
691 integer,
intent(in) :: tstep
692 character(len=LOG_SIZE) :: log_buf
693 character(len=12) :: tstep_str
695 if (this%proj_m .gt. 0)
then
696 write(tstep_str,
'(I12)') tstep
697 write(log_buf,
'(A12,A14,1X,A8,A10,1X,I3,A16,1X,E10.4)') &
698 adjustl(tstep_str),
' | Projection:', string, &
699 ', Vectors:', this%proj_m, &
700 ', Original res.:', this%proj_res
701 call neko_log%message(log_buf)
702 call neko_log%newline()
709 integer,
intent(in) :: n
716 if (neko_bcknd_device .eq. 1)
then
717 call device_rzero(this%xx_d(i), n)
718 call device_rzero(this%xx_d(i), n)
721 this%xx(j,i) = 0.0_rp
722 this%bb(j,i) = 0.0_rp
Return the device pointer for an associated Fortran array.
Map a Fortran array to a device (allocate and associate)
Copy data between host and device (or device and device)
Defines a Matrix-vector product.
type(mpi_datatype), public mpi_real_precision
MPI type for working precision of REAL types.
integer, public pe_rank
MPI rank.
type(mpi_comm), public neko_comm
MPI communicator.
subroutine, public device_add2s2_many(y_d, x_d_d, a_d, j, n, strm)
subroutine, public device_add2s2(a_d, b_d, c1, n, strm)
Vector addition with scalar multiplication (multiplication on first argument)
subroutine, public device_add2(a_d, b_d, n, strm)
Vector addition .
subroutine, public device_rzero(a_d, n, strm)
Zero a real vector.
subroutine, public device_cmult(a_d, c, n, strm)
Multiplication by constant c .
subroutine, public device_glsc3_many(h, w_d, v_d_d, mult_d, j, n, strm)
subroutine, public device_copy(a_d, b_d, n, strm)
Copy a vector .
real(kind=rp) function, public device_glsc3(a_d, b_d, c_d, n, strm)
Weighted inner product .
Interface for device projection.
subroutine, public device_proj_on(alpha_d, b_d, x_d_d, b_d_d, mult_d, xbar_d, j, n)
subroutine, public device_project_ortho(alpha_d, b_d, x_d_d, b_d_d, w_d, xm_d, j, n, nrm)
Device abstraction, common interface for various accelerators.
integer, parameter, public host_to_device
subroutine, public device_free(x_d)
Deallocate memory on the device.
subroutine, public device_alloc(x_d, s)
Allocate memory on the device.
type(log_t), public neko_log
Global log stream.
integer, parameter, public log_size
subroutine, public cmult(a, c, n)
Multiplication by constant c .
real(kind=rp) function, public glsc3(a, b, c, n)
Weighted inner product .
subroutine, public add2(a, b, n)
Vector addition .
subroutine, public copy(a, b, n)
Copy a vector .
subroutine, public rzero(a, n)
Zero a real vector.
integer, parameter neko_blk_size
integer, parameter neko_bcknd_device
integer, parameter neko_bcknd_opencl
logical, parameter neko_device_mpi
integer, parameter, public c_rp
integer, parameter, public rp
Global precision used in computations.
subroutine, public profiler_start_region(name, region_id)
Started a named (name) profiler region.
subroutine, public profiler_end_region(name, region_id)
End the most recently started profiler region.
Project x onto X, the space of old solutions and back again.
subroutine device_project_on(this, b, coef, n)
subroutine projection_free(this)
subroutine bcknd_clear(this, n)
subroutine device_proj_ortho(this, xx_d, bb_d, w_d, n)
subroutine bcknd_project_back(this, x, ax, coef, bclst, gs_h, n)
subroutine cpu_proj_ortho(this, xx, bb, w, n)
subroutine, public proj_ortho(this, coef, n)
subroutine bcknd_project_on(this, b, coef, n)
subroutine projection_init(this, n, l, activ_step)
subroutine cpu_project_on(this, b, coef, n)
subroutine projection_pre_solving(this, b, tstep, coef, n, dt_controller, string)
subroutine projection_post_solving(this, x, ax, coef, bclst, gs_h, n, tstep, dt_controller)
subroutine print_proj_info(this, string, tstep)
Implements type time_step_controller.
subroutine, public neko_warning(warning_msg)
Reports a warning to standard output.
Base type for a matrix-vector product providing .
A list of allocatable `bc_t`. Follows the standard interface of lists.
Coefficients defined on a given (mesh, ) tuple. Arrays use indices (i,j,k,e): element e,...
Provides a tool to set time step dt.