OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
lgmini_i7.F File Reference
#include "implicit_f.inc"
#include "param_c.inc"
#include "com04_c.inc"
#include "scr03_c.inc"
#include "scr17_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine lgmini_i7 (ipari, intbuf_tab, mass, itab, igrnod, nom_opt)

Function/Subroutine Documentation

◆ lgmini_i7()

subroutine lgmini_i7 ( integer, dimension(npari,ninter) ipari,
type(intbuf_struct_), dimension(*) intbuf_tab,
mass,
integer, dimension(*) itab,
type (group_), dimension(ngrnod) igrnod,
integer, dimension(lnopt1,*) nom_opt )

Definition at line 33 of file lgmini_i7.F.

34C-----------------------------------------------
35C M o d u l e s
36C-----------------------------------------------
37 USE message_mod
38 USE intbufdef_mod
39 USE groupdef_mod
41C-----------------------------------------------
42C I m p l i c i t T y p e s
43C-----------------------------------------------
44#include "implicit_f.inc"
45C-----------------------------------------------
46C C o m m o n B l o c k s
47C-----------------------------------------------
48#include "param_c.inc"
49#include "com04_c.inc"
50#include "scr03_c.inc"
51#include "scr17_c.inc"
52C-----------------------------------------------
53C D u m m y A r g u m e n t s
54C-----------------------------------------------
55 INTEGER IPARI(NPARI,NINTER),ITAB(*)
56 my_real mass(*)
57 INTEGER NOM_OPT(LNOPT1,*)
58 TYPE(INTBUF_STRUCT_) INTBUF_TAB(*)
59C-----------------------------------------------
60 TYPE (GROUP_) , DIMENSION(NGRNOD) :: IGRNOD
61C-----------------------------------------------
62C L o c a l V a r i a b l e s
63C-----------------------------------------------
64 INTEGER I, N, NTY , NN0, NSN, ILAGM, NRTS,NRTM, NMN, NAD, IGN
65 INTEGER ID
66 CHARACTER(LEN=NCHARTITLE) :: TITR
67C======================================================================|
68 DO n=1,ninter
69 id=nom_opt(1,n)
70 CALL fretitl2(titr,nom_opt(lnopt1-ltitr+1,n),ltitr)
71 nty=ipari(7,n)
72 ilagm=0
73 IF(codvers>=44) ilagm=ipari(33,n)
74 IF(nty==7.AND.ilagm==1) THEN
75 nsn =ipari(5,n)
76 nmn =ipari(6,n)
77 DO i=1,nsn
78 nn0=intbuf_tab(n)%NSV(i)
79 IF(mass(nn0)==0)THEN
80 CALL ancmsg(msgid=535,
81 . msgtype=msgerror,
82 . anmode=aninfo_blind_1,
83 . c1='INTERFACE TYPE7',
84 . i1=id,
85 . c2='INTERFACE TYPE7',
86 . c3=titr,c4='SECONDARY',
87 . i2=itab(nn0))
88 ENDIF
89 ENDDO
90 ELSE
91 IF(nty==16.AND.ilagm==1) THEN
92 ign =ipari(36,n)
93 nrtm =ipari(4,n)
94 nsn =ipari(5,n)
95 nmn =ipari(6,n)
96 DO i=1,nsn
97 nn0=igrnod(ign)%ENTITY(i)
98 IF(mass(nn0)==0)THEN
99 CALL ancmsg(msgid=535,
100 . msgtype=msgerror,
101 . anmode=aninfo_blind_1,
102 . c1='INTERFACE TYPE7',
103 . i1=id,
104 . c2='INTERFACE TYPE7',
105 . c3=titr,c4='SECONDARY',
106 . i2=itab(nn0))
107 ENDIF
108 ENDDO
109 ENDIF
110 ENDIF
111 ENDDO
112 RETURN
#define my_real
Definition cppsort.cpp:32
initmumps id
integer, parameter nchartitle
subroutine ancmsg(msgid, msgtype, anmode, i1, i2, i3, i4, i5, i6, i7, i8, i9, i10, i11, i12, i13, i14, i15, i16, i17, i18, i19, i20, r1, r2, r3, r4, r5, r6, r7, r8, r9, c1, c2, c3, c4, c5, c6, c7, c8, c9, prmode)
Definition message.F:889
subroutine fretitl2(titr, iasc, l)
Definition freform.F:804