OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
insurf23.F File Reference
#include "implicit_f.inc"
#include "units_c.inc"
#include "com01_c.inc"
#include "com04_c.inc"
#include "scr03_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine insurf23 (nrt, msn, ir, irect, noint, surf_nodes, itab, msv, nrtnew, x, ntag)

Function/Subroutine Documentation

◆ insurf23()

subroutine insurf23 ( integer nrt,
integer msn,
integer ir,
integer, dimension(4,*) irect,
integer noint,
integer, dimension(nrt,4) surf_nodes,
integer, dimension(*) itab,
integer, dimension(*) msv,
integer nrtnew,
x,
integer, dimension(2*numnod+1), intent(inout) ntag )

Definition at line 33 of file insurf23.F.

36C-----------------------------------------------
37C M o d u l e s
38C-----------------------------------------------
39 USE format_mod , ONLY : fmw_4i
40C-----------------------------------------------
41C D e s c r i p t i o n
42C-----------------------------------------------
43C READING SURFACE AND NUMBERING SEGMENTS
44C IN : NRT NOMBRE DE RENSEIGNEMENTS A LIRE
45C OUT : IRECT
46C-----------------------------------------------
47C I m p l i c i t T y p e s
48C-----------------------------------------------
49#include "implicit_f.inc"
50C-----------------------------------------------
51C C o m m o n B l o c k s
52C-----------------------------------------------
53#include "units_c.inc"
54#include "com01_c.inc"
55#include "com04_c.inc"
56#include "scr03_c.inc"
57C-----------------------------------------------
58C D u m m y A r g u m e n t s
59C-----------------------------------------------
60 INTEGER NRT, NOINT, IR, MSN, NRTNEW
61 INTEGER IRECT(4,*), ITAB(*), MSV(*),SURF_NODES(NRT,4)
62 INTEGER, DIMENSION(2*NUMNOD+1), INTENT(INOUT) :: NTAG
63 my_real x(3,*)
64C-----------------------------------------------
65C L o c a l V a r i a b l e s
66C-----------------------------------------------
67 INTEGER I, N23, IT, J, NSGOLD,ITG,K,IR1,K4,N1,N2,N3,N4
68 my_real x13,y13,z13,x24,y24,z24,d1,d2
69C=======================================================================
70 nrtnew=0
71
72 i=1
73 DO j=1,nrt
74 n1=surf_nodes(j,1)
75 n2=surf_nodes(j,2)
76 n3=surf_nodes(j,3)
77 n4=surf_nodes(j,4)
78 nrtnew=nrtnew+1
79 irect(1,nrtnew)=n1
80 irect(2,nrtnew)=n2
81 irect(3,nrtnew)=n3
82 irect(4,nrtnew)=n4
83 ENDDO
84C-------
85 IF(ipri>=1) THEN
86 WRITE(iout,'(/,A,/)')' SEGMENTS USED FOR SURFACE DEFINITION'
87 k=1
88 k4=4
89 IF(n2d/=0)k4=2
90 DO i=1,nrtnew
91 WRITE(iout,fmt=fmw_4i)(itab(irect(k,i)),k=1,k4)
92 ENDDO
93 ENDIF
94 IF (nrtnew/=0) CALL count3(irect,msv,msn,nrtnew,ntag)
95C------------------------------------------------------------
96 RETURN
subroutine count3(irect, mnn, n, nrt, ntag)
Definition count3.F:33
#define my_real
Definition cppsort.cpp:32