OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
buserini.F File Reference
#include "implicit_f.inc"
#include "com01_c.inc"
#include "param_c.inc"
#include "scr17_c.inc"
#include "vect01_c.inc"

Go to the source code of this file.

Functions/Subroutines

subroutine buserini (elbuf_str, ixp, sigbeam, nsigbeam, ptbeam, igeo, nel)

Function/Subroutine Documentation

◆ buserini()

subroutine buserini ( type(elbuf_struct_), target elbuf_str,
integer, dimension(nixp,*) ixp,
sigbeam,
integer nsigbeam,
integer, dimension(*) ptbeam,
integer, dimension(npropgi,*) igeo,
integer nel )

Definition at line 33 of file buserini.F.

36C-----------------------------------------------
37C M o d u l e s
38C-----------------------------------------------
39 USE elbufdef_mod
40 USE message_mod
42C-----------------------------------------------
43C I m p l i c i t T y p e s
44C-----------------------------------------------
45#include "implicit_f.inc"
46C-----------------------------------------------
47C C o m m o n B l o c k s
48C-----------------------------------------------
49#include "com01_c.inc"
50#include "param_c.inc"
51#include "scr17_c.inc"
52#include "vect01_c.inc"
53C-----------------------------------------------
54C D u m m y A r g u m e n t s
55C-----------------------------------------------
56 INTEGER NEL,NSIGBEAM
57 INTEGER IXP(NIXP,*),PTBEAM(*),IGEO(NPROPGI,*)
59 . sigbeam(nsigbeam,*)
60 TYPE(ELBUF_STRUCT_), TARGET :: ELBUF_STR
61C------------------------------------------------------
62C L o c a l V a r i a b l e s
63C-----------------------------------------------
64 INTEGER :: I,II,JJ,NPTI,NU,NUVAR,NVARS,IPT,ILAY,IR,IS,PID,IPID,IGTYP
65 CHARACTER(LEN=NCHARTITLE)::TITR1
66 my_real, DIMENSION(:), POINTER :: uvar
67C=======================================================================
68! INITIAL USER VARIABLES
69 DO i=lft,llt
70 ii = nft+i
71 jj = ptbeam(ii)
72 IF (jj > 0) THEN
73 npti = nint(sigbeam(nvbeam + 2,jj))
74 igtyp = nint(sigbeam(nvbeam + 3,jj))
75 nvars = nint(sigbeam(nvbeam + 4,jj))
76!---
77! check NPT /= NPTI
78 IF (npt /= npti .and . npti /= 0) THEN
79 ipid=ixp(5,i)
80 pid=igeo(1,ixp(5,i))
81 CALL fretitl2(titr1,igeo(npropgi-ltitr+1,ipid),ltitr)
82 CALL ancmsg(msgid=1237,anmode=aninfo,msgtype=msgerror,i1=pid,i2=ixp(nixp,i),c1=titr1)
83 ENDIF
84
85 DO ipt=1,npt
86 ilay=1
87 ir = 1
88 is = 1
89 nuvar = elbuf_str%BUFLY(ilay)%NVAR_MAT
90 uvar => elbuf_str%BUFLY(ilay)%MAT(ir,is,ipt)%VAR
91 DO nu = 1,min(nvars,nuvar)
92 uvar((nu-1)*nel + i) = sigbeam(nvbeam + 4 + nu + (ipt -1)*nvars,jj)
93 ENDDO
94 ENDDO ! DO ILAY=1,NPT
95 ENDIF ! IF (JJ > 0)
96 ENDDO ! DO I=JFT,JLT
97C-----------
98 RETURN
#define my_real
Definition cppsort.cpp:32
#define min(a, b)
Definition macros.h:20
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