42#include "implicit_f.inc"
50#include "tabsiz_c.inc"
55 INTEGER,
INTENT(IN) :: ITHVAR(SITHVAR) , NTHGRPMX
56 INTEGER,
INTENT(IN),
TARGET :: IPART(LIPART1,NPART+NTHPART),IPARTTH(18*(NPART+NTHPART))
57 TYPE(
subset_),
DIMENSION(NSUBS),
INTENT(IN) :: SUBSETS
61 INTEGER,
DIMENSION(:,:),
POINTER :: IPARTTHI
70 ipartthi => ipart(8:9,1:npart+nthpart)
72 . ipartthi ,nthgrpmx ,subsets ,10 ,th%SITHGRP ,th%SITHBUF)
75 ipartthi(1:2,1:npart+nthpart) => ipartth(1:2*(npart+nthpart))
80 ipartthi(1:2,1:npart+nthpart) => ipartth(2*(npart+nthpart)+1:4*(npart+nthpart))
85 ipartthi(1:2,1:npart+nthpart) => ipartth(4*(npart+nthpart)+1:6*(npart+nthpart))
87 . ipartthi ,nthgrpmx ,subsets ,3 ,th%SITHGRPC,th%SITHBUFC )
90 ipartthi(1:2,1:npart+nthpart) => ipartth(6*(npart+nthpart)+1:8*(npart+nthpart))
92 . ipartthi ,nthgrpmx ,subsets ,4 ,th%SITHGRPD,th%SITHBUFD )
95 ipartthi(1:2,1:npart+nthpart) => ipartth(8*(npart+nthpart)+
97 . ipartthi ,nthgrpmx ,subsets ,5 ,th%SITHGRPE,th%SITHBUFE )
100 ipartthi(1:2,1:npart+nthpart) => ipartth(10*(npart+nthpart)+1:12*(npart+nthpart))
102 . ipartthi ,nthgrpmx ,subsets ,6 ,th%SITHGRPF,th%SITHBUFF )
105 ipartthi(1:2,1:npart+nthpart) => ipartth(12*(npart+nthpart)+1:14*(npart+nthpart))
107 . ipartthi ,nthgrpmx ,subsets ,7 ,th%SITHGRPG,th%SITHBUFG )
110 ipartthi(1:2,1:npart+nthpart) => ipartth(14*(npart+nthpart)+1:16*(npart+nthpart))
112 . ipartthi ,nthgrpmx ,subsets ,8 ,th%SITHGRPH,th%SITHBUFH )
115 ipartthi(1:2,1:npart+nthpart) => ipartth(16*(npart+nthpart)+1:18*(npart+nthpart
117 . ipartthi ,nthgrpmx ,subsets ,9 ,th%SITHGRPI,th%SITHBUFI )
135 . IPARTTH ,NTHGRPMX ,SUBSETS ,ISUBVAR ,SITHGRP,SITHBUF)
145#include "implicit_f.inc"
149#include "com04_c.inc"
150#include "param_c.inc"
151#include "scr17_c.inc"
152#include "tabsiz_c.inc"
156 INTEGER,
INTENT(IN) :: SITHGRP,SITHBUF
157 INTEGER,
INTENT(IN) :: ITHGRP(NITHGR,*),ITHBUF(SITHBUF),ITHVAR(SITHVAR),
158 . ipart(lipart1,npart+nthpart),nthgrpmx,isubvar ,
159 . ipartth(2,npart+nthpart),nthgroup
160 TYPE(
subset_),
DIMENSION(NSUBS),
INTENT(IN) :: SUBSETS
164 INTEGER I, ID, II, TEMP_INT, MY_TH, NVAR, IAD, K,
165 INTEGER,
DIMENSION(NTHGROUP) :: IDX, IDS
166 CHARACTER(LEN=NCHARTITLE)::TITR
167 CHARACTER (LEN=255) :: VARNAME
194 CALL fretitl2(titr, ithgrp(nithgr-ltitr+1,my_th), ltitr)
195 IF (len_trim(titr) /= 0)
THEN
196 CALL qaprint(titr(1:len_trim(titr)),id,0.0_8)
198 CALL qaprint(
'A_TH_FAKE_NAME', id,0.0_8)
202 DO i = 1, nithgr-ltitr
203 WRITE(varname,
'(A,I0,A,I0)')
'ITHGRP_',i,
'_',my_th
204 temp_int = ithgrp(i,my_th)
205 IF ((temp_int /= 0).OR.(i == 2))
THEN
206 CALL qaprint(varname(1:len_trim(varname)),temp_int,0.0_8)
211 DO i = ithgrp(5,my_th), ithgrp(8,my_th)-1
212 WRITE(varname,'(a,i0,a,i0)
') 'ithbuf_
',I
214 IF (TEMP_INT /= 0) THEN
215 CALL QAPRINT(VARNAME(1:LEN_TRIM(VARNAME)),TEMP_INT,0.0_8)
222 ! Title of the object of the time history
223 TITR(1:nchartitle)=''
224 CALL FRETITL2(TITR, ITHBUF(ITHGRP(8,MY_TH)+K), 39)
225 IF (LEN_TRIM(TITR) /= 0) THEN
226 CALL QAPRINT(TITR(1:LEN_TRIM(TITR)),0,0.0_8)
228 CALL QAPRINT('a_th_object_fake_name
',0,0.0_8)
233 ! Time history saved variable
234 DO I = 0, ITHGRP(6,MY_TH)-1
236 WRITE(VARNAME,'(a,i0,a,i0)
') 'ithvar_
',(ITHGRP(9,MY_TH)+I-1)*10+K
237 TEMP_INT = ITHVAR((ITHGRP(9,MY_TH)+I-1)*10+K)
238 IF (TEMP_INT /= ICHAR(' ')) THEN
239 CALL QAPRINT(VARNAME(1:LEN_TRIM(VARNAME)),TEMP_INT,0.0_8)
244 ENDDO !next /TH (expect /TH/SUBS, /TH/PART, /THPART)
246 !--------------------!
249 !--------------------!
250 DO II = 1, NPART+NTHPART
256 ! IAD in the buffer table
259 ! Printing only is the number of variables is higher than 0
263 WRITE(VARNAME,'(a,i0,a,i0)
') 'part_id_
',ID
265 CALL QAPRINT(VARNAME(1:LEN_TRIM(VARNAME)),TEMP_INT,0.0_8)
268 TITR(1:nchartitle)=''
269 CALL FRETITL2(TITR,IPART(LIPART1-LTITR+1,II),40)
270 IF (LEN_TRIM(TITR) /= 0) THEN
271 CALL QAPRINT(TITR(1:LEN_TRIM(TITR)),ID,0.0_8)
273 CALL QAPRINT('a_part_fake_name
', ID,0.0_8)
276 ! Number of variables
277 WRITE(VARNAME,'(a,i0,a,i0)
') 'ipartth_
',1,'_
',II
279 CALL QAPRINT(VARNAME(1:LEN_TRIM(VARNAME)),TEMP_INT,0.0_8)
281 ! IAD in the buffer table
282 WRITE(VARNAME,'(a,i0,a,i0)
') 'ipartth_
',2,'_
',II
284 CALL QAPRINT(VARNAME(1:LEN_TRIM(VARNAME)),TEMP_INT,0.0_8)
286 ! Printing the corresponding buffer
287 DO I = IAD,NVAR+IAD-1
288 WRITE(VARNAME,'(a,i0,a,i0)
') 'ithbuf_
',I
290 IF (TEMP_INT /= 0) THEN
291 CALL QAPRINT(VARNAME(1:LEN_TRIM(VARNAME)),TEMP_INT,0.0_8)
296 ENDDO !next /TH/PART or /THPART
298 !--------------------!
300 !--------------------!
305 ! Number of variables
306 NVAR = SUBSETS(II)%NVARTH(ISUBVAR)
307 ! IAD in the buffer table
308 IAD = SUBSETS(II)%THIAD
310 ! Printing only is the number of variables is higher than 0
314 WRITE(VARNAME,'(a,i0,a,i0)
') 'subset_id_
',ID
315 CALL QAPRINT(VARNAME(1:LEN_TRIM(VARNAME)),TEMP_INT,0.0_8)
317 ! Title of the subset
318 TITR = SUBSETS(II)%TITLE
319 IF (LEN_TRIM(TITR) /= 0) THEN
320 CALL QAPRINT(TITR(1:LEN_TRIM(TITR)),ID,0.0_8)
322 CALL QAPRINT('a_subset_fake_name
', ID,0.0_8)
326 WRITE(VARNAME,'(a,i0,a,i0)
') 'subset_nvarth_
',II
328 CALL QAPRINT(VARNAME(1:LEN_TRIM(VARNAME)),TEMP_INT,0.0_8)
330 ! IAD in the buffer table
331 WRITE(VARNAME,'(a,i0,a,i0)
') 'subset_thiad_
',II
333 CALL QAPRINT(VARNAME(1:LEN_TRIM(VARNAME)),TEMP_INT,0.0_8)
335 ! Printing the corresponding buffer table
336 DO I = IAD,NVAR+IAD-1
337 WRITE(VARNAME,'(a,i0,a,i0)
') 'ithbuf_
',I
339 IF (TEMP_INT /= 0) THEN
340 CALL QAPRINT(VARNAME(1:LEN_TRIM(VARNAME)),TEMP_INT,0.0_8)