OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
lecstat.F File Reference
#include "implicit_f.inc"
#include "com01_c.inc"
#include "com04_c.inc"
#include "param_c.inc"
#include "units_c.inc"
#include "scr16_c.inc"
#include "scr17_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine lecstat (ipart, ipart_state, elbuf_tab, ipm, iparg, iparts, ipartc, ipartg, mat_param)

Function/Subroutine Documentation

◆ lecstat()

subroutine lecstat ( integer, dimension(lipart1,*) ipart,
integer, dimension(*) ipart_state,
type (elbuf_struct_), dimension(ngroup), target elbuf_tab,
integer, dimension(npropmi,nummat), intent(inout) ipm,
integer, dimension(nparg,*), intent(inout) iparg,
integer, dimension(*) iparts,
integer, dimension(*) ipartc,
integer, dimension(*) ipartg,
type (matparam_struct_), dimension(nummat), intent(inout) mat_param )

Definition at line 35 of file lecstat.F.

37C-----------------------------------------------
38C M o d u l e s
39C-----------------------------------------------
40 USE message_mod
41 USE mat_elem_mod
42 USE elbufdef_mod
43C-----------------------------------------------
44C I m p l i c i t T y p e s
45C-----------------------------------------------
46#include "implicit_f.inc"
47C-----------------------------------------------
48C C o m m o n B l o c k s
49C-----------------------------------------------
50#include "com01_c.inc"
51#include "com04_c.inc"
52#include "param_c.inc"
53#include "units_c.inc"
54#include "scr16_c.inc"
55#include "scr17_c.inc"
56C-----------------------------------------------
57C D u m m y A r g u m e n t s
58C-----------------------------------------------
59 INTEGER IPART(LIPART1,*),IPART_STATE(*),IPARTS(*),IPARTC(*),IPARTG(*)
60 INTEGER,INTENT(INOUT) :: IPM(NPROPMI,NUMMAT),IPARG(NPARG,*)
61C REAL
62 TYPE (ELBUF_STRUCT_), DIMENSION(NGROUP), TARGET :: ELBUF_TAB
63 TYPE (MATPARAM_STRUCT_) ,DIMENSION(NUMMAT) ,INTENT(INOUT) :: MAT_PARAM
64C-----------------------------------------------
65C L o c a l V a r i a b l e s
66C-----------------------------------------------
67 INTEGER I,IDPRT,K_STAT,J,IP,IPID,IGTYP,
68 . IFAIL,NLAY,FAIL_ID,MAT_ID,IL,IMAT,
69 . NFAIL,NG,ITY,NFT,IPRT
70 INTEGER MAT_CHECKED(NUMMAT)
71C-----------------------------------------------
72 iprt = 0
73 IF (nstatprt /= 0) THEN
74 mat_checked = 0
75 DO i=1,nstatprt
76 READ(iin,'(I10)') idprt
77 ip=0
78 DO j=1,npart
79 IF (ipart(4,j) == idprt)ip=j
80 ENDDO
81 IF (ip == 0) THEN
82 CALL ancmsg(msgid=119,anmode=aninfo,i1=idprt)
83 CALL arret(2)
84 ENDIF ! IF (IP==0)
85 ipart_state(ip)=1
86 !-------------
87 ! for /INISHE/FAIL, fail_ID in /FAIL card is mandatory
88 ! check if fail_ID is defined in failure model
89 !-------------
90 IF ( stat_c(8) == 1) THEN
91!---
92 DO ng=1,ngroup
93 ity = iparg(5,ng)
94 nft = iparg(3,ng)
95 ipid=ipart(2,ip) ! internal
96 IF (ity == 1 .or. ity == 3 .or. ity == 7) THEN
97 IF (ity == 1) iprt=iparts(1+nft)
98 IF (ity == 3) iprt=ipartc(1+nft)
99 IF (ity == 7) iprt=ipartg(1+nft)
100 IF ( iprt /= ip ) cycle
101!
102 nlay = elbuf_tab(ng)%NLAY
103!
104 DO il = 1,nlay
105 imat = elbuf_tab(ng)%BUFLY(il)%IMAT
106 nfail = elbuf_tab(ng)%BUFLY(il)%NFAIL
107 mat_id = ipm(1,imat) ! user mat ID
108 IF (mat_checked(imat) == 0 ) THEN
109 mat_checked(imat) = 1
110 DO ifail = 1,nfail
111 fail_id = mat_param(imat)%FAIL(ifail)%FAIL_ID
112 IF (fail_id == 0)
113 . CALL ancmsg(msgid=297,anmode=aninfo,i1=mat_id)
114 ENDDO ! DO IFAIL
115 ENDIF ! IF (MAT_CHECKED(IMAT) == 0 )
116 ENDDO ! DO IL = 1,NLAY
117 ENDIF ! IF (ITY == 1 .or. ITY == 3 .or. ITY == 7)
118 ENDDO ! DO NG=1,NGROUP
119C---
120 ENDIF ! IF ( part de coque & STAT_C(8) = 1) THEN
121 END DO ! DO I=1,NSTATPRT
122 ELSEIF (nstatall /= 0) THEN
123 DO j=1,npart
124 ipart_state(j) = 1
125 END DO
126 ENDIF ! IF (NSTATPRT /= 0)
127C
128 RETURN
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 arret(nn)
Definition arret.F:87