38
39
40
42
43
44
45#include "implicit_f.inc"
46
47
48
49#include "com01_c.inc"
50#include "com04_c.inc"
51#include "scr15_c.inc"
52#include "param_c.inc"
53#include "units_c.inc"
54#include "sphcom.inc"
55
56
57
59 . x(*)
60 INTEGER IXS(*),IXQ(*),IXC(*),KXSP(NISP,*),IXSP(KVOISPH,*),
61 . IXTG(*),IXT(*),IXP(*),IXR(*),IPARG(NPARG,*)
62
63
64
66 & , DIMENSION(:,:), ALLOCATABLE :: d,xnorm
67 INTEGER, DIMENSION(:), ALLOCATABLE :: INVERT,IAD
68 CHARACTER*80 STR
69 CHARACTER CHANIM*3,FILNAM*12
70 INTEGER I, NBF, NBPART, MAGIC, J, FILEN,NNSLAG,
71 . IANIM, NBCSPH, N1, N2,
72 . CTEXT(81),IB,PROC
74 . cdg(3), s3000, scale,bufel(1)
75 REAL R4
76
77
78 s3000 = three1000
79
80
81
82 nbcsph = 0
83 DO i = 1, numsph
84
85 DO j = 1,
min(12,kxsp(4,i))
86 n1 = kxsp(3,i)
87 n2 = ixsp(j,i)
88 IF(n1<n2) THEN
89 nbcsph = nbcsph + 1
90 END IF
91 END DO
92 END DO
93
94
95
96 ALLOCATE(xnorm(3,numnod))
97 ALLOCATE(d(3,numnod))
98 ALLOCATE(
99 &
invert(numelc+numeltg+numelq+6*numels+numelt+numelp+numelr+
100 & nbcsph))
101 ALLOCATE(iad(nspmd+1))
102 DO i=1,3
103 DO j=1,numnod
104 d(i,j) = zero
105 END DO
106 END DO
107
108
109
110 ianim=0
111 WRITE(chanim,'(I3.3)')ianim
114
115 DO 1 i=1,filen
116 1 ctext(i)=ichar(filnam(i:i))
118
119 CALL open_c(ctext,filen,0)
120
121
122
123
124 nbpart = 0
125 nbpart = nspmd
126
128
129 nbf = 6*nnslag + numelq + numelc + numeltg + numelp
130 . + numelt + numelr + nfacx + nbcsph
131
132
133
134
135
136 magic = 21545
144
145 r4 = zero
147
148
149
151 CALL scanor(x,d,cdg,scale)
152
153
154
155 CALL parsor(x ,d ,xnorm ,iad ,cdg ,
156 . bufel,iparg,ixs ,ixq ,ixc ,
157 . ixtg ,ixt ,ixp ,ixr ,
invert,
158 . kxsp ,ixsp )
159
160
161
163
164
165
166 DO proc = 1, nspmd
167 WRITE(str,'(a17,i4)') 'domaine number : ',PROC
168 DO J = 1, 21
169 CTEXT(J)=ICHAR(STR(J:J))
170 END DO
171 CTEXT(22) = 0
172 CALL WRITE_C_C(CTEXT,81)
173 END DO
174
175
176
177 CALL XYZNOR(XNORM)
178
179
180
181 CTEXT(81)=0
182
183 CALL CLOSE_C
184
185
186
187 DEALLOCATE(XNORM)
188 DEALLOCATE(D)
189 DEALLOCATE(INVERT)
190 DEALLOCATE(IAD)
191
192 WRITE (IOUT,1000) FILNAM(1:FILEN)
193 WRITE (ISTDO,1000) FILNAM(1:FILEN)
194 1000 FORMAT (1X,'.. animation file:',1X,A,' written')
195
196 RETURN
subroutine invert(matrix, inverse, n, errorflag)
character(len=outfile_char_len) outfile_name
subroutine parsor(x, d, xnorm, iadd, cdg, bufel, iparg, ixs, ixq, ixc, ixtg, ixt, ixp, ixr, invert, kxsp, ixsp)
subroutine slagcnt(iparg, nslag)
subroutine scanor(x, d, cdg, scale)
void write_i_c(int *w, int *len)
void write_r_c(float *w, int *len)
void open_c(int *ifil, int *len, int *mod)