OpenRadioss 2025.1.11
OpenRadioss project
Loading...
Searching...
No Matches
stack_mod Module Reference

Data Types

type  stack_ply
type  stack_info_

Functions/Subroutines

subroutine stack_ply_alloc (stack, ipart_stack, npt_stack, ns_stack)

Variables

integer, dimension(:,:), allocatable ply_info

Function/Subroutine Documentation

◆ stack_ply_alloc()

subroutine stack_mod::stack_ply_alloc ( type(stack_ply), intent(inout) stack,
integer, intent(in) ipart_stack,
integer, intent(in) npt_stack,
integer, intent(in) ns_stack )

Definition at line 149 of file stack_mod.F.

150C-----------------------------------------------
151C M o d u l e s
152C-----------------------------------------------
153 USE message_mod
154C-----------------------------------------------------------------------
155 IMPLICIT NONE
156C-----------------------------------------------
157C m y _ r e a l
158C-----------------------------------------------
159#include "my_real.inc"
160C-----------------------------------------------
161C D u m m y A r g u m e n t s
162C-----------------------------------------------
163 TYPE(STACK_PLY),INTENT(INOUT) :: STACK
164 INTEGER,INTENT(IN) :: IPART_STACK
165 INTEGER,INTENT(IN) :: NPT_STACK
166 INTEGER,INTENT(IN) :: NS_STACK
167C-----------------------------------------------
168C L o c a l V a r i a b l e s
169C-----------------------------------------------
170 INTEGER IERR
171C-----------------------------------------------
172 IF(ipart_stack >0) THEN
173
174
175 ALLOCATE(stack%IGEO(4*npt_stack+2,ns_stack),stat=ierr)
176 IF(ierr/=0) THEN
177 CALL ancmsg(msgid=19,anmode=aninfo,c1='(/PROP/STACK/...)')
178 CALL arret(2)
179 ENDIF
180 stack%IGEO = 0
181
182 ALLOCATE(stack%GEO(6*npt_stack+1,ns_stack),stat=ierr)
183 IF(ierr/=0) THEN
184 CALL ancmsg(msgid=19,anmode=aninfo,c1='(/PROP/STACK/...)')
185 CALL arret(2)
186 ENDIF
187 stack%GEO = 0.0
188
189 ALLOCATE(stack%PM(20,ns_stack),stat=ierr)
190 IF(ierr/=0) THEN
191 CALL ancmsg(msgid=19,anmode=aninfo,c1='(/PROP/STACK/...)')
192 CALL arret(2)
193 ENDIF
194 stack%PM = 0.0
195 ELSE
196 ALLOCATE(stack%IGEO(0,0),stack%GEO(0,0),stack%PM(0,0))
197 ENDIF
198
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

Variable Documentation

◆ ply_info

integer, dimension(:,:), allocatable stack_mod::ply_info

Definition at line 133 of file stack_mod.F.

133 INTEGER , DIMENSION(:,:), ALLOCATABLE ::
134 . PLY_INFO