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

Go to the source code of this file.

Functions/Subroutines

subroutine groups_get_elem_list (list_entity, nentity, lsubmodel)

Function/Subroutine Documentation

◆ groups_get_elem_list()

subroutine groups_get_elem_list ( integer, dimension(:), intent(inout), allocatable list_entity,
integer, intent(inout) nentity,
type(submodel_data), dimension(nsubmod) lsubmodel )

Definition at line 45 of file groups_get_elem_list.F.

46C-----------------------------------------------
47C M o d u l e s
48C-----------------------------------------------
49 USE message_mod
51 USE submodel_mod
52C-----------------------------------------------
53C I m p l i c i t T y p e s
54C-----------------------------------------------
55#include "implicit_f.inc"
56C-----------------------------------------------
57C D u m m y A r g u m e n t s
58C-----------------------------------------------
59 INTEGER,INTENT(INOUT) :: NENTITY
60 INTEGER,INTENT(INOUT),ALLOCATABLE,DIMENSION(:) :: LIST_ENTITY
61 TYPE(SUBMODEL_DATA) LSUBMODEL(NSUBMOD)
62C-----------------------------------------------
63C L o c a l V a r i a b l e s
64C-----------------------------------------------
65 INTEGER NENTITY_POS,NENTITY_NEG,JJ,KK
66 LOGICAL IS_AVAILABLE, IS_ENCRYPTED
67C-----------------------------------------------
68C CONSTITUTION DE LIST
69C-----------------------------------------------
70 CALL hm_get_intv ('idsmax' ,nentity_pos,is_available,lsubmodel)
71 CALL hm_get_intv ('negativeIdsmax' ,nentity_neg,is_available,lsubmodel)
72 nentity = nentity_pos + nentity_neg
73 ALLOCATE(list_entity(nentity))
74 DO kk=1,nentity_pos
75 CALL hm_get_int_array_index ('ids' ,jj ,kk,is_available,lsubmodel)
76 list_entity(kk)=jj
77 ENDDO
78 DO kk=1,nentity_neg
79 CALL hm_get_int_array_index ('negativeIds' ,jj ,kk,is_available,lsubmodel)
80 list_entity(nentity_pos+kk)=-jj
81 ENDDO
82C-----------------------
83
84 RETURN
subroutine hm_get_int_array_index(name, ival, index, is_available, lsubmodel)
subroutine hm_get_intv(name, ival, is_available, lsubmodel)