45 INTEGER FUNCTION nintri(IEXT,ANTN,M,N,M1)
49#include "implicit_f.inc"
53 INTEGER iext, m, n, m1, antn(m,n)
78 INTEGER FUNCTION nintlst (LIST,NLIST,IX,NIX,NUMEL,MESS,
90#include "implicit_f.inc"
97 INTEGER nlist,,nix,numel
99 INTEGER list(*),ix(nix,*),index(*),ix1(*),ix2(*)
101 CHARACTER(LEN=NCHARTITLE) ::
TYPE,titr
105 INTEGER i, j,nel,nold,k,
111 CALL my_orders(0,iwork,list,index,nlist,1)
113 index(nlist+i) = list(index(i))
116 nold = index(nlist+1)
118 IF(nold/=index(nlist+i))k=k+1
119 list(k) = index(nlist+i)
120 nold = index(nlist+i)
130 CALL my_orders(0,iwork,ix2,index,numel,1)
132 ix1(i) = ix2(index(i))
145 DO WHILE(list(i)>ix1(j).AND.j<numel)
148 IF(list(i)==ix1(j))
THEN
169!||--- called by ------------------------------------------------------
176 INTEGER FUNCTION nintlst2 (LIST,NLIST,INDEXL,IX,NIX,NUMEL,
177 . MESS,IX1,IX2,INDEX,KK)
183#include "implicit_f.inc"
187 INTEGER nlist,kk,nix,numel
189 INTEGER list(*),indexl(*),ix(nix,*),index(*),ix1(*),ix2(*)
198 CALL my_orders(0,iwork,list,indexl,nlist,1)
206 CALL my_orders(0,iwork,ix2,index,numel,1)
208 ix1(i) = ix2(index(i))
221 DO WHILE(list(indexl(i))>ix1(j).AND.j<numel)
224 IF(list(indexl(i))==ix1(j))
THEN
225 list(indexl(i))=ix2(j)
226 ELSEIF(list(indexl(i))/=0)
THEN
238 . i1=list(indexl(i)))
267!|| hm_read_ebcs_propellant ../
starter/source/boundary_conditions/ebcs/hm_read_ebcs_propellant.f90
334#include "implicit_f.inc"
338#include "ngr2usr_c.inc"
342 INTEGER,
INTENT(IN) :: iu,igr(*),ngr
347 CHARACTER(LEN=NCHARKEY) :: key
348 CHARACTER(LEN=NCHARTITLE) :: titr
364 IF(iskip_ngr2usr_error==0)
THEN
367 . option_titr = titr,
378 iskip_ngr2usr_error = 0
415#include "implicit_f.inc"
421 TYPE (
group_) ,
DIMENSION(NGRNOD) :: igrnod
434 IF (iu == igrnod(i)%ID)
THEN
435 num = igrnod(i)%NENTITY
448 INTEGER FUNCTION grsize(IGU,IGRNOD,GRLEN)
456#include "implicit_f.inc"
460#include "com04_c.inc"
466 TYPE (
group_) ,
DIMENSION(NGRNOD) :: igrnod
475 IF (igu == igrnod(i)%ID)
THEN
476 grsize = igrnod(i)%NENTITY
504#include "implicit_f.inc"
510 TYPE (
group_) ,
DIMENSION(GRLEN) :: igrnod
519 IF (igu == igrnod(i)%ID)
THEN
545#include "implicit_f.inc"
551 TYPE (
group_) ,
DIMENSION(NGRELEM) :: igrelem
560 IF (igu == igrelem(i)%ID)
THEN
585#include "implicit_f.inc"
589#include "com04_c.inc"
593 INTEGER,
INTENT(IN)::igu,ngrelem
595 TYPE (
group_) ,
DIMENSION(NGRELEM) ,
INTENT(IN) :: igrelem
596 INTEGER,
INTENT(IN)::seatbelt_shell_to_spring(numelc,2)
605 IF (igu == igrelem(i)%ID)
THEN
606 DO j=1,igrelem(i)%NENTITY
607 ie=igrelem(i)%ENTITY(j)
608 IF(seatbelt_shell_to_spring(ie,1) /= 0)
610 IF(seatbelt_shell_to_spring(ie,2) /= 0)
626 1 IXS_S ,IXS_S_IND,IXQ_S,IXQ_S_IND,IXC_S,IXC_S_IND,
627 2 IXT_S ,IXT_S_IND,IXP_S,IXP_S_IND,IXR_S,IXR_S_IND,
628 3 IXTG_S,IXTG_S_IND,IXS,IXQ,IXC,IXT,IXP,IXR,IXTG,LENI)
633#include "implicit_f.inc"
637#include "com04_c.inc"
641 INTEGER IXS_S(*),IXS_S_IND(*),IXQ_S(*),IXQ_S_IND(*),IXC_S(*),
642 1 IXC_S_IND(*),IXT_S(*),IXT_S_IND(*),IXP_S(*),
643 2 IXP_S_IND(*),IXR_S(*),IXR_S_IND(*),
644 3 IXTG_S(*),IXTG_S_IND(*),
645 4 IXS(NIXS,*), IXQ(NIXQ,*), IXC(NIXC,*),
646 5 IXT(NIXT,*), IXP(NIXP,*), IXR(NIXR,*), IXTG(NIXTG,*),
651 INTEGER I, J,,NOLD,K,
653 INTEGER,
DIMENSION(:),
ALLOCATABLE :: INDEX
655 ALLOCATE(INDEX(LENI*2))
657 ixs_s_ind(i) = ixs(nixs,i)
659 CALL my_orders(0,iwork,ixs_s_ind,index,numels,1)
661 ixs_s(i) = ixs_s_ind(index(i))
664 ixs_s_ind(i) = index(i)
668 ixq_s_ind(i) = ixq(nixq,i)
670 CALL my_orders(0,iwork,ixq_s_ind,index,numelq,1)
672 ixq_s(i) = ixq_s_ind(index(i))
675 ixq_s_ind(i) = index(i)
679 ixc_s_ind(i) = ixc(nixc,i)
681 CALL my_orders(0,iwork,ixc_s_ind,index,numelc,1)
683 ixc_s(i) = ixc_s_ind(index(i))
686 ixc_s_ind(i) = index(i)
690 ixt_s_ind(i) = ixt(nixt,i)
692 CALL my_orders(0,iwork,ixt_s_ind,index,numelt,1)
694 ixt_s(i) = ixt_s_ind(index(i))
697 ixt_s_ind(i) = index(i)
701 ixp_s_ind(i) = ixp(nixp,i)
703 CALL my_orders(0,iwork,ixp_s_ind,index,numelp,1)
705 ixp_s(i) = ixp_s_ind(index(i))
708 ixp_s_ind(i) = index(i)
712 ixr_s_ind(i) = ixr(nixr,i)
714 CALL my_orders(0,iwork,ixr_s_ind,index,numelr,1)
716 ixr_s(i) = ixr_s_ind(index(i))
719 ixr_s_ind(i) = index(i)
723 ixtg_s_ind(i) = ixtg(nixtg,i)
725 CALL my_orders(0,iwork,ixtg_s_ind,index,numeltg,1)
727 ixtg_s(i) = ixtg_s_ind(index(i))
730 ixtg_s_ind(i) = index(i)
746#include "implicit_f.inc"
750 INTEGER ,numel, cur, last
755 INTEGER i, j, jinf, jsup
764 j=
min(cur,(last+cur)/2)
765 10
IF(jsup<=jinf.AND.(iu-ixx_s(j))/=0)
THEN
770 IF((iu-ixx_s(j))==0)
THEN
774 ELSE IF (iu-ixx_s(j)<0)
THEN
791!||--- called by ------------------------------------------------------
799 INTEGER FUNCTION nintlstn(LIST,NLIST,IXX_S,NIX,NUMEL,MESS,
800 . IXX_S_IND,INDEX,TYPE,ID,TITR)
807#include "implicit_f.inc"
811 INTEGER nlist,nix,numel
813 INTEGER list(*),ixx_s(*),index(*),ixx_s_ind(*)
815 CHARACTER(LEN=NCHARTITLE) :: titr
820 INTEGER i, j,nel,nold,k,
827 CALL my_orders(0,iwork,list,index,nlist,1)
829 index(nlist+i) = list(index(i))
832 nold = index(nlist+1)
834 IF(nold/=index(nlist+i))k=k+1
835 list(k) = index(nlist+i)
836 nold = index(nlist+i)
844 j=
user2sys(list(i),ixx_s,nix,j+1,numel)
879#include "implicit_f.inc"
885 TYPE (
group_) ,
DIMENSION(NGR) :: igr
subroutine damping(nodft, nodlt, v, vr, a, ar, damp, ms, in, igrnod, dim, itask, weight, tagslv_rby, wfext)
subroutine hm_preread_cload(numcld, igrnod, igrsurf, lsubmodel)
subroutine hm_read_ale_link(icode, iskew, itab, itabm1, ikine, igrnod, ibcslag, lag_ncf, lag_nkf, lag_nhf, ikine1lag, linale, lsubmodel, unitab)
subroutine hm_read_damp(dampr, igrnod, iskn, lsubmodel, unitab, snpc1, npc1, ndamp_vrel_rby, igrpart, damp_range_part)
subroutine hm_read_ebcs_gradp0(igrsurf, npc, multi_fvm, unitab, id, titr, lsubmodel, ebcs)
subroutine hm_read_ebcs_inip(igrsurf, multi_fvm, unitab, id, titr, lsubmodel, ebcs)
subroutine hm_read_ebcs_valvin(igrsurf, npc, multi_fvm, unitab, id, titr, lsubmodel, ebcs)
subroutine hm_read_ebcs_valvout(igrsurf, npc, multi_fvm, unitab, id, titr, lsubmodel, ebcs)
subroutine hm_read_inter_lagmul_type17(ipari, stfac, frigap, noint, igrbric, lsubmodel)
subroutine hm_read_inter_type01(ipari, stfac, frigap, igrsurf, lsubmodel, nsurf, noint, npari, nparir)
subroutine hm_read_inter_type12(ipari, stfac, frigap, noint, igrsurf, itab, itabm1, iskn, lsubmodel, unitab, sitab, sitabm1, npari, nparir, siskwn, liskn)
subroutine hm_read_inter_type20(ipari, stfac, frigap, noint, igrnod, igrsurf, igrslin, xfiltr, fric_p, unitab, lsubmodel, titr)
subroutine hm_read_pcyl(loads, igrsurf, nsensor, sensor_tab, table, iframe, unitab, lsubmodel, number_load_cyl)
subroutine setrb2on(ixs, ixc, ixtg, igrnod, igrnrb2, isoloff, isheoff, itrioff, itabm1, lsubmodel)
subroutine hm_read_rbe2(irbe2, lrbe2, itab, itabm1, igrnod, iskn, ikine, iddlevel, nom_opt, itagnd, icdns10, lsubmodel)
subroutine hm_read_rwall_spher(rwl, nprw, lprw, ifi, ms, v, itab, itabm1, x, ikine, igrnod, mfi, imerge, unitab, iddlevel, lsubmodel, rtrans, nom_opt, itagnd, nchspher, k, offs, ikine1)
subroutine lectranssub(x, igrnod, itab, itabm1, unitab, rtrans, lsubmodel, is_dyna)
void my_orders(int *mode, int *iwork, int *data, int *index, int *n, int *irecl)
integer, parameter nchartitle
integer, parameter ncharkey
integer function grsizen(igu, igrnod, grlen)
integer function nintlst(list, nlist, ix, nix, numel, mess, ix1, ix2, index, kk, type, id, titr)
integer function nintrigr(iext, igr, ngr)
integer function nintlstn(list, nlist, ixx_s, nix, numel, mess, ixx_s_ind, index, type, id, titr)
integer function ngr2usrn(iu, igrnod, ngrnod, num)
integer function nintlst2(list, nlist, indexl, ix, nix, numel, mess, ix1, ix2, index, kk)
integer function grsize_ele(igu, igrelem, ngrelem)
subroutine sortgroup(ixs_s, ixs_s_ind, ixq_s, ixq_s_ind, ixc_s, ixc_s_ind, ixt_s, ixt_s_ind, ixp_s, ixp_s_ind, ixr_s, ixr_s_ind, ixtg_s, ixtg_s_ind, ixs, ixq, ixc, ixt, ixp, ixr, ixtg, leni)
integer function grsize_ele_trans(igu, igrelem, ngrelem, seatbelt_shell_to_spring)
integer function grsize(igu, igrnod, grlen)
integer function ngr2usr(iu, igr, ngr)
integer function nintri(iext, antn, m, n, m1)
integer function user2sys(iu, ixx_s, nix, cur, last)
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)