OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
dsol_lr.F File Reference

Go to the source code of this file.

Modules

module  dmumps_sol_lr

Functions/Subroutines

subroutine dmumps_sol_lr::dmumps_sol_fwd_lr_su (inode, n, iwhdlr, npiv_global, nslaves, iw, ipos_init, liw, liell, wcb, lwcb, ld_wcbpiv, ld_wcbcb, ppiv_init, pcb_init, rhscomp, lrhscomp, nrhs, posinrhscomp_fwd, jbdeb, jbfin, mtype, keep, keep8, oocwrite_compatible_with_blr, iflag, ierror)
subroutine dmumps_sol_lr::dmumps_sol_slave_lr_u (inode, iwhdlr, npiv_global, wcb, lwcb, ldx, ldy, ptrx_init, ptry_init, jbdeb, jbfin, mtype, keep, keep8, iflag, ierror)
subroutine dmumps_sol_lr::dmumps_sol_fwd_blr_update (arraypiv, lpiv, lpivcol, ldpiv, pospiv, pospivcol, arraycb, lcb, ldcb, poscb, posdiag, nrhs_b, npiv, blr_panel, last_blr, current_blr, begs_blr_static, keep8, k34, k450, is_t2_slave, iflag, ierror)
subroutine dmumps_sol_lr::dmumps_sol_bwd_lr_su (inode, iwhdlr, npiv_global, nslaves, liell, wcb, lwcb, nrhs_b, ptwcb, rhscomp, lrhscomp, nrhs, iposinrhscomp, jbdeb, mtype, keep, keep8, iflag, ierror)
subroutine dmumps_sol_lr::dmumps_sol_bwd_blr_update (arraypiv, lpiv, lpivcol, ldpiv, pospiv, pospivcol, arraycb, lcb, ldcb, poscb, posdiag, nrhs_b, npiv, blr_panel, last_blr, current_blr, begs_blr_static, keep8, k34, k450, is_t2_slave, iflag, ierror)
subroutine dmumps_solve_bwd_lr_trsolve (diag, ldiag, npiv, nelim, liell, nrhs_b, w, lwc, rhscomp, lrhscomp, nrhs, ppivinrhscomp, jbdeb, mtype, keep)

Function/Subroutine Documentation

◆ dmumps_solve_bwd_lr_trsolve()

subroutine dmumps_solve_bwd_lr_trsolve ( double precision, dimension(ldiag), intent(in) diag,
integer, intent(in) ldiag,
integer, intent(in) npiv,
integer, intent(in) nelim,
integer, intent(in) liell,
integer, intent(in) nrhs_b,
double precision, dimension(lwc), intent(inout) w,
integer(8), intent(in) lwc,
double precision, dimension(lrhscomp,nrhs) rhscomp,
integer, intent(in) lrhscomp,
integer, intent(in) nrhs,
integer, intent(in) ppivinrhscomp,
integer, intent(in) jbdeb,
integer, intent(in) mtype,
integer, dimension(500), intent(in) keep )

Definition at line 694 of file dsol_lr.F.

700 INTEGER, INTENT(IN) :: MTYPE, LIELL, NPIV, NELIM, KEEP(500)
701 INTEGER, INTENT(IN) :: NRHS_B, LDIAG
702 INTEGER, INTENT(IN) :: PPIVINRHSCOMP, JBDEB, LRHSCOMP, NRHS
703 INTEGER(8), INTENT(IN) :: LWC
704 DOUBLE PRECISION, INTENT(IN) :: DIAG(LDIAG)
705 DOUBLE PRECISION, INTENT(INOUT) :: W(LWC)
706 DOUBLE PRECISION RHSCOMP(LRHSCOMP,NRHS)
707 INTEGER :: LDAJ
708 DOUBLE PRECISION ONE
709 parameter(one = 1.0d0)
710 IF ( mtype .eq. 1 ) THEN
711 ldaj = npiv + nelim
712 CALL dtrsm('L','L','T','N', npiv, nrhs_b, one, diag(1),
713 & ldaj, rhscomp(ppivinrhscomp,jbdeb),
714 & lrhscomp)
715 ELSE
716 IF ( keep(50) .EQ. 0 ) THEN
717 ldaj=npiv+nelim
718 ELSE
719 ldaj=npiv
720 ENDIF
721 CALL dtrsm('L','U','N','U', npiv, nrhs_b, one, diag(1),
722 & ldaj, rhscomp(ppivinrhscomp,jbdeb), lrhscomp)
723 END IF
724 RETURN
subroutine dtrsm(side, uplo, transa, diag, m, n, alpha, a, lda, b, ldb)
DTRSM
Definition dtrsm.f:181