OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
hm_preread_pblast.F File Reference
#include "implicit_f.inc"
#include "units_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine hm_preread_pblast (pblast, numloadp, igrsurf, lsubmodel, nsurf)

Function/Subroutine Documentation

◆ hm_preread_pblast()

subroutine hm_preread_pblast ( type (pblast_), intent(inout) pblast,
integer, intent(inout) numloadp,
type (surf_), dimension(nsurf), target igrsurf,
type(submodel_data), dimension(nsubmod), intent(in) lsubmodel,
integer, intent(in) nsurf )

Definition at line 38 of file hm_preread_pblast.F.

39C-----------------------------------------------
40C M o d u l e s
41C-----------------------------------------------
42 USE message_mod
43 USE pblast_mod
44 USE groupdef_mod
45 USE submodel_mod
48C-----------------------------------------------
49C I m p l i c i t T y p e s
50C-----------------------------------------------
51#include "implicit_f.inc"
52C-----------------------------------------------
53C C o m m o n B l o c k s
54C-----------------------------------------------
55#include "units_c.inc"
56C-----------------------------------------------
57C D u m m y A r g u m e n t s
58C-----------------------------------------------
59 INTEGER,INTENT(INOUT) :: NUMLOADP
60C-----------------------------------------------
61 TYPE (PBLAST_) , INTENT(INOUT) :: PBLAST
62 TYPE (SURF_) ,TARGET, DIMENSION(NSURF) :: IGRSURF
63 TYPE(SUBMODEL_DATA), DIMENSION(NSUBMOD), INTENT(IN) :: LSUBMODEL
64 INTEGER, INTENT(IN) :: NSURF
65C-----------------------------------------------
66C L o c a l V a r i a b l e s
67C-----------------------------------------------
68 INTEGER :: I, ID, ISU, IS, IERR1
69 CHARACTER(LEN=NCHARTITLE) :: TITR
70 INTEGER, DIMENSION(:), POINTER :: INGR2USR
71 LOGICAL :: IS_AVAILABLE
72C-----------------------------------------------
73C E x t e r n a l F u n c t i o n s
74C-----------------------------------------------
75 INTEGER,EXTERNAL :: NGR2USR
76C-----------------------------------------------
77C S o u r c e L i n e s
78C-----------------------------------------------
79 ierr1 = 0
80
81 CALL hm_option_start('/LOAD/PBLAST')
82
83 DO i = 1, pblast%NLOADP_B
84 CALL hm_option_read_key(lsubmodel, option_titr = titr, option_id = id)
85 CALL hm_get_intv('surf_ID', isu, is_available, lsubmodel)
86 ingr2usr => igrsurf(1:nsurf)%ID
87 is = ngr2usr(isu,ingr2usr,nsurf)
88 IF(is > 0)THEN
89 numloadp = numloadp + igrsurf(is)%NSEG*4
90 ENDIF
91 ENDDO
92
93 IF(pblast%NLOADP_B > 0 ) ALLOCATE ( pblast%PBLAST_TAB(pblast%NLOADP_B),stat=ierr1);
94 IF (ierr1 /= 0) THEN
95 WRITE(iout,*)' ** ERROR IN MEMORY ALLOCATION'
96 WRITE(istdo,*)' ** ERROR IN MEMORY ALLOCATION'
97 CALL arret(2)
98 ENDIF
99
subroutine hm_get_intv(name, ival, is_available, lsubmodel)
subroutine hm_option_start(entity_type)
initmumps id
integer, parameter nchartitle
integer function ngr2usr(iu, igr, ngr)
Definition nintrr.F:325
subroutine arret(nn)
Definition arret.F:87