subroutine da_qc_atms (it, i, nchan, ob, iv) 1,16
!---------------------------------------------------------------------------
! Purpose: perform quality control for atms data.
! Dongpm modified from atms 20120424
!---------------------------------------------------------------------------
implicit none
integer, intent(in) :: it ! outer loop count
integer, intent(in) :: i ! sensor index.
integer, intent(in) :: nchan ! number of channel
type (y_type), intent(in) :: ob ! Observation structure.
type (iv_type), intent(inout) :: iv ! O-B structure.
! local variables
integer :: n,scanpos,k,isflg,ios,fgat_rad_unit
logical :: lmix
real :: si
! real :: satzen
integer :: ngood(nchan),nrej(nchan),nrej_omb_abs(nchan), &
nrej_omb_std(nchan), &
nrej_mixsurface,nrej_windowchanl, nrej_si, &
nrej_clw,nrej_topo, num_proc_domain, &
nrej_limb
character(len=30) :: filename
if (trace_use) call da_trace_entry
("da_qc_atms")
ngood(:) = 0
nrej(:) = 0
nrej_omb_abs(:) = 0
nrej_omb_std(:) = 0
nrej_mixsurface = 0
nrej_windowchanl= 0
nrej_si = 0
nrej_clw = 0
nrej_topo = 0
nrej_limb = 0
num_proc_domain = 0
do n= iv%instid(i)%info%n1,iv%instid(i)%info%n2
if (iv%instid(i)%info%proc_domain(1,n)) &
num_proc_domain = num_proc_domain + 1
! 0.0 initialise QC by flags assuming good obs
!---------------------------------------------
iv%instid(i)%tb_qc(:,n) = qc_good
! a. reject all channels over mixture surface type
!------------------------------------------------------
isflg = iv%instid(i)%isflg(n)
lmix = (isflg==4) .or. (isflg==5) .or. (isflg==6) .or. (isflg==7)
if (lmix) then
iv%instid(i)%tb_qc(:,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_mixsurface = nrej_mixsurface + 1
end if
! b. reject channels 1~5 and 16~17 over land/sea-ice/snow
!------------------------------------------------------
if (isflg > 0) then
iv%instid(i)%tb_qc(1:5,n) = qc_bad
iv%instid(i)%tb_qc(16:17,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_windowchanl = nrej_windowchanl + 1
! reject whole pixel if not over sea for global case
if (global) iv%instid(i)%tb_qc(:,n) = qc_bad
if (only_sea_rad) iv%instid(i)%tb_qc(:,n) = qc_bad
end if
! c. reject channels 13,14(above top model 10mb)
!------------------------------------------------------
iv%instid(i)%tb_qc(13:14,n) = qc_bad
! reject limb obs
!------------------------------------------------------
scanpos = iv%instid(i)%scanpos(n)
if (scanpos <= 0 .or. scanpos >= 97) then
iv%instid(i)%tb_qc(:,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_limb = nrej_limb + 1
end if
! satzen = rad%satzen
! if (abs(satzen) > 45.0) iv%instid(i)%tb_qc(:,n) = qc_bad
! d. check precipitation
!-----------------------------------------------------------
if (ob%instid(i)%tb(1,n) > 0.0) then
si = iv%instid(i)%tb_inv(1,n)
if (isflg .eq.0 .AND. si >= 3.0) then
iv%instid(i)%tb_qc(1:8,n) = qc_bad
iv%instid(i)%cloud_flag(1:8,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_si = nrej_si + 1
elseif (isflg .gt.0 .AND. si >= 1.5) then
iv%instid(i)%tb_qc(1:8,n) = qc_bad
iv%instid(i)%cloud_flag(1:8,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_si = nrej_si + 1
end if
end if
!ECMWF for atms
if (ob%instid(i)%tb(3,n) > 0.0) then
si = abs(iv%instid(i)%tb_inv(3,n))
if (si >= 5.0) then
iv%instid(i)%tb_qc(1:8,n) = qc_bad
iv%instid(i)%cloud_flag(1:8,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_si = nrej_si + 1
endif
endif
if (ob%instid(i)%tb(16,n) > 0.0 .and. &
ob%instid(i)%tb(17,n) > 0.0) then
si = ob%instid(i)%tb(16,n) - ob%instid(i)%tb(17,n)
if (si >= 3.0) then
iv%instid(i)%tb_qc(16:22,n) = qc_bad
iv%instid(i)%cloud_flag(16:22,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_si = nrej_si + 1
end if
end if
!ECMWF for atms
if (ob%instid(i)%tb(3,n) > 0.0) then
si = abs(iv%instid(i)%tb_inv(3,n))
if (si >= 5.0) then
iv%instid(i)%tb_qc(16:22,n) = qc_bad
iv%instid(i)%cloud_flag(16:22,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_si = nrej_si + 1
endif
endif
if (iv%instid(i)%clwp(n) >= 0.2) then
iv%instid(i)%tb_qc(:,n) = qc_bad
iv%instid(i)%cloud_flag(:,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_clw = nrej_clw + 1
end if
! 3.1 Estimate Cloud Liquid Water (CLW) in mm over sea
! (Grody etal. 2001, JGR, Equation 5b,7c,7d,9)
!---------------------------------------------------------
! if (isflg == 0) then
! coszen = cos(iv%instid(i)%satzen(n))
! d0 = 8.24-(2.622-1.846*coszen)*coszen
! d1 = 0.754
! d2 = -2.265
! ts = iv%instid(i)%ts(n)
! tb1 = ob%instid(i)%tb(1,n)
! tb2 = ob%instid(i)%tb(2,n)
! clw = coszen*(d0+d1*log(ts-tb1)+d2*log(ts-tb2))
! clw = clw - 0.03
! end if
! e. check surface height/pressure
!-----------------------------------------------------------
! sfchgt = ivrad%info(n)%elv
! if (sfchgt >=) then
! else
! end if
if ((isflg .ne. 0) .and. (iv%instid(i)%ps(n) < 850.0)) then
iv%instid(i)%tb_qc(6,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_topo = nrej_topo + 1
end if
if ((isflg .ne. 0) .and. (iv%instid(i)%ps(n) < 800.0)) then
iv%instid(i)%tb_qc(18,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_topo = nrej_topo + 1
end if
! g. check iuse
!-----------------------------------------------------------
do k = 1, nchan
if (satinfo(i)%iuse(k) .eq. -1) &
iv%instid(i)%tb_qc(k,n) = qc_bad
end do
! f. check innovation
!-----------------------------------------------------------
do k = 1, nchan
! absolute departure check
if (abs(iv%instid(i)%tb_inv(k,n)) > 15.0) then
iv%instid(i)%tb_qc(k,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_omb_abs(k) = nrej_omb_abs(k) + 1
end if
! relative departure check
if (use_error_factor_rad) then
iv%instid(i)%tb_error(k,n) = &
satinfo(i)%error_std(k)*satinfo(i)%error_factor(k)
else
iv%instid(i)%tb_error(k,n) = satinfo(i)%error_std(k)
end if
if (abs(iv%instid(i)%tb_inv(k,n)) > 3.0*iv%instid(i)%tb_error(k,n)) then
iv%instid(i)%tb_qc(k,n) = qc_bad
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej_omb_std(k) = nrej_omb_std(k) + 1
end if
! final QC decsion
if (iv%instid(i)%tb_qc(k,n) == qc_bad) then
iv%instid(i)%tb_error(k,n) = 500.0
if (iv%instid(i)%info%proc_domain(1,n)) &
nrej(k) = nrej(k) + 1
else
if (iv%instid(i)%info%proc_domain(1,n)) &
ngood(k) = ngood(k) + 1
end if
end do ! chan
end do ! end loop pixel
! Do inter-processor communication to gather statistics.
call da_proc_sum_int
(num_proc_domain)
call da_proc_sum_int
(nrej_mixsurface)
call da_proc_sum_int
(nrej_windowchanl)
call da_proc_sum_int
(nrej_si )
call da_proc_sum_int
(nrej_clw)
call da_proc_sum_int
(nrej_topo)
call da_proc_sum_int
(nrej_limb)
call da_proc_sum_ints
(nrej_omb_abs(:))
call da_proc_sum_ints
(nrej_omb_std(:))
call da_proc_sum_ints
(nrej(:))
call da_proc_sum_ints
(ngood(:))
if (rootproc) then
if (num_fgat_time > 1) then
write(filename,'(i2.2,a,i2.2)') it,'_qcstat_'//trim(iv%instid(i)%rttovid_string)//'_',iv%time
else
write(filename,'(i2.2,a)') it,'_qcstat_'//trim(iv%instid(i)%rttovid_string)
end if
call da_get_unit
(fgat_rad_unit)
open(fgat_rad_unit,file=trim(filename),form='formatted',iostat=ios)
if (ios /= 0) then
write(unit=message(1),fmt='(A,A)') 'error opening the output file ', filename
call da_error
(__FILE__,__LINE__,message(1:1))
end if
write(fgat_rad_unit, fmt='(/a/)') ' Quality Control Statistics for '//iv%instid(i)%rttovid_string
write(fgat_rad_unit,'(a20,i7)') ' num_proc_domain = ', num_proc_domain
write(fgat_rad_unit,'(a20,i7)') ' nrej_mixsurface = ', nrej_mixsurface
write(fgat_rad_unit,'(a20,i7)') ' nrej_windowchanl = ', nrej_windowchanl
write(fgat_rad_unit,'(a20,i7)') ' nrej_si = ', nrej_si
write(fgat_rad_unit,'(a20,i7)') ' nrej_clw = ', nrej_clw
write(fgat_rad_unit,'(a20,i7)') ' nrej_topo = ', nrej_topo
write(fgat_rad_unit,'(a20,i7)') ' nrej_limb = ', nrej_limb
write(fgat_rad_unit,'(a20)') ' nrej_omb_abs(:) = '
write(fgat_rad_unit,'(10i7)') nrej_omb_abs(:)
write(fgat_rad_unit,'(a20)') ' nrej_omb_std(:) = '
write(fgat_rad_unit,'(10i7)') nrej_omb_std(:)
write(fgat_rad_unit,'(a20)') ' nrej(:) = '
write(fgat_rad_unit,'(10i7)') nrej(:)
write(fgat_rad_unit,'(a20)') ' ngood(:) = '
write(fgat_rad_unit,'(10i7)') ngood(:)
close(fgat_rad_unit)
call da_free_unit
(fgat_rad_unit)
end if
if (trace_use) call da_trace_exit
("da_qc_atms")
end subroutine da_qc_atms