OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
hm_read_cyljoint.F File Reference
#include "implicit_f.inc"
#include "analyse_name.inc"
#include "scr17_c.inc"
#include "units_c.inc"
#include "com04_c.inc"
#include "r2r_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine hm_read_cyljoint (ljoint, itabm1, ikine, itab, igrnod, nom_opt, lsubmodel)

Function/Subroutine Documentation

◆ hm_read_cyljoint()

subroutine hm_read_cyljoint ( integer, dimension(*) ljoint,
integer, dimension(*) itabm1,
integer, dimension(*) ikine,
integer, dimension(*) itab,
type (group_), dimension(ngrnod) igrnod,
integer, dimension(lnopt1,*) nom_opt,
type(submodel_data), dimension(*) lsubmodel )

Definition at line 46 of file hm_read_cyljoint.F.

48C-----------------------------------------------
49C M o d u l e s
50C-----------------------------------------------
51 USE r2r_mod
52 USE message_mod
53 USE groupdef_mod
54 USE submodel_mod
56 USE joint_mod
58C-----------------------------------------------
59C I m p l i c i t T y p e s
60C-----------------------------------------------
61#include "implicit_f.inc"
62C-----------------------------------------------
63C A n a l y s e M o d u l e
64C-----------------------------------------------
65#include "analyse_name.inc"
66C-----------------------------------------------
67C C o m m o n B l o c k s
68C-----------------------------------------------
69#include "scr17_c.inc"
70#include "units_c.inc"
71#include "com04_c.inc"
72#include "r2r_c.inc"
73C-----------------------------------------------
74C D u m m y A r g u m e n t s
75C-----------------------------------------------
76 INTEGER LJOINT(*), ITABM1(*), IKINE(*), ITAB(*)
77 INTEGER NOM_OPT(LNOPT1,*)
78C-----------------------------------------------
79 TYPE (GROUP_) ,DIMENSION(NGRNOD) :: IGRNOD
80 TYPE(SUBMODEL_DATA) LSUBMODEL(*)
81C-----------------------------------------------
82C L o c a l V a r i a b l e s
83C-----------------------------------------------
84 INTEGER :: K, I, NS, J, LJ, NU, IDIR,ID,N1,N2,IGU,IKINE1(3*NUMNOD),UID,NY,SUB_ID,IGS
85 my_real :: bid
86 CHARACTER MESS*40
87 CHARACTER(LEN=NCHARTITLE) :: TITR
88 LOGICAL :: IS_AVAILABLE
89C-----------------------------------------------
90C E x t e r n a l F u n c t i o n s
91C-----------------------------------------------
92 INTEGER USR2SYS,NODGRNR5
93 EXTERNAL usr2sys,nodgrnr5
94C
95 DATA mess/'CYLINDRICAL JOINTS DEFINITION '/
96C=======================================================================
97C
98 is_available = .false.
99C
100 k=1
101 ny = 0
102C
103 DO i=1,3*numnod
104 ikine1(i) = 0
105 ENDDO
106C
107 CALL hm_option_start('/CYL_JOINT')
108C
109 DO i=1,njoint
110 ny=ny+1
111C----------Multidomaines --> on ignore les cyljoint non tags----------
112 IF(nsubdom>0)THEN
113 IF(tagcyl(ny)==0)CALL hm_sz_r2r(tagcyl,ny,lsubmodel)
114 END IF
115C----------------------------------------------------------------------
116 CALL hm_option_read_key(lsubmodel,
117 . option_id = id,
118 . unit_id = uid,
119 . submodel_id = sub_id,
120 . option_titr = titr)
121C
122 nom_opt(1,i)=id
123 CALL fretitl(titr,nom_opt(lnopt1-ltitr+1,i),ltitr)
124C
125 CALL hm_get_intv('independentnode',n1,is_available,lsubmodel)
126 CALL hm_get_intv('dependentnodes',n2,is_available,lsubmodel)
127 CALL hm_get_intv('dependentnodeset',igu,is_available,lsubmodel)
128C
129 ns=2+nodgrnr5(igu,igs,ljoint(k+3),igrnod,itabm1,mess)
130C
131 ljoint(k+1)=usr2sys(n1,itabm1,mess,id)
132 ljoint(k+2)=usr2sys(n2,itabm1,mess,id)
133 CALL anodset(ljoint(k+1), check_used)
134 CALL anodset(ljoint(k+2), check_used)
135 ljoint(k)=ns
136 WRITE (iout,1000) id,ns
137 WRITE (iout,1100) (itab(ljoint(k+j)),j=1,ns)
138
139 ! allocation of cyl_joint%secondary_node : ns = secondary node + main node
140 ALLOCATE( cyl_join(i)%SECONDARY_NODE(ns) )
141 DO lj=1,ns
142 nu = itab(ljoint(k+lj))
143 cyl_join(i)%SECONDARY_NODE(lj) = ljoint(k+lj)
144 IF(joint_sms) CALL ifrontplus(ljoint(k+lj),1)
145 ! ----------------------
146 DO idir=1,6
147 CALL kinset(64,nu,ikine(ljoint(k+lj)),idir,0
148 . ,ikine1(ljoint(k+lj)))
149 ENDDO
150 ! ----------------------
151 ENDDO
152 ! save the number of secondary nodes
153 cyl_join(i)%NB_SECONDARY_NODE = ns
154 ! save the main nodes
155 ALLOCATE( cyl_join(i)%MAIN_NODE(2) )
156 cyl_join(i)%MAIN_NODE(1:2) = ljoint(k+1:k+2)
157 k=k+ns+1
158
159 ENDDO
160C-------------------------------------
161C Recherche des ID doubles
162C-------------------------------------
163 CALL udouble(nom_opt,lnopt1,njoint,mess,0,bid)
164C
165
166 1000 FORMAT(/' CYLINDRICAL JOINT ',i10, /
167 + ,' -------------------'/
168 + ' ',i8,' NODES:')
169
170 1100 FORMAT(7x,10i10)
171 RETURN
void anodset(int *id, int *type)
#define my_real
Definition cppsort.cpp:32
subroutine ifrontplus(n, p)
Definition frontplus.F:100
subroutine hm_get_intv(name, ival, is_available, lsubmodel)
subroutine hm_option_start(entity_type)
subroutine kinset(ik, node, ikine, idir, isk, ikine1)
Definition kinset.F:57
initmumps id
logical joint_sms
Definition joint_mod.F:62
type(joint_type), dimension(:), allocatable cyl_join
Definition joint_mod.F:61
integer, parameter nchartitle
integer, dimension(:), allocatable tagcyl
Definition r2r_mod.F:137
subroutine hm_sz_r2r(tag, val, lsubmodel)
integer function nodgrnr5(igu, igs, ibuf, igrnod, itabm1, mess)
Definition freform.F:303
subroutine fretitl(titr, iasc, l)
Definition freform.F:620
integer function usr2sys(iu, itabm1, mess, id)
Definition sysfus.F:160
subroutine udouble(list, ilist, nlist, mess, ir, rlist)
Definition sysfus.F:589