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

Go to the source code of this file.

Functions/Subroutines

subroutine mattab_usr2sys (titr, mat_id, ntable, table, ntabl, itable)

Function/Subroutine Documentation

◆ mattab_usr2sys()

subroutine mattab_usr2sys ( character(len=nchartitle), intent(in) titr,
integer, intent(in) mat_id,
integer, intent(in) ntable,
type(ttable), dimension(ntable) table,
integer, intent(in) ntabl,
integer, dimension(ntabl) itable )

Definition at line 38 of file mattab_usr2sys.F.

39C-----------------------------------------------
40C M o d u l e s
41C-----------------------------------------------
42 USE message_mod
43 USE table_mod
45C-----------------------------------------------
46C I m p l i c i t T y p e s
47C-----------------------------------------------
48#include "implicit_f.inc"
49C-----------------------------------------------
50C D u m m y A r g u m e n t s
51C-----------------------------------------------
52 INTEGER ,INTENT(IN) :: MAT_ID
53 INTEGER ,INTENT(IN) :: NTABLE ! total number of function tables
54 INTEGER ,INTENT(IN) :: NTABL ! number of function tables in material/failure law
55 INTEGER ,DIMENSION(NTABL) :: ITABLE ! Table IDs in material law
56 TYPE(TTABLE) ,DIMENSION(NTABLE) :: TABLE
57 CHARACTER(LEN=NCHARTITLE) ,INTENT(IN) :: TITR
58C-----------------------------------------------
59C L o c a l V a r i a b l e s
60C-----------------------------------------------
61 INTEGER I,J,TABL_ID,OK
62C=======================================================================
63 DO i=1,ntabl ! number of tables in material
64 tabl_id = itable(i)
65 IF (tabl_id > 0) THEN
66 ok = 0
67 DO j=1,ntable ! total number of tables
68 IF (tabl_id == table(j)%NOTABLE) THEN
69 itable(i) = j
70 ok = 1
71 EXIT
72 ENDIF
73 ENDDO
74 IF (ok == 0) THEN
75 CALL ancmsg(msgid=779, msgtype=msgerror, anmode=aninfo,
76 . i1=mat_id ,
77 . c1=titr,
78 . i2=tabl_id )
79 itable(i) = 0
80 ENDIF
81 ENDIF
82c
83 ENDDO ! I=1,NTABL
84c-----------
85 RETURN
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