33 SUBROUTINE iniboltprel(IXS, IPRELOAD ,PRELOAD ,VPRELOAD, IFLAG_BPRELOAD)
42#include "implicit_f.inc"
47#include "boltpr_c.inc"
51 INTEGER IXS(NIXS,*), IPRELOAD(3,*), IFLAG_BPRELOAD(*)
53 . preload(6,*), vpreload(7,*)
57 INTEGER IE, STAT, IPL, NE,
59 INTEGER,
DIMENSION(:),
ALLOCATABLE ::ITRIS
60 INTEGER,
DIMENSION(:),
ALLOCATABLE ::INDEXS
61 INTEGER,
DIMENSION(:),
ALLOCATABLE ::KSYSUSRS
68 ALLOCATE (itris(numels) ,stat=stat)
70 CALL ancmsg(msgid=268,anmode=aninfo,
75 ALLOCATE (indexs(2*numels) ,stat=stat)
77 CALL ancmsg(msgid=268,anmode=aninfo,
82 ALLOCATE (ksysusrs(2*numels),stat=stat)
84 CALL ancmsg(msgid=268,anmode=aninfo,
93 vpreload(1:6,1:numels) = zero
96 itris(ie) = ixs(nixs,ie)
98 CALL my_orders(0,works,itris,indexs,numels,1)
101 ksysusrs(j) =ixs(nixs,ie)
102 ksysusrs(numels+j)=ie
105 DO ipl = 1,numpreload
108 ie=uel2sys(ne,ksysusrs,numels)
110 vpreload(1,ie) = preload(1,ipl)
111 vpreload(2,ie) = preload(2,ipl)
112 vpreload(3,ie) = preload(3,ipl)
113 vpreload(4,ie) = preload(4,ipl)
114 vpreload(5,ie) = preload(5,ipl)
115 vpreload(6,ie) = preload(6,ipl)
116 vpreload(7,ie) = ipreload(2,ipl)
122 j=uel2sys(ne,ksysusrs,numels)
123 iflag_bpreload(ie) =j
127 DEALLOCATE(ksysusrs,indexs,itris)
void my_orders(int *mode, int *iwork, int *data, int *index, int *n, int *irecl)
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)