Go to the documentation of this file.
3 INTEGER,
PARAMETER :: INT16 = selected_int_kind(4)
10 INTEGER,
intent(in) :: LUN_IN
11 INTEGER,
intent(out) :: I_RET
12 CHARACTER (LEN = 1000) :: FINAV
15 OPEN(lun_in,file=finav,access=
'stream',status=
'old', &
16 & form=
'unformatted',action=
'read', iostat=ios)
25 INTEGER,
intent(in) :: LUN_OUT
26 INTEGER,
intent(out) :: I_RET
27 CHARACTER (LEN = 1000) :: FOCUB
28 COMMON /outcube/ focub
30 OPEN(lun_out,file=focub,access=
'stream', status=
'unknown', &
31 & form=
'unformatted',action=
'write', iostat=ios)
40 INTEGER,
intent(in) :: LUN_VAP
41 INTEGER,
intent(out) :: I_RET
42 CHARACTER (LEN = 1000) :: FOH2O
43 COMMON /outh2ovap/ foh2o
45 OPEN(lun_vap,file=foh2o,access=
'stream',status=
'unknown', &
46 & form=
'unformatted',action=
'write', iostat=ios)
55 SUBROUTINE rd_slice(LUN_IN,NSAMPS,NBANDS,SORDER,BUFFER)
57 INTEGER,
intent(in) :: LUN_IN,NSAMPS,NBANDS,SORDER
58 INTEGER(INT16),
DIMENSION(NBANDS*NSAMPS),
intent(out) :: BUFFER
60 INTEGER(INT16),
DIMENSION(NSAMPS,NBANDS) :: BUFFER_BIL
61 INTEGER(INT16),
DIMENSION(NBANDS,NSAMPS) :: BUFFER_BIP
66 buffer_bil = reshape(buffer, (/ nsamps, nbands /) )
68 buffer = reshape(buffer_bip, (/nbands*nsamps/))
76 SUBROUTINE wt_slice(LUN_OUT,NSAMPS,NBANDS,SORDER,BUFFER)
78 INTEGER,
intent(in) :: LUN_OUT,NSAMPS,NBANDS,SORDER
80 INTEGER(INT16),
DIMENSION(NBANDS*NSAMPS),
intent(inout) :: BUFFER
82 INTEGER(INT16),
DIMENSION(NBANDS,NSAMPS) :: BUFFER_BIP
83 INTEGER(INT16),
DIMENSION(NSAMPS,NBANDS) :: BUFFER_BIL
85 IF(sorder == 1)
WRITE(lun_out) buffer
88 buffer_bip = reshape(buffer, (/nbands,nsamps/))
90 buffer = reshape(buffer_bil, (/nbands*nsamps/))
99 SUBROUTINE wt_line(LUN_VAP,NSAMPS,H2OBUF)
101 INTEGER,
intent(in) :: LUN_VAP,NSAMPS
103 INTEGER(INT16),
DIMENSION(NSAMPS),
intent(inout) :: H2OBUF
105 WRITE(lun_vap) h2obuf
115 CLOSE(lun_in, status=
'keep')
123 CLOSE(lun_out, status=
'keep')
130 CLOSE(lun_vap, status=
'keep')
subroutine closeoutfile(LUN_OUT)
subroutine wt_line(LUN_VAP, NSAMPS, H2OBUF)
subroutine openinfile(LUN_IN, I_RET)
subroutine rd_slice(LUN_IN, NSAMPS, NBANDS, SORDER, BUFFER)
subroutine wt_slice(LUN_OUT, NSAMPS, NBANDS, SORDER, BUFFER)
subroutine closevapfile(LUN_VAP)
subroutine closeinfile(LUN_IN)
subroutine openvapfile(LUN_VAP, I_RET)
subroutine openoutfile(LUN_OUT, I_RET)
void transpose(float *in[], float *out[])