OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
dmumps_lr_type Module Reference

Data Types

type  lrb_type

Functions/Subroutines

subroutine dealloc_lrb (lrb_out, keep8, k34)
subroutine dealloc_blr_panel (blr_panel, iend, keep8, k34, ibeg_in)

Function/Subroutine Documentation

◆ dealloc_blr_panel()

subroutine dmumps_lr_type::dealloc_blr_panel ( type(lrb_type), dimension(:), intent(inout) blr_panel,
integer, intent(in) iend,
integer(8), dimension(150) keep8,
integer, intent(in) k34,
integer, intent(in), optional ibeg_in )

Definition at line 55 of file dlr_type.F.

56 INTEGER, INTENT(IN) :: IEND
57 TYPE(LRB_TYPE), INTENT(INOUT) :: BLR_PANEL(:)
58 INTEGER(8) :: KEEP8(150)
59 INTEGER, INTENT(IN) :: K34
60 INTEGER, INTENT(IN), OPTIONAL :: IBEG_IN
61 INTEGER :: I, IBEG
62 IF (present(ibeg_in)) THEN
63 ibeg = ibeg_in
64 ELSE
65 ibeg = 1
66 ENDIF
67 IF (iend.GE.ibeg) THEN
68 IF (blr_panel(1)%M.NE.0) THEN
69 DO i=ibeg, iend
70 CALL dealloc_lrb(blr_panel(i), keep8, k34)
71 ENDDO
72 ENDIF
73 ENDIF

◆ dealloc_lrb()

subroutine dmumps_lr_type::dealloc_lrb ( type(lrb_type), intent(inout) lrb_out,
integer(8), dimension(150) keep8,
integer k34 )

Definition at line 23 of file dlr_type.F.

25 TYPE(LRB_TYPE), INTENT(INOUT) :: LRB_OUT
26 INTEGER(8) :: KEEP8(150)
27 INTEGER :: K34
28 INTEGER :: MEM, IDUMMY, JDUMMY
29 IF (lrb_out%M.EQ.0) RETURN
30 IF (lrb_out%N.EQ.0) RETURN
31 mem = 0
32 IF (lrb_out%ISLR) THEN
33 IF (associated(lrb_out%Q)) THEN
34 mem = mem + size(lrb_out%Q)
35 DEALLOCATE (lrb_out%Q)
36 NULLIFY(lrb_out%Q)
37 ENDIF
38 IF (associated(lrb_out%R)) THEN
39 mem = mem + size(lrb_out%R)
40 DEALLOCATE (lrb_out%R)
41 NULLIFY(lrb_out%R)
42 ENDIF
43 ELSE
44 IF (associated(lrb_out%Q)) THEN
45 mem = mem + size(lrb_out%Q)
46 DEALLOCATE (lrb_out%Q)
47 NULLIFY(lrb_out%Q)
48 ENDIF
49 ENDIF
50 CALL mumps_dm_fac_upd_dyn_memcnts(-int(mem,8),
51 & .true., keep8,
52 & idummy, jdummy,
53 & .true., .true.)
subroutine mumps_dm_fac_upd_dyn_memcnts(mem_count_allocated, atomic_updates, keep8, iflag, ierror, k69upd, k71upd)