35submodule(
mma) mma_device
37 use device_math,
only: device_copy, device_cmult, device_cadd, device_cfill, &
38 device_add2, device_add3s2, device_invcol2, device_col2, device_col3, &
39 device_sub2, device_sub3, device_add2s2, device_cadd2, device_pwmax2, &
40 device_glsum, device_cmult2
41 use device_mma_math,
only: device_maxval, device_norm, device_lcsc2, &
42 device_maxval2, device_maxval3, device_mma_gensub3, &
43 device_mma_gensub4, device_mma_max, device_max2, device_rex, &
44 device_relambda, device_delx, device_add2inv2, device_gg, device_diagx, &
45 device_bb, device_updatebb, device_aa, device_updateaa, device_dx, &
46 device_dy, device_dxsi, device_deta, device_kkt_rex, &
47 device_mma_gensub2, device_mattrans_v_mul, device_mma_dipsolvesub1, &
48 device_mma_ljjxinv, device_hess, device_solve_linear_system, &
49 device_prepare_hessian, device_prepare_aa_matrix
51 use neko_config,
only: neko_bcknd_device, neko_device_mpi
52 use device,
only: device_to_host
53 use comm,
only: neko_comm, pe_rank, mpi_real_precision
54 use mpi_f08,
only: mpi_in_place, mpi_max, mpi_min
55 use profiler,
only: profiler_start_region, profiler_end_region
56 use scratch_registry,
only: neko_scratch_registry
62 module subroutine mma_update_device(this, iter, x, df0dx, fval, dfdx)
70 class(mma_t),
intent(inout) :: this
71 integer,
intent(in) :: iter
72 type(c_ptr),
intent(inout) :: x
73 type(c_ptr),
intent(in) :: df0dx, fval, dfdx
75 if (.not. this%is_initialized)
then
76 call neko_error(
"The MMA object is not initialized.")
79 call profiler_start_region(
"MMA gensub")
81 call mma_gensub_device(this, iter, x, df0dx, fval, dfdx)
82 call profiler_end_region(
"MMA gensub")
85 call profiler_start_region(
"MMA subsolve")
86 if (this%subsolver .eq.
"dip")
then
87 call mma_subsolve_dip_device(this, x)
88 else if (this%subsolver .eq.
"dpip")
then
89 call mma_subsolve_dpip_device(this, x)
91 call neko_error(
"Unrecognized subsolver for MMA in mma_device.")
93 call profiler_end_region(
"MMA subsolve")
95 this%is_updated = .true.
96 end subroutine mma_update_device
98 module subroutine mma_kkt_device(this, x, df0dx, fval, dfdx)
99 class(mma_t),
intent(inout) :: this
100 type(c_ptr),
intent(in) :: x, df0dx, fval, dfdx
102 if (this%subsolver .eq.
"dip")
then
103 call mma_dip_kkt_device(this, x, df0dx, fval, dfdx)
105 call mma_dpip_kkt_device(this, x, df0dx, fval, dfdx)
107 end subroutine mma_kkt_device
111 module subroutine mma_dip_kkt_device(this, x, df0dx, fval, dfdx)
112 class(mma_t),
intent(inout) :: this
113 type(c_ptr),
intent(in) :: x, df0dx, fval, dfdx
115 type(vector_t),
pointer :: relambda, remu
118 call neko_scratch_registry%request(relambda, ind(1), this%m, .false.)
119 call neko_scratch_registry%request(remu, ind(2), this%m, .false.)
122 call device_add3s2(relambda%x_d, fval, this%a%x_d, 1.0_rp, -this%z, &
124 call device_sub2(relambda%x_d, this%y%x_d, this%m)
125 call device_add2(relambda%x_d, this%mu%x_d, this%m)
128 call device_col3(remu%x_d, this%lambda%x_d, this%mu%x_d, this%m)
130 this%residumax = maxval([device_maxval(relambda%x_d, this%m), &
131 device_maxval(remu%x_d, this%m)])
132 this%residunorm = sqrt(device_norm(relambda%x_d, this%m)+ &
133 device_norm(remu%x_d, this%m))
135 call neko_scratch_registry%relinquish(ind)
136 end subroutine mma_dip_kkt_device
140 module subroutine mma_dpip_kkt_device(this, x, df0dx, fval, dfdx)
141 class(mma_t),
intent(inout) :: this
142 type(c_ptr),
intent(in) :: x, df0dx, fval, dfdx
144 real(kind=rp) :: rez, rezeta
145 type(vector_t),
pointer :: rey, relambda, remu, res
146 type(vector_t),
pointer :: rex, rexsi, reeta
147 integer :: ierr, ind(7)
148 real(kind=rp) :: re_sq_norm
150 call neko_scratch_registry%request(rey, ind(1), this%m, .false.)
151 call neko_scratch_registry%request(relambda, ind(2), this%m, .false.)
152 call neko_scratch_registry%request(remu, ind(3), this%m, .false.)
153 call neko_scratch_registry%request(res, ind(4), this%m, .false.)
155 call neko_scratch_registry%request(rex, ind(5), this%n, .false.)
156 call neko_scratch_registry%request(rexsi, ind(6), this%n, .false.)
157 call neko_scratch_registry%request(reeta, ind(7), this%n, .false.)
159 call device_kkt_rex(rex%x_d, df0dx, dfdx, this%xsi%x_d, &
160 this%eta%x_d, this%lambda%x_d, this%n, this%m)
162 call device_col3(rey%x_d, this%d%x_d, this%y%x_d, this%m)
163 call device_add2(rey%x_d, this%c%x_d, this%m)
164 call device_sub2(rey%x_d, this%lambda%x_d, this%m)
165 call device_sub2(rey%x_d, this%mu%x_d, this%m)
167 rez = this%a0 - this%zeta - device_lcsc2(this%lambda%x_d, this%a%x_d, &
170 call device_add3s2(relambda%x_d, fval, this%a%x_d, 1.0_rp, -this%z, &
172 call device_sub2(relambda%x_d, this%y%x_d, this%m)
173 call device_add2(relambda%x_d, this%s%x_d, this%m)
175 call device_sub3(rexsi%x_d, x, this%xmin%x_d, this%n)
176 call device_col2(rexsi%x_d, this%xsi%x_d, this%n)
178 call device_sub3(reeta%x_d, this%xmax%x_d, x, this%n)
179 call device_col2(reeta%x_d, this%eta%x_d, this%n)
181 call device_col3(remu%x_d, this%mu%x_d, this%y%x_d, this%m)
183 rezeta = this%zeta * this%z
185 call device_col3(res%x_d, this%lambda%x_d, this%s%x_d, this%m)
187 this%residumax = maxval([ &
188 device_maxval(rex%x_d, this%n), &
189 device_maxval(rey%x_d, this%m), &
191 device_maxval(relambda%x_d, this%m), &
192 device_maxval(rexsi%x_d, this%n), &
193 device_maxval(reeta%x_d, this%n), &
194 device_maxval(remu%x_d, this%m), &
196 device_maxval(res%x_d, this%m)])
198 re_sq_norm = device_norm(rex%x_d, this%n) + &
199 device_norm(rexsi%x_d, this%n) + &
200 device_norm(reeta%x_d, this%n)
202 call mpi_allreduce(mpi_in_place, this%residumax, 1, &
203 mpi_real_precision, mpi_max, neko_comm, ierr)
205 call mpi_allreduce(mpi_in_place, re_sq_norm, 1, &
206 mpi_real_precision, mpi_sum, neko_comm, ierr)
208 this%residunorm = sqrt(( &
209 device_norm(rey%x_d, this%m) + &
211 device_norm(relambda%x_d, this%m) + &
212 device_norm(remu%x_d, this%m) + &
214 device_norm(res%x_d, this%m) &
217 call neko_scratch_registry%relinquish(ind)
218 end subroutine mma_dpip_kkt_device
224 subroutine mma_gensub_device(this, iter, x, df0dx, fval, dfdx)
230 class(mma_t),
intent(inout) :: this
231 type(c_ptr),
intent(in) :: x
232 type(c_ptr),
intent(in) :: df0dx
233 type(c_ptr),
intent(in) :: fval
234 type(c_ptr),
intent(in) :: dfdx
236 integer,
intent(in) :: iter
239 type(vector_t),
pointer :: x_diff
242 call neko_scratch_registry%request(x_diff, ind, this%n, .false.)
244 call device_sub3(x_diff%x_d, this%xmax%x_d, this%xmin%x_d, this%n)
249 if (iter .lt. 3)
then
250 call device_copy(this%low%x_d, x, this%n)
251 call device_add2s2(this%low%x_d, x_diff%x_d, - this%asyinit, this%n)
252 call device_copy(this%upp%x_d, x, this%n)
253 call device_add2s2(this%upp%x_d, x_diff%x_d, this%asyinit, this%n)
255 call device_mma_gensub2(this%low%x_d, this%upp%x_d, x, &
256 this%xold1%x_d, this%xold2%x_d, x_diff%x_d, &
257 this%asydecr, this%asyincr, this%n)
263 call device_mma_gensub3(x, df0dx, dfdx, this%low%x_d, &
264 this%upp%x_d, this%xmin%x_d, this%xmax%x_d, this%alpha%x_d, &
265 this%beta%x_d, this%p0j%x_d, this%q0j%x_d, this%pij%x_d, &
266 this%qij%x_d, this%n, this%m)
271 call device_mma_gensub4(x, this%low%x_d, this%upp%x_d, this%pij%x_d, &
272 this%qij%x_d, this%n, this%m, this%bi%x_d)
274 if (neko_device_mpi)
then
275 call mpi_allreduce(mpi_in_place, this%bi%x_d, this%m, &
276 mpi_real_precision, mpi_sum, neko_comm, ierr)
278 call device_memcpy(this%bi%x, this%bi%x_d, this%m, device_to_host, &
280 call mpi_allreduce(mpi_in_place, this%bi%x, this%m, &
281 mpi_real_precision, mpi_sum, neko_comm, ierr)
282 call device_memcpy(this%bi%x, this%bi%x_d, this%m, host_to_device, &
285 call device_sub2(this%bi%x_d, fval, this%m)
287 call neko_scratch_registry%relinquish(ind)
288 end subroutine mma_gensub_device
292 subroutine mma_subsolve_dpip_device(this, designx_d)
293 class(mma_t),
intent(inout) :: this
294 type(c_ptr),
intent(in) :: designx_d
295 integer :: iter, itto, ierr
296 real(kind=rp) :: epsi, residual_max, residual_norm, z, zeta, rez, rezeta, &
297 delz, dz, dzeta, steg, zold, zetaold, new_residual
299 type(vector_t) ,
pointer :: y, lambda, s, mu, rey, relambda, remu, res, &
300 dely, dellambda, dy, dlambda, ds, dmu, yold, lambdaold, sold, muold
303 type(vector_t),
pointer :: x, xsi, eta, rex, rexsi, reeta, &
304 delx, diagx, dx, dxsi, deta, xold, xsiold, etaold
306 type(vector_t),
pointer :: bb
307 type(matrix_t),
pointer :: GG
308 type(matrix_t),
pointer :: AA
311 real(kind=rp) :: re_sq_norm
315 real(kind=rp) :: minimal_epsilon
317 call neko_scratch_registry%request(y, ind(1), this%m, .false.)
318 call neko_scratch_registry%request(lambda, ind(2), this%m, .false.)
319 call neko_scratch_registry%request(s, ind(3), this%m, .false.)
320 call neko_scratch_registry%request(mu, ind(4), this%m, .false.)
321 call neko_scratch_registry%request(rey, ind(5), this%m, .false.)
322 call neko_scratch_registry%request(relambda, ind(6), this%m, .false.)
323 call neko_scratch_registry%request(remu, ind(7), this%m, .false.)
324 call neko_scratch_registry%request(res, ind(8), this%m, .false.)
325 call neko_scratch_registry%request(dely, ind(9), this%m, .false.)
326 call neko_scratch_registry%request(dellambda, ind(10), this%m, .false.)
327 call neko_scratch_registry%request(dy, ind(11), this%m, .false.)
328 call neko_scratch_registry%request(dlambda, ind(12), this%m, .false.)
329 call neko_scratch_registry%request(ds, ind(13), this%m, .false.)
330 call neko_scratch_registry%request(dmu, ind(14), this%m, .false.)
331 call neko_scratch_registry%request(yold, ind(15), this%m, .false.)
332 call neko_scratch_registry%request(lambdaold, ind(16), this%m, .false.)
333 call neko_scratch_registry%request(sold, ind(17), this%m, .false.)
334 call neko_scratch_registry%request(muold, ind(18), this%m, .false.)
335 call neko_scratch_registry%request(x, ind(19), this%n, .false.)
336 call neko_scratch_registry%request(xsi, ind(20), this%n, .false.)
337 call neko_scratch_registry%request(eta, ind(21), this%n, .false.)
338 call neko_scratch_registry%request(rex, ind(22), this%n, .false.)
339 call neko_scratch_registry%request(rexsi, ind(23), this%n, .false.)
340 call neko_scratch_registry%request(reeta, ind(24), this%n, .false.)
341 call neko_scratch_registry%request(delx, ind(25), this%n, .false.)
342 call neko_scratch_registry%request(diagx, ind(26), this%n, .false.)
343 call neko_scratch_registry%request(dx, ind(27), this%n, .false.)
344 call neko_scratch_registry%request(dxsi, ind(28), this%n, .false.)
345 call neko_scratch_registry%request(deta, ind(29), this%n, .false.)
346 call neko_scratch_registry%request(xold, ind(30), this%n, .false.)
347 call neko_scratch_registry%request(xsiold, ind(31), this%n, .false.)
348 call neko_scratch_registry%request(etaold, ind(32), this%n, .false.)
349 call neko_scratch_registry%request(bb, ind(33), this%m+1, .false.)
351 call neko_scratch_registry%request(gg, ind(34), this%m, this%n, .false.)
352 call neko_scratch_registry%request(aa, ind(35), this%m+1, this%m+1, .false.)
359 call device_add3s2(x%x_d, this%alpha%x_d, this%beta%x_d, 0.5_rp, 0.5_rp, &
361 call device_cfill(y%x_d, 1.0_rp, this%m)
364 call device_cfill(lambda%x_d, 1.0_rp, this%m)
365 call device_cfill(s%x_d, 1.0_rp, this%m)
366 call device_mma_max(xsi%x_d, x%x_d, this%alpha%x_d, this%n)
367 call device_mma_max(eta%x_d, this%beta%x_d, x%x_d, this%n)
368 call device_max2(mu%x_d, 1.0_rp, this%c%x_d, 0.5_rp, this%m)
373 minimal_epsilon = max(0.9_rp * this%epsimin, 1.0e-12_rp)
374 call mpi_allreduce(mpi_in_place, minimal_epsilon, 1, &
375 mpi_real_precision, mpi_min, neko_comm, ierr)
380 do while (epsi .gt. minimal_epsilon)
387 associate(p0j => this%p0j, q0j => this%q0j, &
388 pij => this%pij, qij => this%qij, &
389 low => this%low, upp => this%upp, &
390 alpha => this%alpha, beta => this%beta, &
391 c => this%c, d => this%d, &
392 a0 => this%a0, a => this%a)
394 call device_rex(rex%x_d, x%x_d, low%x_d, upp%x_d, &
395 pij%x_d, p0j%x_d, qij%x_d, q0j%x_d, &
396 lambda%x_d, xsi%x_d, eta%x_d, this%n, this%m)
398 call device_col3(rey%x_d, d%x_d, y%x_d, this%m)
399 call device_add2(rey%x_d, c%x_d, this%m)
400 call device_sub2(rey%x_d, lambda%x_d, this%m)
401 call device_sub2(rey%x_d, mu%x_d, this%m)
402 rez = a0 - zeta - device_lcsc2(lambda%x_d, a%x_d, this%m)
404 call device_cfill(relambda%x_d, 0.0_rp, this%m)
405 call device_relambda(relambda%x_d, x%x_d, this%upp%x_d, &
406 low%x_d, pij%x_d, qij%x_d, this%n, this%m)
414 if (neko_device_mpi)
then
415 call mpi_allreduce(mpi_in_place, relambda%x_d, this%m, &
416 mpi_real_precision, mpi_sum, neko_comm, ierr)
418 call device_memcpy(relambda%x, relambda%x_d, this%m, device_to_host, &
420 call mpi_allreduce(mpi_in_place, relambda%x, this%m, &
421 mpi_real_precision, mpi_sum, neko_comm, ierr)
422 call device_memcpy(relambda%x, relambda%x_d, this%m, host_to_device, &
426 call device_add2s2(relambda%x_d, this%a%x_d, -z, this%m)
427 call device_sub2(relambda%x_d, y%x_d, this%m)
428 call device_add2(relambda%x_d, s%x_d, this%m)
429 call device_sub2(relambda%x_d, this%bi%x_d, this%m)
431 call device_sub3(rexsi%x_d, x%x_d, this%alpha%x_d, this%n)
432 call device_col2(rexsi%x_d, xsi%x_d, this%n)
433 call device_cadd(rexsi%x_d, - epsi, this%n)
435 call device_sub3(reeta%x_d, this%beta%x_d, x%x_d, this%n)
436 call device_col2(reeta%x_d, eta%x_d, this%n)
437 call device_cadd(reeta%x_d, - epsi, this%n)
439 call device_col3(remu%x_d, mu%x_d, y%x_d, this%m)
440 call device_cadd(remu%x_d, - epsi, this%m)
442 rezeta = zeta * z - epsi
444 call device_col3(res%x_d, lambda%x_d, s%x_d, this%m)
445 call device_cadd(res%x_d, - epsi, this%m)
448 residual_max = maxval([device_maxval(rex%x_d, this%n), &
449 device_maxval(rey%x_d, this%m), abs(rez), &
450 device_maxval(relambda%x_d, this%m), &
451 device_maxval(rexsi%x_d, this%n), &
452 device_maxval(reeta%x_d, this%n), &
453 device_maxval(remu%x_d, this%m), abs(rezeta), &
454 device_maxval(res%x_d, this%m)])
456 re_sq_norm = device_norm(rex%x_d, this%n) + &
457 device_norm(rexsi%x_d, this%n) + device_norm(reeta%x_d, this%n)
459 call mpi_allreduce(mpi_in_place, residual_max, 1, &
460 mpi_real_precision, mpi_max, neko_comm, ierr)
462 call mpi_allreduce(mpi_in_place, re_sq_norm, &
463 1, mpi_real_precision, mpi_sum, neko_comm, ierr)
465 residual_norm = sqrt(device_norm(rey%x_d, this%m) + &
467 device_norm(relambda%x_d, this%m) + &
468 device_norm(remu%x_d, this%m)+ &
470 device_norm(res%x_d, this%m) &
476 do iter = 1, this%max_iter
478 if (residual_max .lt. epsi)
exit
480 call device_delx(delx%x_d, x%x_d, this%low%x_d, this%upp%x_d, &
481 this%pij%x_d, this%qij%x_d, this%p0j%x_d, this%q0j%x_d, &
482 this%alpha%x_d, this%beta%x_d, lambda%x_d, epsi, this%n, &
485 call device_col3(dely%x_d, this%d%x_d, y%x_d, this%m)
486 call device_add2(dely%x_d, this%c%x_d, this%m)
487 call device_sub2(dely%x_d, lambda%x_d, this%m)
488 call device_add2inv2(dely%x_d, y%x_d, - epsi, this%m)
489 delz = this%a0 - device_lcsc2(lambda%x_d, this%a%x_d, this%m) - epsi/z
492 call device_cfill(dellambda%x_d, 0.0_rp, this%m)
493 call device_relambda(dellambda%x_d, x%x_d, this%upp%x_d, &
494 this%low%x_d, this%pij%x_d, this%qij%x_d, this%n, this%m)
496 call device_memcpy(dellambda%x, dellambda%x_d, this%m, &
497 device_to_host, sync = .true.)
498 call mpi_allreduce(mpi_in_place, dellambda%x, this%m, &
499 mpi_real_precision, mpi_sum, neko_comm, ierr)
500 call device_memcpy(dellambda%x, dellambda%x_d, this%m, &
501 host_to_device, sync = .true.)
503 call device_add3s2(dellambda%x_d, dellambda%x_d, this%a%x_d, &
505 call device_sub2(dellambda%x_d, y%x_d, this%m)
506 call device_sub2(dellambda%x_d, this%bi%x_d, this%m)
507 call device_add2inv2(dellambda%x_d, lambda%x_d, epsi, this%m)
509 call device_gg(gg%x_d, x%x_d, this%low%x_d, this%upp%x_d, &
510 this%pij%x_d, this%qij%x_d, this%n, this%m)
512 call device_diagx(diagx%x_d, x%x_d, xsi%x_d, this%low%x_d, &
513 this%upp%x_d, this%p0j%x_d, this%q0j%x_d, this%pij%x_d, &
514 this%qij%x_d, this%alpha%x_d, this%beta%x_d, eta%x_d, &
515 lambda%x_d, this%n, this%m)
525 call device_bb(bb%x_d, gg%x_d, delx%x_d, diagx%x_d, this%n, &
528 call device_memcpy(bb%x, bb%x_d, this%m + 1, device_to_host, &
530 call mpi_allreduce(mpi_in_place, bb%x, this%m + 1, &
531 mpi_real_precision, mpi_sum, neko_comm, ierr)
532 call device_memcpy(bb%x, bb%x_d, this%m + 1, &
533 host_to_device, sync = .true.)
535 call device_updatebb(bb%x_d, dellambda%x_d, dely%x_d, &
536 this%d%x_d, mu%x_d, y%x_d, delz, this%m)
545 call device_cfill(aa%x_d, 0.0_rp, (this%m+1) * (this%m+1))
546 call device_aa(aa%x_d, gg%x_d, diagx%x_d, this%n, this%m)
548 call device_memcpy(aa%x, aa%x_d, (this%m+1) * (this%m+1), &
549 device_to_host, sync = .true.)
550 call mpi_allreduce(mpi_in_place, aa%x, &
551 (this%m + 1)**2, mpi_real_precision, mpi_sum, neko_comm, ierr)
552 call device_memcpy(aa%x, aa%x_d, (this%m+1) * (this%m+1), &
553 host_to_device, sync = .true.)
555 call device_prepare_aa_matrix(aa%x_d, s%x_d, lambda%x_d, &
556 this%d%x_d, mu%x_d, y%x_d, this%a%x_d, zeta, z, this%m)
559 call device_solve_linear_system(aa%x_d, bb%x_d, this%m + 1, info)
560 if (info .ne. 0)
then
561 call neko_error(
"Linear solver failed on the device in " // &
565 call device_copy(dlambda%x_d, bb%x_d, this%m)
569 call device_memcpy(bb%x, bb%x_d, this%m+1, device_to_host, &
571 dz = bb%x(this%m + 1)
575 call device_dx(dx%x_d, delx%x_d, diagx%x_d, gg%x_d, &
576 dlambda%x_d, this%n, this%m)
577 call device_dy(dy%x_d, dely%x_d, dlambda%x_d, this%d%x_d, &
578 mu%x_d, y%x_d, this%m)
579 call device_dxsi(dxsi%x_d, xsi%x_d, dx%x_d, x%x_d, &
580 this%alpha%x_d, epsi, this%n)
581 call device_deta(deta%x_d, eta%x_d, dx%x_d, x%x_d, &
582 this%beta%x_d, epsi, this%n)
584 call device_col3(dmu%x_d, mu%x_d, dy%x_d, this%m)
585 call device_cmult(dmu%x_d, -1.0_rp, this%m)
586 call device_cadd(dmu%x_d, epsi, this%m)
587 call device_invcol2(dmu%x_d, y%x_d, this%m)
588 call device_sub2(dmu%x_d, mu%x_d, this%m)
589 dzeta = -zeta + (epsi - zeta * dz) / z
590 call device_col3(ds%x_d, dlambda%x_d, s%x_d, this%m)
591 call device_cmult(ds%x_d, -1.0_rp, this%m)
592 call device_cadd(ds%x_d, epsi, this%m)
593 call device_invcol2(ds%x_d, lambda%x_d, this%m)
594 call device_sub2(ds%x_d, s%x_d, this%m)
596 steg = maxval([1.0_rp, &
597 device_maxval2(dy%x_d, y%x_d, -1.01_rp, this%m), &
599 device_maxval2(dlambda%x_d, lambda%x_d, -1.01_rp, this%m), &
600 device_maxval2(dxsi%x_d, xsi%x_d, -1.01_rp, this%n), &
601 device_maxval2(deta%x_d, eta%x_d, -1.01_rp, this%n), &
602 device_maxval2(dmu%x_d, mu%x_d, -1.01_rp, this%m), &
603 -1.01_rp * dzeta / zeta, &
604 device_maxval2(ds%x_d, s%x_d, -1.01_rp, this%m), &
605 device_maxval3(dx%x_d, x%x_d, this%alpha%x_d, -1.01_rp, this%n),&
606 device_maxval3(dx%x_d, this%beta%x_d, x%x_d, 1.01_rp, this%n)])
610 call device_copy(xold%x_d, x%x_d, this%n)
611 call device_copy(yold%x_d, y%x_d, this%m)
613 call device_copy(lambdaold%x_d, lambda%x_d, this%m)
614 call device_copy(xsiold%x_d, xsi%x_d, this%n)
615 call device_copy(etaold%x_d, eta%x_d, this%n)
616 call device_copy(muold%x_d, mu%x_d, this%m)
618 call device_copy(sold%x_d, s%x_d, this%m)
620 new_residual = 2.0_rp * residual_norm
623 call mpi_allreduce(mpi_in_place, steg, 1, &
624 mpi_real_precision, mpi_min, neko_comm, ierr)
625 call mpi_allreduce(mpi_in_place, new_residual, 1, &
626 mpi_real_precision, mpi_min, neko_comm, ierr)
631 do while ((new_residual .gt. residual_norm) .and. (itto .lt. 50))
635 call device_add3s2(x%x_d, xold%x_d, dx%x_d, 1.0_rp, steg, this%n)
636 call device_add3s2(y%x_d, yold%x_d, dy%x_d, 1.0_rp, steg, this%m)
638 call device_add3s2(lambda%x_d, lambdaold%x_d, &
639 dlambda%x_d, 1.0_rp, steg, this%m)
640 call device_add3s2(xsi%x_d, xsiold%x_d, dxsi%x_d, &
641 1.0_rp, steg, this%n)
642 call device_add3s2(eta%x_d, etaold%x_d, deta%x_d, &
643 1.0_rp, steg, this%n)
644 call device_add3s2(mu%x_d, muold%x_d, dmu%x_d, &
645 1.0_rp, steg, this%m)
646 zeta = zetaold + steg*dzeta
647 call device_add3s2(s%x_d, sold%x_d, ds%x_d, 1.0_rp, &
652 call device_rex(rex%x_d, x%x_d, this%low%x_d, &
653 this%upp%x_d, this%pij%x_d, this%p0j%x_d, &
654 this%qij%x_d, this%q0j%x_d, lambda%x_d, xsi%x_d, &
655 eta%x_d, this%n, this%m)
657 call device_col3(rey%x_d, this%d%x_d, y%x_d, this%m)
658 call device_add2(rey%x_d, this%c%x_d, this%m)
659 call device_sub2(rey%x_d, lambda%x_d, this%m)
660 call device_sub2(rey%x_d, mu%x_d, this%m)
662 rez = this%a0 - zeta - device_lcsc2(lambda%x_d, this%a%x_d, this%m)
665 call device_cfill(relambda%x_d, 0.0_rp, this%m)
666 call device_relambda(relambda%x_d, x%x_d, this%upp%x_d, &
667 this%low%x_d, this%pij%x_d, this%qij%x_d, &
670 call device_memcpy(relambda%x, relambda%x_d, this%m, &
671 device_to_host, sync = .true.)
672 call mpi_allreduce(mpi_in_place, relambda%x, this%m, &
673 mpi_real_precision, mpi_sum, neko_comm, ierr)
674 call device_memcpy(relambda%x, relambda%x_d, &
675 this%m, host_to_device, sync = .true.)
677 call device_add3s2(relambda%x_d, relambda%x_d, &
678 this%a%x_d, 1.0_rp, -z, this%m)
679 call device_sub2(relambda%x_d, y%x_d, this%m)
680 call device_add2(relambda%x_d, s%x_d, this%m)
681 call device_sub2(relambda%x_d, this%bi%x_d, this%m)
683 call device_sub3(rexsi%x_d, x%x_d, this%alpha%x_d, this%n)
684 call device_col2(rexsi%x_d, xsi%x_d, this%n)
685 call device_cadd(rexsi%x_d, - epsi, this%n)
687 call device_sub3(reeta%x_d, this%beta%x_d, x%x_d, this%n)
688 call device_col2(reeta%x_d, eta%x_d, this%n)
689 call device_cadd(reeta%x_d, - epsi, this%n)
691 call device_col3(remu%x_d, mu%x_d, y%x_d, this%m)
692 call device_cadd(remu%x_d, - epsi, this%m)
694 rezeta = zeta*z - epsi
696 call device_col3(res%x_d, lambda%x_d, s%x_d, this%m)
697 call device_cadd(res%x_d, - epsi, this%m)
700 re_sq_norm = device_norm(rex%x_d, this%n) + &
701 device_norm(rexsi%x_d, this%n) + &
702 device_norm(reeta%x_d, this%n)
703 call mpi_allreduce(mpi_in_place, re_sq_norm, 1, &
704 mpi_real_precision, mpi_sum, neko_comm, ierr)
706 new_residual = sqrt(device_norm(rey%x_d, this%m) + &
708 device_norm(relambda%x_d, this%m) + &
709 device_norm(remu%x_d, this%m) + &
711 device_norm(res%x_d, this%m) + &
720 residual_norm = new_residual
721 residual_max = maxval([ &
722 device_maxval(rex%x_d, this%n), &
723 device_maxval(rey%x_d, this%m), &
725 device_maxval(relambda%x_d, this%m), &
726 device_maxval(rexsi%x_d, this%n), &
727 device_maxval(reeta%x_d, this%n), &
728 device_maxval(remu%x_d, this%m), &
730 device_maxval(res%x_d, this%m)])
732 call mpi_allreduce(mpi_in_place, residual_max, 1, &
733 mpi_real_precision, mpi_max, neko_comm, ierr)
741 call device_copy(this%xold2%x_d, this%xold1%x_d, this%n)
742 call device_copy(this%xold1%x_d, designx_d, this%n)
743 call device_copy(designx_d, x%x_d, this%n)
746 call device_copy(this%y%x_d, y%x_d, this%m)
748 call device_copy(this%lambda%x_d, lambda%x_d, this%m)
750 call device_copy(this%xsi%x_d, xsi%x_d, this%n)
751 call device_copy(this%eta%x_d, eta%x_d, this%n)
752 call device_copy(this%mu%x_d, mu%x_d, this%m)
753 call device_copy(this%s%x_d, s%x_d, this%m)
756 call neko_scratch_registry%relinquish(ind)
757 end subroutine mma_subsolve_dpip_device
761 subroutine mma_subsolve_dip_device(this, designx_d)
762 class(mma_t),
intent(inout) :: this
763 type(c_ptr),
intent(in) :: designx_d
764 integer :: iter, ierr
765 real(kind=rp) :: epsi, residumax, z, steg
767 type(vector_t),
pointer :: y, lambda, mu, relambda, remu, dlambda, dmu, &
768 gradlambda, zerom, dd, dummy_m
770 type(vector_t),
pointer :: x, pjlambda, qjlambda
773 type(vector_t),
pointer :: Ljjxinv
774 type(matrix_t),
pointer :: hijx
775 type(matrix_t),
pointer :: Hess
777 integer :: info, ind(17)
779 real(kind=rp) :: minimal_epsilon
781 call neko_scratch_registry%request(y, ind(1), this%m, .false.)
782 call neko_scratch_registry%request(lambda, ind(2), this%m, .false.)
783 call neko_scratch_registry%request(mu, ind(3), this%m, .false.)
784 call neko_scratch_registry%request(relambda, ind(4), this%m, .false.)
785 call neko_scratch_registry%request(remu, ind(5), this%m, .false.)
786 call neko_scratch_registry%request(dlambda, ind(6), this%m, .false.)
787 call neko_scratch_registry%request(dmu, ind(7), this%m, .false.)
788 call neko_scratch_registry%request(gradlambda, ind(8), this%m, .false.)
789 call neko_scratch_registry%request(zerom, ind(9), this%m, .false.)
790 call neko_scratch_registry%request(dd, ind(10), this%m, .false.)
791 call neko_scratch_registry%request(dummy_m, ind(11), this%m, .false.)
793 call neko_scratch_registry%request(x, ind(12), this%n, .false.)
794 call neko_scratch_registry%request(pjlambda,ind(13), this%n, .false.)
795 call neko_scratch_registry%request(qjlambda, ind(14), this%n, .false.)
797 call neko_scratch_registry%request(ljjxinv, ind(15), this%n, .false.)
799 call neko_scratch_registry%request(hijx, ind(16), this%m, this%n, .false.)
800 call neko_scratch_registry%request(hess, ind(17), this%m, this%m, .false.)
807 call device_cfill(y%x_d, 1.0_rp, this%m)
809 call device_cfill(lambda%x_d, 1.0_rp, this%m)
810 call device_cmult2(dummy_m%x_d, this%c%x_d, 0.5_rp, this%m)
811 call device_pwmax2(lambda%x_d, dummy_m%x_d, this%m)
813 call device_cfill(mu%x_d, 1.0_rp, this%m)
817 call device_cadd2(dd%x_d, this%d%x_d, 1.0e-8_rp, this%m)
822 minimal_epsilon = max(0.9_rp * this%epsimin, 1.0e-12_rp)
823 call mpi_allreduce(mpi_in_place, minimal_epsilon, 1, &
824 mpi_real_precision, mpi_min, neko_comm, ierr)
829 outer:
do while (epsi .gt. minimal_epsilon)
833 associate(p0j => this%p0j, q0j => this%q0j, &
834 pij => this%pij, qij => this%qij, &
835 low => this%low, upp => this%upp, &
836 alpha => this%alpha, beta => this%beta, &
837 c => this%c, a0 => this%a0, a => this%a)
845 call device_sub3(y%x_d, lambda%x_d, c%x_d, this%m)
847 call device_invcol2(y%x_d, dd%x_d, this%m)
848 call device_pwmax2(y%x_d, zerom%x_d, this%m)
854 call device_col3(dummy_m%x_d, lambda%x_d, a%x_d, this%m)
855 z = device_glsum(dummy_m%x_d, this%m)
856 z = merge(0.0_rp, 1.0_rp, a0 - z >= 0.0)
862 call device_mattrans_v_mul(pjlambda%x_d, pij%x_d, lambda%x_d, this%m, this%n)
863 call device_mattrans_v_mul(qjlambda%x_d, qij%x_d, lambda%x_d, this%m, this%n)
864 call device_add2(pjlambda%x_d, p0j%x_d, this%n)
865 call device_add2(qjlambda%x_d, q0j%x_d, this%n)
867 call device_mma_dipsolvesub1(x%x_d, pjlambda%x_d, qjlambda%x_d, &
868 low%x_d, upp%x_d, alpha%x_d, beta%x_d, this%n)
870 call device_cfill(relambda%x_d, 0.0_rp, this%m)
871 call device_relambda(relambda%x_d, x%x_d, this%upp%x_d, &
872 low%x_d, pij%x_d, qij%x_d, this%n, this%m)
876 call device_memcpy(relambda%x, relambda%x_d, this%m, device_to_host, &
878 call mpi_allreduce(mpi_in_place, relambda%x, this%m, &
879 mpi_real_precision, mpi_sum, neko_comm, ierr)
880 call device_memcpy(relambda%x, relambda%x_d, this%m, &
881 host_to_device, sync = .true.)
883 call device_add2s2(relambda%x_d, this%a%x_d, -z, this%m)
884 call device_sub2(relambda%x_d, y%x_d, this%m)
885 call device_add2(relambda%x_d, mu%x_d, this%m)
886 call device_sub2(relambda%x_d, this%bi%x_d, this%m)
888 call device_col3(remu%x_d, mu%x_d, lambda%x_d, this%m)
889 call device_cadd(remu%x_d, -epsi, this%m)
891 residumax = maxval([device_maxval(relambda%x_d, this%m), &
892 device_maxval(remu%x_d, this%m)])
896 do iter = 1, this%max_iter
898 if (residumax .lt. epsi)
exit
906 call device_copy(gradlambda%x_d, relambda%x_d, this%m)
907 call device_sub2(gradlambda%x_d, mu%x_d, this%m)
910 call device_cfill(dummy_m%x_d, epsi, this%m)
911 call device_invcol2(dummy_m%x_d, lambda%x_d, this%m)
912 call device_add2(gradlambda%x_d, dummy_m%x_d, this%m)
913 call device_cmult(gradlambda%x_d, -1.0_rp, this%m)
919 call device_mma_ljjxinv(ljjxinv%x_d, pjlambda%x_d, qjlambda%x_d, &
920 x%x_d, low%x_d, upp%x_d, alpha%x_d, beta%x_d, this%n)
922 call device_gg(hijx%x_d, x%x_d, this%low%x_d, this%upp%x_d, &
923 this%pij%x_d, this%qij%x_d, this%n, this%m)
925 call device_cfill(hess%x_d, 0.0_rp, (this%m) * (this%m) )
926 call device_hess(hess%x_d, hijx%x_d, ljjxinv%x_d, this%n, this%m)
929 call device_memcpy(hess%x, hess%x_d, this%m*this%m, device_to_host, &
931 call mpi_allreduce(mpi_in_place, hess%x, &
932 this%m*this%m, mpi_real_precision, mpi_sum, neko_comm, ierr)
935 call device_memcpy(hess%x, hess%x_d, this%m*this%m, &
936 host_to_device, sync = .true.)
951 call device_prepare_hessian(hess%x_d, y%x_d, this%d%x_d, &
952 mu%x_d, lambda%x_d, this%m)
955 call device_solve_linear_system(hess%x_d, gradlambda%x_d, &
957 if (info .ne. 0)
then
958 call neko_error(
"Linear solver failed on the device in " // &
962 call device_copy(dlambda%x_d, gradlambda%x_d, this%m)
965 call device_copy(dummy_m%x_d, dlambda%x_d, this%m)
966 call device_col2(dummy_m%x_d, mu%x_d, this%m)
967 call device_invcol2(dummy_m%x_d, lambda%x_d, this%m)
969 call device_cfill(dmu%x_d, epsi, this%m)
970 call device_invcol2(dmu%x_d, lambda%x_d, this%m)
971 call device_add2s2(dmu%x_d, dummy_m%x_d, -1.0_rp, this%m)
972 call device_sub2(dmu%x_d, mu%x_d, this%m)
974 steg = maxval([1.005_rp, device_maxval2(dlambda%x_d, lambda%x_d, &
975 -1.01_rp, this%m), device_maxval2(dmu%x_d, mu%x_d, -1.01_rp, &
979 call device_add2s2(lambda%x_d, dlambda%x_d, steg, this%m)
980 call device_add2s2(mu%x_d, dmu%x_d, steg, this%m)
989 call device_sub3(y%x_d, lambda%x_d, c%x_d, this%m)
991 call device_invcol2(y%x_d, dd%x_d, this%m)
992 call device_pwmax2(y%x_d, zerom%x_d, this%m)
998 call device_col3(dummy_m%x_d, lambda%x_d, a%x_d, this%m)
999 z = device_glsum(dummy_m%x_d, this%m)
1000 z = merge(0.0_rp, 1.0_rp, a0 - z >= 0.0)
1006 call device_mattrans_v_mul(pjlambda%x_d, pij%x_d, lambda%x_d, this%m, this%n)
1007 call device_mattrans_v_mul(qjlambda%x_d, qij%x_d, lambda%x_d, this%m, this%n)
1008 call device_add2(pjlambda%x_d, p0j%x_d, this%n)
1009 call device_add2(qjlambda%x_d, q0j%x_d, this%n)
1011 call device_mma_dipsolvesub1(x%x_d, pjlambda%x_d, qjlambda%x_d, &
1012 low%x_d, upp%x_d, alpha%x_d, beta%x_d, this%n)
1016 call device_cfill(relambda%x_d, 0.0_rp, this%m)
1017 call device_relambda(relambda%x_d, x%x_d, this%upp%x_d, &
1018 low%x_d, pij%x_d, qij%x_d, this%n, this%m)
1022 call device_memcpy(relambda%x, relambda%x_d, this%m, device_to_host, &
1024 call mpi_allreduce(mpi_in_place, relambda%x, this%m, &
1025 mpi_real_precision, mpi_sum, neko_comm, ierr)
1026 call device_memcpy(relambda%x, relambda%x_d, this%m, &
1027 host_to_device, sync = .true.)
1029 call device_add2s2(relambda%x_d, this%a%x_d, -z, this%m)
1030 call device_sub2(relambda%x_d, y%x_d, this%m)
1031 call device_add2(relambda%x_d, mu%x_d, this%m)
1032 call device_sub2(relambda%x_d, this%bi%x_d, this%m)
1034 call device_col3(remu%x_d, mu%x_d, lambda%x_d, this%m)
1035 call device_cadd(remu%x_d, -epsi, this%m)
1037 residumax = maxval([device_maxval(relambda%x_d, this%m), &
1038 device_maxval(remu%x_d, this%m)])
1041 epsi = 0.1_rp * epsi
1045 call device_copy(this%xold2%x_d, this%xold1%x_d, this%n)
1046 call device_copy(this%xold1%x_d, designx_d, this%n)
1047 call device_copy(designx_d, x%x_d, this%n)
1050 call device_copy(this%y%x_d, y%x_d, this%m)
1052 call device_copy(this%lambda%x_d, lambda%x_d, this%m)
1053 call device_copy(this%mu%x_d, mu%x_d, this%m)
1055 call neko_scratch_registry%relinquish(ind)
1056 end subroutine mma_subsolve_dip_device
1058end submodule mma_device