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

Go to the source code of this file.

Data Types

type  mumps_ooc_common::io_block

Modules

module  mumps_ooc_common

Functions/Subroutines

subroutine mumps_ooc_convert_2inttobigint (int1, int2, bigint)
subroutine mumps_ooc_convert_bigintto2int (int1, int2, bigint)
subroutine mumps_ooc_init_filetype (typef_l, typef_u, typef_cb, k201, k251, k50, typef_invalid)
integer function mumps_ooc_get_fct_type (fwdorbwd, mtype, k201, k50)

Variables

integer, parameter mumps_ooc_common::fct = 0
integer, parameter, public mumps_ooc_common::typef_invalid = -999999
integer, public mumps_ooc_common::typef_l
integer, public mumps_ooc_common::typef_u
integer, public mumps_ooc_common::typef_cb
integer mumps_ooc_common::ooc_nb_file_type
integer mumps_ooc_common::ooc_fct_type
integer, dimension(:,:), pointer mumps_ooc_common::ooc_inode_sequence
integer(8), dimension(:,:), pointer mumps_ooc_common::ooc_vaddr
integer, dimension(:), pointer mumps_ooc_common::keep_ooc
integer mumps_ooc_common::icntl1
integer(8), dimension(:), allocatable mumps_ooc_common::addvirtlibre
logical, save mumps_ooc_common::strat_io_async
logical, save mumps_ooc_common::with_buf
logical, save mumps_ooc_common::solve
integer, dimension(:), pointer mumps_ooc_common::step_ooc
integer, dimension(:), pointer mumps_ooc_common::procnode_ooc
integer, save mumps_ooc_common::myid_ooc
integer, save mumps_ooc_common::slavef_ooc
integer, save mumps_ooc_common::low_level_strat_io
integer(8), save mumps_ooc_common::hbuf_size
integer(8), save mumps_ooc_common::dim_buf_io
integer mumps_ooc_common::err_str_ooc_max_len
character(len=1), dimension(err_str_ooc_max_lenmumps_ooc_common::err_str_ooc
integer mumps_ooc_common::dim_err_str_ooc
integer, public mumps_ooc_common::strat_write_max
integer, public mumps_ooc_common::strat_try_write

Function/Subroutine Documentation

◆ mumps_ooc_convert_2inttobigint()

subroutine mumps_ooc_convert_2inttobigint ( integer int1,
integer int2,
integer(8) bigint )

Definition at line 48 of file mumps_ooc_common.F.

49 IMPLICIT NONE
50 INTEGER INT1,INT2
51 INTEGER(8) BIGINT
52 INTEGER(8) TMP1,TMP2,CONV
53 parameter(conv=1073741824_8)
54 tmp1=int(int1,kind=kind(tmp1))
55 tmp2=int(int2,kind=kind(tmp2))
56 bigint=(tmp1*conv)+tmp2
57 RETURN

◆ mumps_ooc_convert_bigintto2int()

subroutine mumps_ooc_convert_bigintto2int ( integer int1,
integer int2,
integer(8) bigint )

Definition at line 59 of file mumps_ooc_common.F.

60 IMPLICIT NONE
61 INTEGER INT1,INT2
62 INTEGER(8) BIGINT
63 INTEGER(8) TMP1,TMP2,CONV
64 parameter(conv=1073741824_8)
65 tmp1=bigint/conv
66 tmp2=mod(bigint,conv)
67 int1=int(tmp1)
68 int2=int(tmp2)
69 RETURN

◆ mumps_ooc_get_fct_type()

integer function mumps_ooc_get_fct_type ( character(len=1), intent(in) fwdorbwd,
integer, intent(in) mtype,
integer, intent(in) k201,
integer, intent(in) k50 )

Definition at line 95 of file mumps_ooc_common.F.

98 INTEGER, intent(in) :: MTYPE, K201, K50
99 CHARACTER(len=1), intent(in) :: FWDORBWD
100 IF ( (typef_l .NE. 1 .AND. typef_l .NE. typef_invalid)
101 & .OR. (typef_u .NE. 1 .AND. typef_u .NE. 2 .AND.
102 & typef_u .NE. typef_invalid) ) THEN
103 WRITE(*,*) "Internal error 1 in MUMPS_OOC_GET_FCT_TYPE",
105 CALL mumps_abort()
106 ENDIF
107 IF (fwdorbwd .NE. 'F' .AND. fwdorbwd .NE. 'B') THEN
108 WRITE(*,*) "Internal error in MUMPS_OOC_GET_FCT_TYPE,",fwdorbwd
109 CALL mumps_abort()
110 ENDIF
111 IF (k201 .EQ. 1) THEN
112 IF (fwdorbwd .EQ. 'F') THEN
113 IF((mtype.NE.1).AND.(k50.EQ.0))THEN
115 ELSE
117 ENDIF
118 ELSE
119 IF(k50.EQ.0)THEN
120 IF(mtype.NE.1)THEN
122 ELSE
124 ENDIF
125 ELSE
127 ENDIF
128 ENDIF
129 ELSE
131 ENDIF
132 RETURN
#define mumps_abort
Definition VE_Metis.h:25
integer function mumps_ooc_get_fct_type(fwdorbwd, mtype, k201, k50)
integer, public typef_u
integer, parameter, public typef_invalid
integer, public typef_l

◆ mumps_ooc_init_filetype()

subroutine mumps_ooc_init_filetype ( integer, intent(out) typef_l,
integer, intent(out) typef_u,
integer, intent(out) typef_cb,
integer, intent(in) k201,
integer, intent(in) k251,
integer, intent(in) k50,
integer, intent(in) typef_invalid )

Definition at line 71 of file mumps_ooc_common.F.

74 IMPLICIT NONE
75 INTEGER, intent(out):: TYPEF_L, TYPEF_U, TYPEF_CB
76 INTEGER, intent(in) :: K201, K251, K50
77 INTEGER, intent(in) :: TYPEF_INVALID
78 IF (k201 .EQ. 1 .AND. k50.EQ.0) THEN
79 IF ( k251.NE.2 ) THEN
80 typef_l = 1
81 typef_u = 2
82 typef_cb = 3
83 ELSE
84 typef_u = 1
85 typef_l = typef_invalid
86 typef_cb = 2
87 ENDIF
88 ELSE
89 typef_l = 1
90 typef_u = typef_invalid
91 typef_cb=2
92 ENDIF
93 RETURN