OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
i2_dtn_27.F File Reference
#include "implicit_f.inc"
#include "com04_c.inc"
#include "param_c.inc"
#include "com01_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine i2_dtn_27 (x, intbuf_tab, ipari, stifn, ms, in, n, nsn)
subroutine i2_dtn_27_cin (x, irect, crst, csts_bis, nsv, irtl, ipari, msegtyp2, stifn, stifr, ms, in, irupt)
subroutine i2_dtn_27_pen (x, irect, crst, nsv, irtl, ipari, msegtyp2, stifn, stifr, stfn, stfr, visc, in, irupt)

Function/Subroutine Documentation

◆ i2_dtn_27()

subroutine i2_dtn_27 ( x,
type(intbuf_struct_), dimension(*) intbuf_tab,
integer, dimension(npari,*) ipari,
stifn,
ms,
in,
integer n,
integer nsn )

Definition at line 32 of file i2_dtn_27.F.

33C-----------------------------------------------
34C M o d u l e s
35C-----------------------------------------------
36 USE intbufdef_mod
37C=======================================================================
38C I m p l i c i t T y p e s
39C-----------------------------------------------
40#include "implicit_f.inc"
41#include "com04_c.inc"
42C-----------------------------------------------
43C C o m m o n B l o c k s
44C-----------------------------------------------
45#include "param_c.inc"
46C-----------------------------------------------
47C D u m m y A r g u m e n t s
48C-----------------------------------------------
49 INTEGER IPARI(NPARI,*),NSN,N
50C REAL
52 . x(3,*),stifn(*),ms(*),in(*)
53C
54 TYPE(INTBUF_STRUCT_) INTBUF_TAB(*)
55C-----------------------------------------------
56C L o c a l V a r i a b l e s
57C-----------------------------------------------
58 INTEGER I,NI,NINDXC,NINDXP
59C=======================================================================
60 nindxc = 0
61 nindxp = 0
62C----------------
63 DO i=1,nsn
64 IF (intbuf_tab(n)%IRUPT(i) == 0) THEN
65 nindxc = nindxc + 1
66 ELSE
67 nindxp = nindxp + 1
68 ENDIF
69 ENDDO
70c-----------
71 IF (nindxc > 0) THEN
72 CALL i2_dtn_27_cin(x,intbuf_tab(n)%IRECTM,intbuf_tab(n)%CSTS,intbuf_tab(n)%CSTS_BIS,intbuf_tab(n)%NSV,
73 . intbuf_tab(n)%IRTLM ,ipari(1,n),intbuf_tab(n)%MSEGTYP2, stifn, stifn(numnod+1),
74 . ms,in,intbuf_tab(n)%IRUPT)
75 ENDIF
76c-----------
77 IF (nindxp > 0) THEN
78 CALL i2_dtn_27_pen(x,intbuf_tab(n)%IRECTM,intbuf_tab(n)%CSTS,intbuf_tab(n)%NSV,intbuf_tab(n)%IRTLM,
79 . ipari(1,n),intbuf_tab(n)%MSEGTYP2,stifn,stifn(numnod+1),intbuf_tab(n)%SPENALTY,
80 . intbuf_tab(n)%STFR_PENALTY,intbuf_tab(n)%VARIABLES(14),in,intbuf_tab(n)%IRUPT)
81 ENDIF
82C-----------
83 RETURN
#define my_real
Definition cppsort.cpp:32
subroutine i2_dtn_27_pen(x, irect, crst, nsv, irtl, ipari, msegtyp2, stifn, stifr, stfn, stfr, visc, in, irupt)
Definition i2_dtn_27.F:335
subroutine i2_dtn_27_cin(x, irect, crst, csts_bis, nsv, irtl, ipari, msegtyp2, stifn, stifr, ms, in, irupt)
Definition i2_dtn_27.F:95

◆ i2_dtn_27_cin()

subroutine i2_dtn_27_cin ( x,
integer, dimension(4,*) irect,
crst,
csts_bis,
integer, dimension(*) nsv,
integer, dimension(*) irtl,
integer, dimension(*) ipari,
integer, dimension(*) msegtyp2,
stifn,
stifr,
ms,
in,
integer, dimension(*) irupt )

Definition at line 92 of file i2_dtn_27.F.

95C-----------------------------------------------
96C I m p l i c i t T y p e s
97C-----------------------------------------------
98#include "implicit_f.inc"
99#include "com01_c.inc"
100C-----------------------------------------------
101C D u m m y A r g u m e n t s
102C-----------------------------------------------
103 INTEGER IRECT(4,*), NSV(*),IRTL(*),
104 . IPARI(*),MSEGTYP2(*),IRUPT(*)
105 my_real
106 . x(3,*),crst(2,*),stifn(*),stifr(*), ms(*),csts_bis(2,*),in(*)
107C-----------------------------------------------
108C L o c a l V a r i a b l e s
109C-----------------------------------------------
110 INTEGER II,I,J,JJ,L,IX1,IX2,IX3,IX4,NIR,NRTM,NSN,NMN,K
111 my_real
112 . bid,bid4(4),bid9(9),x1,x2,x3,x4,y1,y2,y3,y4,z1,z2,z3,z4,xs(3),xm(3),x0,y0,z0,betax,betay,betaz,
113 . e1x,e1y,e1z,e2x,e2y,e2z,e3x,e3y,e3z,h(4),h2(4),ss,st,sp,sm,tp,tm,rs(3),rm(3),rx(4),ry(4),rz(4),
114 . fac_triang,stbrk,dwdu,stifmr,stifm,ins,stf,aa
115C=======================================================================
116 nrtm = ipari(4)
117 nsn = ipari(5)
118 nmn = ipari(6)
119C
120 bid = zero
121 bid4(1:4)=zero
122 bid9(1:9)=zero
123C
124 DO ii=1,nsn
125 IF (irupt(ii) /= 0) cycle
126 i = nsv(ii)
127 l = irtl(ii)
128C
129 ix1 = irect(1,l)
130 ix2 = irect(2,l)
131 ix3 = irect(3,l)
132 ix4 = irect(4,l)
133C
134 IF (ix3 == ix4) THEN
135C-- Shape functions of triangles
136 nir = 3
137 h(1) = crst(1,ii)
138 h(2) = crst(2,ii)
139 h(3) = one-crst(1,ii)-crst(2,ii)
140 h(4) = zero
141 h2(1) = csts_bis(1,ii)
142 h2(2) = csts_bis(2,ii)
143 h2(3) = one-csts_bis(1,ii)-csts_bis(2,ii)
144 h2(4) = zero
145 ELSE
146C-- Shape functions of quadrangles
147 nir = 4
148 ss=crst(1,ii)
149 st=crst(2,ii)
150 sp=one + ss
151 sm=one - ss
152 tp=fourth*(one + st)
153 tm=fourth*(one - st)
154 h(1)=tm*sm
155 h(2)=tm*sp
156 h(3)=tp*sp
157 h(4)=tp*sm
158
159C Additional form functions for distribution of mass / inertia - to avoid negative masses for projection outside of the element
160 ss=csts_bis(1,ii)
161 st=csts_bis(2,ii)
162 sp=one + ss
163 sm=one - ss
164 tp=fourth*(one + st)
165 tm=fourth*(one - st)
166 h2(1)=tm*sm
167 h2(2)=tm*sp
168 h2(3)=tp*sp
169 h2(4)=tp*sm
170 ENDIF
171C
172 IF (msegtyp2(l)==0) THEN
173C---- rep local facette main
174C
175 x1 = x(1,ix1)
176 y1 = x(2,ix1)
177 z1 = x(3,ix1)
178 x2 = x(1,ix2)
179 y2 = x(2,ix2)
180 z2 = x(3,ix2)
181 x3 = x(1,ix3)
182 y3 = x(2,ix3)
183 z3 = x(3,ix3)
184 x4 = x(1,ix4)
185 y4 = x(2,ix4)
186 z4 = x(3,ix4)
187 xs(1) = x(1,i)
188 xs(2) = x(2,i)
189 xs(3) = x(3,i)
190C
191 CALL i2rep(x1 ,x2 ,x3 ,x4 ,
192 . y1 ,y2 ,y3 ,y4 ,
193 . z1 ,z2 ,z3 ,z4 ,
194 . e1x ,e1y ,e1z ,
195 . e2x ,e2y ,e2z ,
196 . e3x ,e3y ,e3z ,nir)
197
198C
199 IF (nir == 4) THEN
200 fac_triang = one
201 x0 = fourth*(x1 + x2 + x3 + x4)
202 y0 = fourth*(y1 + y2 + y3 + y4)
203 z0 = fourth*(z1 + z2 + z3 + z4)
204 ELSE
205 fac_triang = zero
206 x0 = third*(x1 + x2 + x3)
207 y0 = third*(y1 + y2 + y3)
208 z0 = third*(z1 + z2 + z3)
209 ENDIF
210C
211 xs(1) = xs(1) - x0
212 xs(2) = xs(2) - y0
213 xs(3) = xs(3) - z0
214C
215 x1 = x1 - x0
216 y1 = y1 - y0
217 z1 = z1 - z0
218 x2 = x2 - x0
219 y2 = y2 - y0
220 z2 = z2 - z0
221 x3 = x3 - x0
222 y3 = y3 - y0
223 z3 = z3 - z0
224 x4 = x4 - x0
225 y4 = y4 - y0
226 z4 = z4 - z0
227C
228 IF (nir==3) THEN
229 x4 = zero
230 y4 = zero
231 z4 = zero
232 END IF
233C
234 xm(1) = x1*h(1) + x2*h(2) + x3*h(3) + x4*h(4)
235 xm(2) = y1*h(1) + y2*h(2) + y3*h(3) + y4*h(4)
236 xm(3) = z1*h(1) + z2*h(2) + z3*h(3) + z4*h(4)
237
238C---- computation of local coordinates
239C
240 rs(1) = xs(1)*e1x + xs(2)*e1y + xs(3)*e1z
241 rs(2) = xs(1)*e2x + xs(2)*e2y + xs(3)*e2z
242 rs(3) = xs(1)*e3x + xs(2)*e3y + xs(3)*e3z
243C
244 rm(1) = xm(1)*e1x + xm(2)*e1y + xm(3)*e1z
245 rm(2) = xm(1)*e2x + xm(2)*e2y + xm(3)*e2z
246 rm(3) = xm(1)*e3x + xm(2)*e3y + xm(3)*e3z
247c
248 rx(1) = e1x*x1 + e1y*y1 + e1z*z1
249 ry(1) = e2x*x1 + e2y*y1 + e2z*z1
250 rz(1) = e3x*x1 + e3y*y1 + e3z*z1
251 rx(2) = e1x*x2 + e1y*y2 + e1z*z2
252 ry(2) = e2x*x2 + e2y*y2 + e2z*z2
253 rz(2) = e3x*x2 + e3y*y2 + e3z*z2
254 rx(3) = e1x*x3 + e1y*y3 + e1z*z3
255 ry(3) = e2x*x3 + e2y*y3 + e2z*z3
256 rz(3) = e3x*x3 + e3y*y3 + e3z*z3
257 rx(4) = e1x*x4 + e1y*y4 + e1z*z4
258 ry(4) = e2x*x4 + e2y*y4 + e2z*z4
259 rz(4) = e3x*x4 + e3y*y4 + e3z*z4
260C
261C---- computation of kinematic parameters and stbrk - local coordinates
262 CALL i2cin_rot27(stbrk,rs,rm,rx(1),ry(1),rz(1),rx(2),ry(2),rz(2),rx(3),ry(3),rz(3),
263 . rx(4),ry(4),rz(4),bid9,dwdu,e1x,e1y,e1z,e2x,e2y,e2z,e3x,e3y,e3z,
264 . nir,betax,betay)
265C
266C---- update main forces (moment balance) - local coordinates RX
267 IF (iroddl==1) THEN
268C--
269 CALL i2loceq_27(nir ,rs ,rx ,ry ,rz ,
270 . bid4 ,bid4 ,bid4 ,h ,stifm ,
271 . bid4 ,bid4 ,bid4 ,stifmr ,betax ,
272 . betay)
273 ELSE
274C-- moment balance
275 CALL i2loceq_27(nir ,rs ,rx ,ry ,rz ,
276 . bid4 ,bid4 ,bid4 ,h ,stifm ,
277 . bid4 ,bid4 ,bid4 ,stifmr ,betax ,
278 . betay)
279 stifmr = zero
280 ENDIF
281C
282 ELSE
283 stifm=zero
284 stbrk=zero
285 stifmr=zero
286 dwdu=zero
287 ENDIF
288C
289 IF ((iroddl/=0).AND.(msegtyp2(l)==0)) THEN
290C
291 aa =(xm(1)-xs(1))*(xm(1)-xs(1))+(xm(2)-xs(2))*(xm(2)-xs(2))+(xm(3)-xs(3))*(xm(3)-xs(3))
292 ins = in(i) + aa * ms(i)
293 stf = stifr(i) + aa * stifn(i)
294C
295 DO jj=1,nir
296 j=irect(jj,l)
297 ms(j)=ms(j)+ms(i)*h2(jj)
298 stifn(j)=stifn(j)+stifn(i)*(one+stbrk)*(abs(h(jj))+stifm)+stifr(i)*stifmr*dwdu
299 in(j)=in(j)+ins*h2(jj)
300 stifr(j)=stifr(j)+abs(stf*h(jj))
301 ENDDO
302C
303 stifn(i) = zero
304 stifr(i) = zero
305 ms(i) = zero
306 in(i) = zero
307C
308 ELSE
309 DO jj=1,nir
310 j=irect(jj,l)
311 ms(j)=ms(j)+ms(i)*h2(jj)
312 stifn(j)=stifn(j)+stifn(i)*(one+stbrk)*(abs(h(jj))+stifm)
313 ENDDO
314C
315 stifn(i)=zero
316 ms(i)=zero
317C
318 END IF
319C
320 ENDDO
321C
322C-----------
323 RETURN
subroutine i2cin_rot27(stbrk, rs, rm, x1, y1, z1, x2, y2, z2, x3, y3, z3, x4, y4, z4, dpara, dwdu, e1x, e1y, e1z, e2x, e2y, e2z, e3x, e3y, e3z, nir, betax, betay)
Definition i2cin_rot27.F:33
subroutine i2loceq_27(nir, rs, rx, ry, rz, fmx, fmy, fmz, h, stifm, mxs, mys, mzs, stifmr, betax, betay)
Definition i2loceq.F:224
subroutine i2rep(x1, x2, x3, x4, y1, y2, y3, y4, z1, z2, z3, z4, e1x, e1y, e1z, e2x, e2y, e2z, e3x, e3y, e3z, nir)
Definition i2rep.F:48

◆ i2_dtn_27_pen()

subroutine i2_dtn_27_pen ( x,
integer, dimension(4,*) irect,
crst,
integer, dimension(*) nsv,
integer, dimension(*) irtl,
integer, dimension(*) ipari,
integer, dimension(*) msegtyp2,
stifn,
stifr,
stfn,
stfr,
visc,
in,
integer, dimension(*) irupt )

Definition at line 332 of file i2_dtn_27.F.

335C-----------------------------------------------
336C I m p l i c i t T y p e s
337C-----------------------------------------------
338#include "implicit_f.inc"
339C-----------------------------------------------
340C D u m m y A r g u m e n t s
341C-----------------------------------------------
342 INTEGER IRECT(4,*),NSV(*),IRTL(*),MSEGTYP2(*),IPARI(*),IRUPT(*)
343C REAL
344 my_real
345 . x(3,*),in(*),stifn(*),stifr(*),stfn(*),stfr(*),crst(2,*),visc
346C-----------------------------------------------
347C C o m m o n B l o c k s
348C-----------------------------------------------
349#include "com01_c.inc"
350C-----------------------------------------------
351C L o c a l V a r i a b l e s
352C-----------------------------------------------
353 INTEGER NIR,I,J,II,JJ,L,W,NN,KK,LLT,
354 . IX1, IX2, IX3, IX4,NSVG,NSN
355C REAL
356 my_real
357 . s,t,sp,sm,tp,tm,e1x,e1y,e1z,e2x,e2y,e2z,e3x,e3y,e3z,
358 . xsm,ysm,zsm,xm,ym,zm,x1,x2,x3,x4,y1,y2,y3,y4,z1,z2,z3,z4,x0,y0,z0,xs,ys,zs,stifm,
359 . stf,str,stbrk,b1,b2,b3,c1,c2,c3,det
360 my_real
361 . h(4),rx(4),ry(4),rz(4),rm(3),rs(3),stif, vis
362 my_real
363 . len2,fac_triang,irot,skew(9),tt,bid,bid3(4)
364C=======================================================================
365 nsn = ipari(5)
366C
367 bid = zero
368 bid3(1:4)=zero
369 tt = zero
370C
371 DO ii=1,nsn
372 IF (irupt(ii) == 0) cycle
373 i = nsv(ii)
374 l = irtl(ii)
375C
376 ix1 = irect(1,l)
377 ix2 = irect(2,l)
378 ix3 = irect(3,l)
379 ix4 = irect(4,l)
380C
381 IF (i > 0) THEN
382 s = crst(1,ii)
383 t = crst(2,ii)
384 l = irtl(ii)
385C
386 ix1 = irect(1,l)
387 ix2 = irect(2,l)
388 ix3 = irect(3,l)
389 ix4 = irect(4,l)
390C
391 irot = zero
392 IF(iroddl > 0) THEN
393 IF ((msegtyp2(l)==1).AND.(in(i)>em20)) THEN
394C-- shell main segment --
395 irot = one
396 ENDIF
397 ENDIF
398C
399 IF (ix3 == ix4) THEN
400C-- Shape functions of triangles
401 nir = 3
402 h(1) = s
403 h(2) = t
404 h(3) = one-s-t
405 h(4) = zero
406 ELSE
407C-- Shape functions of quadrangles
408 nir = 4
409 sp=one + s
410 sm=one - s
411 tp=fourth*(one + t)
412 tm=fourth*(one - t)
413 h(1)=tm*sm
414 h(2)=tm*sp
415 h(3)=tp*sp
416 h(4)=tp*sm
417 ENDIF
418
419C------------------------------------------------
420C rep local facette main
421C------------------------------------------------
422 x1 = x(1,ix1)
423 y1 = x(2,ix1)
424 z1 = x(3,ix1)
425 x2 = x(1,ix2)
426 y2 = x(2,ix2)
427 z2 = x(3,ix2)
428 x3 = x(1,ix3)
429 y3 = x(2,ix3)
430 z3 = x(3,ix3)
431 x4 = x(1,ix4)
432 y4 = x(2,ix4)
433 z4 = x(3,ix4)
434 xs = x(1,i)
435 ys = x(2,i)
436 zs = x(3,i)
437
438C---------------------
439 CALL i2rep(x1 ,x2 ,x3 ,x4 ,
440 . y1 ,y2 ,y3 ,y4 ,
441 . z1 ,z2 ,z3 ,z4 ,
442 . e1x ,e1y ,e1z ,
443 . e2x ,e2y ,e2z ,
444 . e3x ,e3y ,e3z ,nir )
445C------------------------------------------------
446 IF (nir == 4) THEN
447 fac_triang = one
448C
449 xm = x1*h(1) + x2*h(2) + x3*h(3) + x4*h(4)
450 ym = y1*h(1) + y2*h(2) + y3*h(3) + y4*h(4)
451 zm = z1*h(1) + z2*h(2) + z3*h(3) + z4*h(4)
452 x0 = (x1 + x2 + x3 + x4)/nir
453 y0 = (y1 + y2 + y3 + y4)/nir
454 z0 = (z1 + z2 + z3 + z4)/nir
455
456 xm = xm - x0
457 ym = ym - y0
458 zm = zm - z0
459 xs = xs - x0
460 ys = ys - y0
461 zs = zs - z0
462 xsm = xs - xm
463 ysm = ys - ym
464 zsm = zs - zm
465C
466 ELSE
467 fac_triang = zero
468C
469 x0 = (x1 + x2 + x3)/nir
470 y0 = (y1 + y2 + y3)/nir
471 z0 = (z1 + z2 + z3)/nir
472
473 xm = x1*h(1) + x2*h(2) + x3*h(3)
474 ym = y1*h(1) + y2*h(2) + y3*h(3)
475 zm = z1*h(1) + z2*h(2) + z3*h(3)
476
477 xm = xm - x0
478 ym = ym - y0
479 zm = zm - z0
480 xs = xs - x0
481 ys = ys - y0
482 zs = zs - z0
483 xsm = xs - xm
484 ysm = ys - ym
485 zsm = zs - zm
486 ENDIF
487C
488 x1 = x1 - x0
489 y1 = y1 - y0
490 z1 = z1 - z0
491 x2 = x2 - x0
492 y2 = y2 - y0
493 z2 = z2 - z0
494 x3 = x3 - x0
495 y3 = y3 - y0
496 z3 = z3 - z0
497 x4 = x4 - x0
498 y4 = y4 - y0
499 z4 = z4 - z0
500C
501c global -> local
502c
503 rs(1) = xs*e1x + ys*e1y + zs*e1z
504 rs(2) = xs*e2x + ys*e2y + zs*e2z
505 rs(3) = xs*e3x + ys*e3y + zs*e3z
506 rm(1) = xm*e1x + ym*e1y + zm*e1z
507 rm(2) = xm*e2x + ym*e2y + zm*e2z
508 rm(3) = xm*e3x + ym*e3y + zm*e3z
509c
510 rx(1) = e1x*x1 + e1y*y1 + e1z*z1
511 ry(1) = e2x*x1 + e2y*y1 + e2z*z1
512 rz(1) = e3x*x1 + e3y*y1 + e3z*z1
513 rx(2) = e1x*x2 + e1y*y2 + e1z*z2
514 ry(2) = e2x*x2 + e2y*y2 + e2z*z2
515 rz(2) = e3x*x2 + e3y*y2 + e3z*z2
516 rx(3) = e1x*x3 + e1y*y3 + e1z*z3
517 ry(3) = e2x*x3 + e2y*y3 + e2z*z3
518 rz(3) = e3x*x3 + e3y*y3 + e3z*z3
519 rx(4) = e1x*x4 + e1y*y4 + e1z*z4
520 ry(4) = e2x*x4 + e2y*y4 + e2z*z4
521 rz(4) = e3x*x4 + e3y*y4 + e3z*z4
522C
523 IF (nir==3) THEN
524 rx(4)=zero
525 ry(4)=zero
526 rz(4)=zero
527 END IF
528C
529C---------
530 CALL i2pen_rot27(
531 . skew ,tt ,bid ,stbrk,
532 . rs ,rm ,bid3 ,bid3 ,bid3 ,
533 . rx ,ry ,rz ,bid3 ,bid3 ,
534 . bid3 ,bid3 ,bid3 ,bid3 ,det ,
535 . b1 ,b2 ,b3 ,c1 ,c2 ,
536 . c3 ,irot)
537C
538C------------------------------------------------
539C
540 stf = stfn(ii)*(visc + sqrt(visc**2 + (one+stbrk)))**2
541 stifm=zero
542
543C------------------------------------------------
544C
545 IF (irot > zero) THEN
546C
547C-- Secnd node shell of spring
548C
549 len2 = xsm**2+ysm**2+zsm**2
550 str = (stfr(ii)+stfn(ii)*len2)*(visc + sqrt(visc**2 + one))**2
551C
552 ELSE
553C
554C-- Secnd node of solids
555C
556 str = zero
557c update main forces (moment balance)
558 CALL i2loceq( nir ,rs ,rx ,ry ,rz ,
559 . bid3 ,bid3 ,bid3 ,h(1) ,stifm)
560C
561 ENDIF
562C
563C----------------------------------------------------
564C
565 stifn(ix1) = stifn(ix1)+abs(stf*h(1))+stifm*stf
566 stifn(ix2) = stifn(ix2)+abs(stf*h(2))+stifm*stf
567 stifn(ix3) = stifn(ix3)+abs(stf*h(3))+stifm*stf
568 stifn(ix4) = stifn(ix4)+abs(stf*h(4))+stifm*stf*fac_triang
569c
570 IF (iroddl == 1) THEN
571 IF (irot > 0) THEN
572
573 stifr(ix1) = stifr(ix1)+abs(str*h(1))
574 stifr(ix2) = stifr(ix2)+abs(str*h(2))
575 stifr(ix3) = stifr(ix3)+abs(str*h(3))
576 stifr(ix4) = stifr(ix4)+abs(str*h(4))
577c
578 ENDIF
579 ENDIF
580C
581 END IF
582C
583 ENDDO
584C
585C-----------
586 RETURN
subroutine i2loceq(nir, rs, rx, ry, rz, fmx, fmy, fmz, h, stifm)
Definition i2loceq.F:40
subroutine i2pen_rot27(skew, tt, dt1, stif, rs, rm, vx, vy, vz, rx, ry, rz, va, vb, vc, vd, vrm, vrs, det, b1, b2, b3, c1, c2, c3, in_secnd)
Definition i2pen_rot.F:270