2015-12-29 18:52:55 -05:00
|
|
|
subroutine multimode_decoder(ss,id2,params,nfsample)
|
2014-04-19 22:44:47 -04:00
|
|
|
|
2015-02-05 17:07:19 -05:00
|
|
|
!$ use omp_lib
|
2015-12-27 10:40:57 -05:00
|
|
|
use prog_args
|
|
|
|
use timer_module, only: timer
|
2015-12-29 18:52:55 -05:00
|
|
|
use jt4_decode
|
|
|
|
use jt65_decode
|
|
|
|
use jt9_decode
|
2015-02-04 10:34:46 -05:00
|
|
|
|
2015-12-17 15:29:55 -05:00
|
|
|
include 'jt9com.f90'
|
2015-12-27 10:40:57 -05:00
|
|
|
include 'timer_common.inc'
|
|
|
|
|
2015-12-29 18:52:55 -05:00
|
|
|
type, extends(jt4_decoder) :: counting_jt4_decoder
|
|
|
|
integer :: decoded
|
|
|
|
end type counting_jt4_decoder
|
|
|
|
|
|
|
|
type, extends(jt65_decoder) :: counting_jt65_decoder
|
|
|
|
integer :: decoded
|
|
|
|
end type counting_jt65_decoder
|
|
|
|
|
|
|
|
type, extends(jt9_decoder) :: counting_jt9_decoder
|
|
|
|
integer :: decoded
|
|
|
|
end type counting_jt9_decoder
|
|
|
|
|
2014-04-19 22:44:47 -04:00
|
|
|
real ss(184,NSMAX)
|
2015-12-29 18:52:55 -05:00
|
|
|
logical baddata,newdat65,newdat9
|
2014-04-19 22:44:47 -04:00
|
|
|
integer*2 id2(NTMAX*12000)
|
2015-12-17 15:29:55 -05:00
|
|
|
type(params_block) :: params
|
2014-04-19 22:44:47 -04:00
|
|
|
real*4 dd(NTMAX*12000)
|
|
|
|
save
|
2015-12-29 18:52:55 -05:00
|
|
|
type(counting_jt4_decoder) :: my_jt4
|
|
|
|
type(counting_jt65_decoder) :: my_jt65
|
|
|
|
type(counting_jt9_decoder) :: my_jt9
|
2014-04-19 22:44:47 -04:00
|
|
|
|
2015-12-17 15:29:55 -05:00
|
|
|
if(mod(params%nranera,2).eq.0) ntrials=10**(params%nranera/2)
|
|
|
|
if(mod(params%nranera,2).eq.1) ntrials=3*10**(params%nranera/2)
|
|
|
|
if(params%nranera.eq.0) ntrials=0
|
2015-11-17 20:28:12 -05:00
|
|
|
|
2015-12-29 18:52:55 -05:00
|
|
|
rms=sqrt(dot_product(float(id2(300000:310000)), &
|
|
|
|
float(id2(300000:310000)))/10000.0)
|
2015-02-24 15:19:04 -05:00
|
|
|
if(rms.lt.2.0) go to 800
|
|
|
|
|
2015-12-29 18:52:55 -05:00
|
|
|
if (params%nagain) then
|
|
|
|
open(13,file=trim(temp_dir)//'/decoded.txt',status='unknown', &
|
2015-02-01 11:23:36 -05:00
|
|
|
position='append')
|
2015-12-29 18:52:55 -05:00
|
|
|
else
|
|
|
|
open(13,file=trim(temp_dir)//'/decoded.txt',status='unknown')
|
2014-04-19 22:44:47 -04:00
|
|
|
end if
|
2015-12-17 15:29:55 -05:00
|
|
|
if(params%nmode.eq.4 .or. params%nmode.eq.65) open(14,file=trim(temp_dir)//'/avemsg.txt', &
|
2015-02-01 11:23:36 -05:00
|
|
|
status='unknown')
|
2014-04-19 22:44:47 -04:00
|
|
|
|
2015-12-17 15:29:55 -05:00
|
|
|
if(params%nmode.eq.4) then
|
2015-04-22 13:48:03 -04:00
|
|
|
jz=52*nfsample
|
2015-12-29 18:52:55 -05:00
|
|
|
if(params%newdat) then
|
2015-04-22 13:48:03 -04:00
|
|
|
if(nfsample.eq.12000) call wav11(id2,jz,dd)
|
|
|
|
if(nfsample.eq.11025) dd(1:jz)=id2(1:jz)
|
|
|
|
endif
|
2015-12-29 18:52:55 -05:00
|
|
|
call my_jt4%decode(jt4_decoded,dd,jz,params%nutc,params%nfqso,params%ntol, &
|
|
|
|
params%emedelay,params%dttol,logical(params%nagain),params%ndepth, &
|
|
|
|
params%nclearave,params%minsync,params%minw,params%nsubmode,params%mycall, &
|
|
|
|
params%hiscall,params%hisgrid,params%nlist,params%listutc,jt4_average)
|
2015-04-22 13:48:03 -04:00
|
|
|
go to 800
|
|
|
|
endif
|
|
|
|
|
2014-04-19 22:44:47 -04:00
|
|
|
npts65=52*12000
|
|
|
|
if(baddata(id2,npts65)) then
|
|
|
|
nsynced=0
|
|
|
|
ndecoded=0
|
|
|
|
go to 800
|
|
|
|
endif
|
2016-01-01 10:35:00 -05:00
|
|
|
|
2015-12-17 15:29:55 -05:00
|
|
|
ntol65=params%ntol !### is this OK? ###
|
|
|
|
newdat65=params%newdat
|
|
|
|
newdat9=params%newdat
|
2014-04-19 22:44:47 -04:00
|
|
|
|
2015-12-29 18:52:55 -05:00
|
|
|
!$call omp_set_dynamic(.true.)
|
|
|
|
!$omp parallel sections num_threads(2) copyin(/timer_private/) shared(ndecoded) if(.true.) !iif() needed on Mac
|
2014-04-19 22:44:47 -04:00
|
|
|
|
2015-12-29 18:52:55 -05:00
|
|
|
!$omp section
|
2015-12-17 15:29:55 -05:00
|
|
|
if(params%nmode.eq.65 .or. (params%nmode.eq.(65+9) .and. params%ntxmode.eq.65)) then
|
2015-12-29 18:52:55 -05:00
|
|
|
! We're in JT65 mode, or should do JT65 first
|
|
|
|
if(newdat65) dd(1:npts65)=id2(1:npts65)
|
2015-12-17 15:29:55 -05:00
|
|
|
nf1=params%nfa
|
|
|
|
nf2=params%nfb
|
2015-02-01 15:11:10 -05:00
|
|
|
call timer('jt65a ',0)
|
2016-03-09 16:01:28 -05:00
|
|
|
call my_jt65%decode(jt65_decoded,dd,npts65,newdat65,params%nutc, &
|
|
|
|
nf1,nf2,params%nfqso,ntol65,params%nsubmode,params%minsync, &
|
|
|
|
logical(params%nagain),params%n2pass,logical(params%nrobust), &
|
|
|
|
ntrials,params%naggressive,params%ndepth,params%nclearave, &
|
|
|
|
params%mycall,params%hiscall,params%hisgrid,params%nexp_decode)
|
2015-02-01 15:11:10 -05:00
|
|
|
call timer('jt65a ',1)
|
2015-04-22 13:48:03 -04:00
|
|
|
|
2015-12-17 15:29:55 -05:00
|
|
|
else if(params%nmode.eq.9 .or. (params%nmode.eq.(65+9) .and. params%ntxmode.eq.9)) then
|
2015-12-29 18:52:55 -05:00
|
|
|
! We're in JT9 mode, or should do JT9 first
|
2015-02-04 10:34:46 -05:00
|
|
|
call timer('decjt9 ',0)
|
2015-12-29 18:52:55 -05:00
|
|
|
call my_jt9%decode(jt9_decoded,ss,id2,params%nutc,params%nfqso,newdat9,params%npts8, &
|
|
|
|
params%nfa,params%nfsplit,params%nfb,params%ntol,params%nzhsym, &
|
|
|
|
logical(params%nagain),params%ndepth,params%nmode)
|
2015-02-04 10:34:46 -05:00
|
|
|
call timer('decjt9 ',1)
|
|
|
|
endif
|
|
|
|
|
2015-12-29 18:52:55 -05:00
|
|
|
!$omp section
|
2015-12-17 15:29:55 -05:00
|
|
|
if(params%nmode.eq.(65+9)) then !Do the other mode (we're in dual mode)
|
|
|
|
if (params%ntxmode.eq.9) then
|
2015-12-29 18:52:55 -05:00
|
|
|
if(newdat65) dd(1:npts65)=id2(1:npts65)
|
2015-12-17 15:29:55 -05:00
|
|
|
nf1=params%nfa
|
|
|
|
nf2=params%nfb
|
2015-02-04 10:34:46 -05:00
|
|
|
call timer('jt65a ',0)
|
2016-03-09 16:01:28 -05:00
|
|
|
call my_jt65%decode(jt65_decoded,dd,npts65,newdat65,params%nutc, &
|
|
|
|
nf1,nf2,params%nfqso,ntol65,params%nsubmode,params%minsync, &
|
|
|
|
logical(params%nagain),params%n2pass,logical(params%nrobust), &
|
|
|
|
ntrials,params%naggressive,params%ndepth,params%nclearave, &
|
2015-12-29 18:52:55 -05:00
|
|
|
params%mycall,params%hiscall,params%hisgrid,params%nexp_decode)
|
2015-02-04 10:34:46 -05:00
|
|
|
call timer('jt65a ',1)
|
|
|
|
else
|
|
|
|
call timer('decjt9 ',0)
|
2015-12-29 18:52:55 -05:00
|
|
|
call my_jt9%decode(jt9_decoded,ss,id2,params%nutc,params%nfqso,newdat9,params%npts8,&
|
|
|
|
params%nfa,params%nfsplit,params%nfb,params%ntol,params%nzhsym, &
|
|
|
|
logical(params%nagain),params%ndepth,params%nmode)
|
2015-02-04 10:34:46 -05:00
|
|
|
call timer('decjt9 ',1)
|
|
|
|
end if
|
2014-04-19 22:44:47 -04:00
|
|
|
endif
|
|
|
|
|
2015-12-29 18:52:55 -05:00
|
|
|
!$omp end parallel sections
|
2015-02-01 11:23:36 -05:00
|
|
|
|
2015-12-29 18:52:55 -05:00
|
|
|
! JT65 is not yet producing info for nsynced, ndecoded.
|
|
|
|
ndecoded = my_jt4%decoded + my_jt65%decoded + my_jt9%decoded
|
2014-04-19 22:44:47 -04:00
|
|
|
800 write(*,1010) nsynced,ndecoded
|
|
|
|
1010 format('<DecodeFinished>',2i4)
|
|
|
|
call flush(6)
|
2015-04-22 13:48:03 -04:00
|
|
|
close(13)
|
2015-12-17 15:29:55 -05:00
|
|
|
if(params%nmode.eq.4 .or. params%nmode.eq.65) close(14)
|
2014-04-19 22:44:47 -04:00
|
|
|
|
|
|
|
return
|
2015-12-29 18:52:55 -05:00
|
|
|
|
|
|
|
contains
|
|
|
|
|
2016-03-09 16:01:28 -05:00
|
|
|
subroutine jt4_decoded(this,utc,snr,dt,freq,have_sync,sync,is_deep, &
|
|
|
|
decoded,qual,ich,is_average,ave)
|
2015-12-29 18:52:55 -05:00
|
|
|
implicit none
|
|
|
|
class(jt4_decoder), intent(inout) :: this
|
|
|
|
integer, intent(in) :: utc
|
|
|
|
integer, intent(in) :: snr
|
|
|
|
real, intent(in) :: dt
|
|
|
|
integer, intent(in) :: freq
|
|
|
|
logical, intent(in) :: have_sync
|
|
|
|
logical, intent(in) :: is_deep
|
|
|
|
character(len=1), intent(in) :: sync
|
|
|
|
character(len=22), intent(in) :: decoded
|
|
|
|
real, intent(in) :: qual
|
|
|
|
integer, intent(in) :: ich
|
|
|
|
logical, intent(in) :: is_average
|
|
|
|
integer, intent(in) :: ave
|
|
|
|
|
|
|
|
character*2 :: cqual
|
|
|
|
|
|
|
|
if (have_sync) then
|
|
|
|
if (int(qual).gt.0) then
|
|
|
|
write(cqual, '(i2)') int(qual)
|
|
|
|
if (ave.gt.0) then
|
2016-03-09 16:01:28 -05:00
|
|
|
write(*,1000) utc,snr,dt,freq,sync,decoded,cqual, &
|
2015-12-29 18:52:55 -05:00
|
|
|
char(ichar('A')+ich-1), ave
|
|
|
|
else
|
2016-03-09 16:01:28 -05:00
|
|
|
write(*,1000) utc,snr,dt,freq,sync,decoded,cqual, &
|
|
|
|
char(ichar('A')+ich-1)
|
2015-12-29 18:52:55 -05:00
|
|
|
end if
|
|
|
|
else
|
2016-03-09 16:01:28 -05:00
|
|
|
write(*,1000) utc,snr,dt,freq,sync,decoded,' *', &
|
|
|
|
char(ichar('A')+ich-1)
|
2015-12-29 18:52:55 -05:00
|
|
|
end if
|
|
|
|
else
|
|
|
|
write(*,1000) utc ,snr, dt, freq
|
|
|
|
end if
|
|
|
|
1000 format(i4.4,i4,f5.2,i5,1x,a1,1x,a22,a2,1x,a1,i3)
|
|
|
|
select type(this)
|
|
|
|
type is (counting_jt4_decoder)
|
|
|
|
this%decoded = this%decoded + 1
|
|
|
|
end select
|
|
|
|
end subroutine jt4_decoded
|
|
|
|
|
|
|
|
subroutine jt4_average (this, used, utc, sync, dt, freq, flip)
|
|
|
|
implicit none
|
|
|
|
class(jt4_decoder), intent(inout) :: this
|
|
|
|
logical, intent(in) :: used
|
|
|
|
integer, intent(in) :: utc
|
|
|
|
real, intent(in) :: sync
|
|
|
|
real, intent(in) :: dt
|
|
|
|
integer, intent(in) :: freq
|
|
|
|
logical, intent(in) :: flip
|
|
|
|
|
2015-12-30 09:57:50 -05:00
|
|
|
character(len=1) :: cused, csync
|
2015-12-29 18:52:55 -05:00
|
|
|
|
2015-12-30 09:57:50 -05:00
|
|
|
cused = '.'
|
|
|
|
csync = '*'
|
2015-12-29 18:52:55 -05:00
|
|
|
if (used) cused = '$'
|
|
|
|
if (flip) csync = '$'
|
|
|
|
write(14,1000) cused,utc,sync,dt,freq,csync
|
|
|
|
1000 format(a1,i5.4,f6.1,f6.2,i6,1x,a1)
|
|
|
|
end subroutine jt4_average
|
|
|
|
|
2016-03-09 16:01:28 -05:00
|
|
|
subroutine jt65_decoded(this,utc,sync,snr,dt,freq,drift,decoded,ft, &
|
|
|
|
qual,nsmo,nsum,minsync,nsubmode,naggressive)
|
|
|
|
|
2015-12-29 18:52:55 -05:00
|
|
|
use jt65_decode
|
|
|
|
implicit none
|
|
|
|
|
|
|
|
class(jt65_decoder), intent(inout) :: this
|
|
|
|
integer, intent(in) :: utc
|
|
|
|
real, intent(in) :: sync
|
|
|
|
integer, intent(in) :: snr
|
|
|
|
real, intent(in) :: dt
|
|
|
|
integer, intent(in) :: freq
|
|
|
|
integer, intent(in) :: drift
|
|
|
|
character(len=22), intent(in) :: decoded
|
|
|
|
integer, intent(in) :: ft
|
|
|
|
integer, intent(in) :: qual
|
2016-03-09 16:01:28 -05:00
|
|
|
integer, intent(in) :: nsmo
|
|
|
|
integer, intent(in) :: nsum
|
|
|
|
integer, intent(in) :: minsync
|
|
|
|
integer, intent(in) :: nsubmode
|
|
|
|
integer, intent(in) :: naggressive
|
|
|
|
|
|
|
|
integer nft,nsmo2,nsum2
|
|
|
|
character*3 ctail
|
|
|
|
character*36 c
|
|
|
|
data c/'0123456789ABCDEFGHIJKLMNOPQRSTUVWXYZ'/
|
|
|
|
|
|
|
|
!$omp critical(decode_results)
|
|
|
|
! write(*,3301) ft,qual,nsmo,nsum,minsync,naggressive,sync !###
|
|
|
|
!3301 format('decoded.f90:',6i3,f5.1) !###
|
|
|
|
|
|
|
|
if(int(sync).lt.minsync) then
|
|
|
|
write(*,1010) utc,snr,dt,freq
|
2016-03-07 15:00:23 -05:00
|
|
|
else
|
2016-03-09 16:01:28 -05:00
|
|
|
ctail=' '
|
|
|
|
if(naggressive.gt.0 .and. ft.gt.0) then
|
|
|
|
ctail(1:1)='~'
|
|
|
|
if(ft.eq.1) ctail(1:1)='*'
|
|
|
|
ctail(2:2)=c(nsum+1:nsum+1)
|
|
|
|
if(nsubmode.gt.0) ctail(3:3)=c(nsmo+1:nsmo+1)
|
|
|
|
endif
|
2016-03-10 09:25:22 -05:00
|
|
|
write(*,1010) utc,snr,dt,freq,'#',decoded,ctail
|
2016-03-09 16:01:28 -05:00
|
|
|
1010 format(i4.4,i4,f5.1,i5,1x,a1,1x,a22,a3)
|
2016-03-07 15:00:23 -05:00
|
|
|
endif
|
2016-03-09 16:01:28 -05:00
|
|
|
|
2016-03-07 15:00:23 -05:00
|
|
|
write(13,1012) utc,nint(sync),snr,dt,float(freq),drift,decoded,ft,nsmo
|
|
|
|
1012 format(i4.4,i4,i5,f6.1,f8.0,i4,3x,a22,' JT65',i4,i2)
|
2015-12-29 18:52:55 -05:00
|
|
|
call flush(6)
|
2015-12-30 20:30:31 -05:00
|
|
|
|
2016-03-09 16:01:28 -05:00
|
|
|
!$omp end critical(decode_results)
|
2015-12-29 18:52:55 -05:00
|
|
|
select type(this)
|
|
|
|
type is (counting_jt65_decoder)
|
|
|
|
this%decoded = this%decoded + 1
|
|
|
|
end select
|
|
|
|
end subroutine jt65_decoded
|
|
|
|
|
|
|
|
subroutine jt9_decoded (this, utc, sync, snr, dt, freq, drift, decoded)
|
|
|
|
use jt9_decode
|
|
|
|
implicit none
|
|
|
|
|
|
|
|
class(jt9_decoder), intent(inout) :: this
|
|
|
|
integer, intent(in) :: utc
|
|
|
|
real, intent(in) :: sync
|
|
|
|
integer, intent(in) :: snr
|
|
|
|
real, intent(in) :: dt
|
|
|
|
real, intent(in) :: freq
|
|
|
|
integer, intent(in) :: drift
|
|
|
|
character(len=22), intent(in) :: decoded
|
|
|
|
|
|
|
|
!$omp critical(decode_results)
|
|
|
|
write(*,1000) utc,snr,dt,nint(freq),decoded
|
|
|
|
1000 format(i4.4,i4,f5.1,i5,1x,'@',1x,a22)
|
|
|
|
write(13,1002) utc,nint(sync),snr,dt,freq,drift,decoded
|
|
|
|
1002 format(i4.4,i4,i5,f6.1,f8.0,i4,3x,a22,' JT9')
|
|
|
|
call flush(6)
|
|
|
|
!$omp end critical(decode_results)
|
|
|
|
select type(this)
|
|
|
|
type is (counting_jt9_decoder)
|
|
|
|
this%decoded = this%decoded + 1
|
|
|
|
end select
|
|
|
|
end subroutine jt9_decoded
|
|
|
|
|
|
|
|
end subroutine multimode_decoder
|