<HTML> <BODY BGCOLOR=#ccccdd LINK=#0000aa VLINK=#0000ff ALINK=#ff0000 ><BASE TARGET="bottom_target"><PRE>
<A NAME='MODULE_WRITE'><A href='../../html_code/obsproc/module_write.F90.html#MODULE_WRITE' TARGET='top_target'><IMG SRC="../../gif/bar_purple.gif" border=0></A>

MODULE module_write 1

!-----------------------------------------------------------------------------!
! Output observations for intput into MM5 3D-VAR
!
!-----------------------------------------------------------------------------!
!  HISTORY: 
!
!         F. VANDENBERGHE, March 2001
!         01/13/2003 - Updated for Profiler obs.           S. R. H. Rizvi
!
!         02/04/2003 - Updated for Buoy     obs.           S. R. H. Rizvi
!
!         02/11/2003 - Reviewed and modified for Profiler
!                      and Buoy obs.                       Y.-R. Guo
!         11/11/2005 - Added output_prep to write conventional obs
!                      in PREPBUFR if that is chosen       J. F. Drake
!         06/30/2006 -   Updated for AIRS retrievals       Syed  RH  Rizvi
!   References:
!    http://www.emc.ncep.noaa.gov/mmb/data_processing/prepbufr.doc/document.htm
!                                                                      /table_2.htm
!------------------------------------------------------------------------------

  USE module_type
  USE module_func
  USE module_date
  USE module_decoded
  USE module_map

  INCLUDE 'constants.inc'
  INCLUDE '../../../inc/version_decl'

  REAL (kind=8), parameter             :: bufrlib_missing = 10.D10

CONTAINS

!------------------------------------------------------------------------------!
<A NAME='OUTPUT_SSMI_31'><A href='../../html_code/obsproc/module_write.F90.html#OUTPUT_SSMI_31' TARGET='top_target'><IMG SRC="../../gif/bar_red.gif" border=0></A>

SUBROUTINE output_ssmi_31 (max_number_of_obs, obs, number_of_obs, index, &amp; 1
                           nssmis, missing_r, time_analysis)

!-------------------------------------------------------------------------------
! Write observation at MM5 3D-VAR SYSTEM VERSION 2.0
! Output file is "obs_ascii.ccyymmddhh
!
! F. VANDENBERGHE, March 2000
!-------------------------------------------------------------------------------


  IMPLICIT NONE

  INTEGER,                                      INTENT (in) :: max_number_of_obs
  TYPE (report), DIMENSION (max_number_of_obs), INTENT (inout) :: obs
  INTEGER,                                      INTENT (in) :: number_of_obs
  INTEGER,       DIMENSION (max_number_of_obs), INTENT (in) :: index
  REAL,                                         INTENT (in) :: missing_r
  CHARACTER (LEN =  19),                        INTENT (in) :: time_analysis
  INTEGER,                                      INTENT (in) :: nssmis

  INTEGER                       :: n, loop_index, fm, i, ssmi_125, ssmi_126
  INTEGER                       :: nvalids, nwrites1, nwrites2
  LOGICAL                       :: connected
  CHARACTER (LEN = 80)          :: filename1, filename2
  CHARACTER (LEN = 120)         :: fmt_info, &amp;
                                   fmt_srfc, &amp;
                                   fmt_each
  REAL                          :: rew_cross, rns_cross
!------------------------------------------------------------------------------

  rew_cross=real(nestjx(idd)-1)
  rns_cross=real(nestix(idd)-1)

      if (nssmis == 0) then
        WRITE(0,'(A,/)') "No SSMI observations available."
        RETURN
      else
        ssmi_125 = 0
        ssmi_126 = 0
counts: &amp;
        DO n = 1, number_of_obs
        loop_index = index (n)
        IF (obs (loop_index)%info%discard ) THEN
          CYCLE  counts
        ELSE 
          READ (obs (loop_index) % info % platform (4:6), '(I3)') fm
          if (fm == 125) THEN
            ssmi_125 = ssmi_125 + 1
          else if (fm == 126) THEN
            ssmi_126 = ssmi_126 + 1
          endif
        ENDIF

        ENDDO counts
      endif

!------------------------------------------------------------------------------!
!     B. PRINT OBS USING THE NEW STRUCUTURE
!------------------------------------------------------------------------------!

      WRITE (0,'(A)')  &amp;
'------------------------------------------------------------------------------'


! 0.  FORMAT
! ==========

!     fmt_info = '(a12,1x,a19,1x,a40,1x,i6,3(f12.3,11x),6x,a5)'
     fmt_info = '(a12,1x,a19,1x,a40,1x,i6,3(f12.3,11x),6x,a40)'
     fmt_srfc = '(7(:,f12.3,i4,f7.2))'
     fmt_each = '(3(f12.3,i4,f7.2),11x,3(f12.3,i4,f7.2),11x,1(f12.3,i4,f7.2))'


! 1. OPEN FILE FOR SSMI RETRIEVAL DATA OUTPUT
! ==========================================

! 1.1 Open output file for retrievals in version 3.1 format
!     ----------------------------------------------------

      if (ssmi_125 &gt; 0) then
!        filename1 = 'obs_ssmi_retrieval.3dvar'
        write(filename1,'("obs_ssmi_retrieval_",a,".",a)') time_analysis, use_for

        WRITE (0,'(A,A)') &amp;
        "Write 3DVAR SSMI Retrieval obs in files: ", TRIM (filename1)

        INQUIRE (UNIT = 125, OPENED = connected )

        IF ( .NOT. connected ) THEN
          OPEN ( UNIT   = 125,          &amp;
                 FILE   = filename1,     &amp;
                 FORM   = 'FORMATTED',  &amp;
                 ACCESS = 'SEQUENTIAL', &amp;
                 STATUS = 'REPLACE')
        ENDIF

        REWIND ( UNIT = 125)

! 1.2 FILE HEADER FOR NEW FORMAT
!     --------------------------

! 1.2.1 TOTAL NUMBER OF STATIONS CONTAINED IN FILE AND MISSING VALUE
!       ------------------------------------------------------------

        WRITE  (UNIT = 125, FMT = '(A,I7,A)',ADVANCE='no' ) "SSMI  =",ssmi_125,","
        WRITE  (UNIT = 125, FMT = '((A,F8.0),A)') " MISS. = ",missing_r,","

! 1.2.2 REFERENCE STATE INFO
!       --------------------

        WRITE (UNIT = 125, FMT = '(A,F7.2,A,F7.2,4(A,F7.2),A)') &amp;
        "PHIC  =", phic,", XLONC =", xlonc,", TRUE1 =", truelat1,&amp;
        ", TRUE2 =",truelat2,", XIM11 =",xim11(idd),", XJM11 =",xjm11(idd),","
        WRITE (UNIT = 125, FMT = '(2(A,F7.2),4(A,F7.0),A)') &amp;
        "base_temp=",  ts0, ", base_lapse=", tlp, &amp;
        ", PTOP  =",  ptop,", base_pres=",  ps0, &amp;
        ", base_tropo_pres=", pis0, ", base_strat_temp=", tis0, ","  

! 1.2.3 DOMAINS INFO
!       ------------

        WRITE (UNIT = 125, FMT = '(5(A,I7),A)' ) &amp;
        "IXC   =", ixc,", JXC   =", jxc,", IPROJ =", iproj,&amp;
        ", IDD   =", idd,", MAXNES=",maxnes,","
        WRITE (UNIT = 125, FMT = '(A,10(:,I7,A))')  &amp;
        "NESTIX=",(nestix (i),", ", i = 1, maxnes)
        WRITE (UNIT = 125, FMT = '(A,10(:,I7,A))')  &amp;
        "NESTJX=",(nestjx (i),", ", i = 1, maxnes)
        WRITE (UNIT = 125, FMT = '(A,10(:,I7,A))')  &amp;
        "NUMC  =",(numc   (i),", ", i = 1, maxnes)
        WRITE (UNIT = 125, FMT = '(A,10(:,F7.2,A))')&amp;
        "DIS   =",(dis    (i),", ",i = 1, maxnes)
        WRITE (UNIT = 125, FMT = '(A,10(:,I7,A))')  &amp;
        "NESTI =",(nesti  (i),", ", i = 1, maxnes)
        WRITE (UNIT = 125, FMT = '(A,10(:,I7,A))')  &amp;
        "NESTJ =",(nestj  (i),", ", i = 1, maxnes)
 
! 1.2.4 VARIABLE NAME AND UNITS
!       -----------------------

        WRITE (UNIT = 125, FMT = '(A)' ) &amp;
        "INFO  = PLATFORM, DATE, NAME, LEVELS, LATITUDE, LONGITUDE, ELEVATION, ID."
        WRITE (UNIT = 125, FMT = '(A)' ) &amp;
        "SRFC  = WIND SPEED, PW (DATA,QC,ERROR)."

! 1.2.5 FORMATS
!       -------

       WRITE (UNIT = 125, FMT = '(2A)' ) 'INFO_FMT = ', TRIM (fmt_info)
       WRITE (UNIT = 125, FMT = '(2A)' ) 'SRFC_FMT = ', TRIM (fmt_srfc)

! 1.2.6 END OF HEADER
!       -------------

        WRITE (UNIT = 125, FMT = '(A)') &amp;
"#------------------------------------------------------------------------------#"

      endif

! 1.3 Open output file for Tb in version 3.1 format
!     --------------------------------------------

      if (ssmi_126 &gt; 0) then
!        filename2 = 'obs_ssmi_Tb.3dvar'
        write(filename2,'("obs_ssmi_Tb_",a,".",a)') time_analysis, use_for

        WRITE (0,'(A,A)') &amp;
        "Write 3DVAR SSMI TB obs in files: ", TRIM (filename2)

        INQUIRE (UNIT = 126, OPENED = connected )

        IF ( .NOT. connected ) THEN
          OPEN ( UNIT   = 126,          &amp;
                 FILE   = filename2,     &amp;
                 FORM   = 'FORMATTED',  &amp;
                 ACCESS = 'SEQUENTIAL', &amp;
                 STATUS = 'REPLACE')
        ENDIF

        REWIND ( UNIT = 126)

! 1.4 FILE HEADER FOR NEW FORMAT
!     --------------------------

! 1.4.1 M TOTAL NUMBER OF STATIONS CONTAINED IN FILE AND ISSING VALUE FLAG 
!       ------------------------------------------------------------------

        WRITE  (UNIT = 126, FMT = '(A,I7,A)',ADVANCE='no' ) "SSMI  =",ssmi_126,","
        WRITE  (UNIT = 126, FMT = '((A,F8.0),A)') " MISS. = ",missing_r,","

! 1.4.2 REFERENCE STATE INFO
!       --------------------

        WRITE (UNIT = 126, FMT = '(A,F7.2,A,F7.2,4(A,F7.2),A)') &amp;
        "PHIC  =", phic,", XLONC =", xlonc,", TRUE1 =", truelat1,&amp;
        ", TRUE2 =",truelat2,", XIM11 =",xim11(idd),", XJM11 =",xjm11(idd),","

        WRITE (UNIT = 126, FMT = '(2(A,F7.2),4(A,F7.0),A)') &amp;
        "base_temp=",  ts0, ", base_lapse=", tlp, &amp;
        ", PTOP  =",  ptop,", base_pres=",  ps0, &amp;
        ", base_tropo_pres=", pis0, ", base_strat_temp=", tis0, ","  

! 1.4.3 DOMAINS INFO
!       ------------

        WRITE (UNIT = 126, FMT = '(5(A,I7),A)' ) &amp;
        "IXC   =", ixc,", JXC   =", jxc,", IPROJ =", iproj,&amp;
        ", IDD   =", idd,", MAXNES=",maxnes,","
        WRITE (UNIT = 126, FMT = '(A,10(:,I7,A))')  &amp;
        "NESTIX=",(nestix (i),", ", i = 1, maxnes)
        WRITE (UNIT = 126, FMT = '(A,10(:,I7,A))')  &amp;
        "NESTJX=",(nestjx (i),", ", i = 1, maxnes)
        WRITE (UNIT = 126, FMT = '(A,10(:,I7,A))')  &amp;
        "NUMC  =",(numc   (i),", ", i = 1, maxnes)
        WRITE (UNIT = 126, FMT = '(A,10(:,F7.2,A))')&amp;
        "DIS   =",(dis    (i),", ",i = 1, maxnes)
        WRITE (UNIT = 126, FMT = '(A,10(:,I7,A))')  &amp;
        "NESTI =",(nesti  (i),", ", i = 1, maxnes)
        WRITE (UNIT = 126, FMT = '(A,10(:,I7,A))')  &amp;
        "NESTJ =",(nestj  (i),", ", i = 1, maxnes)

! 1.4.4 VARIABLE NAME AND UNITS
!       -----------------------

        WRITE (UNIT = 126, FMT = '(A)' ) &amp;
        "INFO  = PLATFORM, DATE, NAME, LEVELS, LATITUDE, LONGITUDE, ELEVATION, ID."
        WRITE (UNIT = 126, FMT = '(A)' ) &amp;
        "SRFC  = TB19V, TB19H, TB22V, TB37V, TB37H, TB85V, TB85H (DATA,QC,ERROR)."

! 1.4.5 FORMATS
!       -------

        WRITE (UNIT = 126, FMT = '(2A)' ) 'INFO_FMT = ', TRIM (fmt_info)
        WRITE (UNIT = 126, FMT = '(2A)' ) 'SRFC_FMT = ', TRIM (fmt_srfc)

! 1.4.6 END OF HEADER
!       -------------

        WRITE (UNIT = 126, FMT = '(A)') &amp;
"#------------------------------------------------------------------------------#"

      endif

! 2.  WRITE OBSERVATIONS
! ======================

      nwrites1 = 0
      nwrites2 = 0
      nvalids = 0


! 2.1  Loop over stations
!      ------------------

stations: &amp;
       DO n = 1, number_of_obs

! 2.2 Index of obs
!     ------------

      loop_index = index (n)

! 2.3 Check if station is valid
!     -------------------------

stations_valid: &amp;
      IF (obs (loop_index)%info%discard ) THEN

          CYCLE  stations

      ELSE stations_valid

      READ (obs (loop_index) % info % platform (4:6), '(I3)') fm

      if ((fm /= 125) .AND. (fm /= 126))  CYCLE stations

      nvalids = nvalids + 1

! 2.4 Write station info
!     ------------------

      IF (fm == 125) THEN

      WRITE (UNIT = 125, FMT = TRIM (fmt_info))         &amp;
             obs (loop_index) % info     % platform,    &amp;
             obs (loop_index) % valid_time % date_mm5,  &amp;
             obs (loop_index) % location % name,        &amp;
             obs (loop_index) % info % levels,          &amp;
             obs (loop_index) % location % latitude,    &amp;
             obs (loop_index) % location % longitude,   &amp;
             obs (loop_index) % info     % elevation,   &amp;
             obs (loop_index) % location % id

             nwrites1 = nwrites1 + 1

      ELSE IF (fm == 126) THEN

      WRITE (UNIT = 126, FMT = TRIM (fmt_info))          &amp;
             obs (loop_index) % info     % platform,    &amp;
             obs (loop_index) % valid_time % date_mm5,  &amp;
             obs (loop_index) % location % name,        &amp;
             obs (loop_index) % info % levels,          &amp;
             obs (loop_index) % location % latitude,    &amp;
             obs (loop_index) % location % longitude,   &amp;
             obs (loop_index) % info     % elevation,   &amp;
             obs (loop_index) % location % id

             nwrites2 = nwrites2 + 1

      ENDIF

! 2.4 Write surface info
!     ------------------

      IF (fm == 125) THEN

      IF (ASSOCIATED (obs (loop_index) % surface)) THEN

         if( domain_check_h .and. &amp;
           (obs (loop_index) % location % xjc &lt; 1.0 .or. &amp;
            obs (loop_index) % location % xjc &gt; rew_cross .or. &amp;
            obs (loop_index) % location % yic &lt; 1.0 .or. &amp;
            obs (loop_index) % location % yic &gt; rns_cross) ) then
            obs (loop_index) % ground  % pw   % qc = -88
         end if

         WRITE (UNIT = 125, FMT = TRIM (fmt_srfc))                  &amp;
                obs (loop_index) % surface % meas % speed % data,  &amp;
                obs (loop_index) % surface % meas % speed % qc,    &amp;
                obs (loop_index) % surface % meas % speed % error, &amp;
                obs (loop_index) % ground  % pw   % data, &amp;
                obs (loop_index) % ground  % pw   % qc,   &amp;
                obs (loop_index) % ground  % pw   % error

      ELSE

         if( domain_check_h .and. &amp;
           (obs (loop_index) % location % xjc &lt; 1.0 .or. &amp;
            obs (loop_index) % location % xjc &gt; rew_cross .or. &amp;
            obs (loop_index) % location % yic &lt; 1.0 .or. &amp;
            obs (loop_index) % location % yic &gt; rns_cross) ) then
            obs (loop_index) % ground  % pw   % qc = -88
         end if

         WRITE (UNIT = 125, FMT = TRIM (fmt_srfc))         &amp;
                missing_r, CEILING (missing_r/10000), 2.5, &amp;
                obs (loop_index) % ground % pw  % data,    &amp;
                obs (loop_index) % ground % pw  % qc,      &amp;
                obs (loop_index) % ground % pw  % error

      ENDIF

                nwrites1 = nwrites1 + 1

      ELSE IF (fm == 126) THEN

         if( domain_check_h .and. &amp;
           (obs (loop_index) % location % xjc &lt; 1.0 .or. &amp;
            obs (loop_index) % location % xjc &gt; rew_cross .or. &amp;
            obs (loop_index) % location % yic &lt; 1.0 .or. &amp;
            obs (loop_index) % location % yic &gt; rns_cross) ) then
            obs (loop_index) % ground % tb19v % qc = -88
            obs (loop_index) % ground % tb19h % qc = -88
            obs (loop_index) % ground % tb22v % qc = -88
            obs (loop_index) % ground % tb37v % qc = -88
            obs (loop_index) % ground % tb37h % qc = -88
            obs (loop_index) % ground % tb85v % qc = -88
            obs (loop_index) % ground % tb85h % qc = -88
         end if

         WRITE (UNIT = 126, FMT = TRIM (fmt_srfc))         &amp;
         obs (loop_index) % ground % tb19v % data,  &amp;
         obs (loop_index) % ground % tb19v % qc,    &amp;
         obs (loop_index) % ground % tb19v % error, &amp;
         obs (loop_index) % ground % tb19h % data,  &amp;
         obs (loop_index) % ground % tb19h % qc,    &amp;
         obs (loop_index) % ground % tb19h % error, &amp;
         obs (loop_index) % ground % tb22v % data,  &amp;
         obs (loop_index) % ground % tb22v % qc,    &amp;
         obs (loop_index) % ground % tb22v % error, &amp;
         obs (loop_index) % ground % tb37v % data,  &amp;
         obs (loop_index) % ground % tb37v % qc,    &amp;
         obs (loop_index) % ground % tb37v % error, &amp;
         obs (loop_index) % ground % tb37h % data,  &amp;
         obs (loop_index) % ground % tb37h % qc,    &amp;
         obs (loop_index) % ground % tb37h % error, &amp;
         obs (loop_index) % ground % tb85v % data,  &amp;
         obs (loop_index) % ground % tb85v % qc,    &amp;
         obs (loop_index) % ground % tb85v % error, &amp;
         obs (loop_index) % ground % tb85h % data,  &amp;
         obs (loop_index) % ground % tb85h % qc,    &amp;
         obs (loop_index) % ground % tb85h % error

         nwrites2 = nwrites2 + 1

      ENDIF

! 3.3 Go to next valid station
!     -----------------

      ENDIF stations_valid

! 3.3 Go to next record
!     -----------------

      ENDDO stations


! 4.   CLOSE OUTPUT FILES
! ========================

      CLOSE (UNIT = 125) 
      CLOSE (UNIT = 126) 


! 5.  PRINT DIAGNOSTIC
! =====================
 
      WRITE (0, '(A)') ' ' 

      if (ssmi_125 &gt; 0) WRITE (0, '(A,I7,A,A)') &amp;
      'Wrote ',nwrites1,' lines of data in file: ',TRIM (filename1) 

      if (ssmi_126 &gt; 0) WRITE (0, '(A,I7,A,A)') &amp;
      'Wrote ',nwrites2,' lines of data in file: ',TRIM (filename2) 

      WRITE (0, '(A)') ' ' 

      RETURN

END SUBROUTINE output_ssmi_31

<A NAME='OUTPUT_GTS_31'><A href='../../html_code/obsproc/module_write.F90.html#OUTPUT_GTS_31' TARGET='top_target'><IMG SRC="../../gif/bar_red.gif" border=0></A>

SUBROUTINE output_gts_31 (max_number_of_obs, obs, number_of_obs, windex,&amp; 1
                         nsynops, nshipss, nmetars,                    &amp;
                         npilots, nsounds, nsatems,                    &amp;
                         nsatobs, naireps, ngpspws, ngpsztd, ngpsref,  &amp;
                         ngpseph, nssmt1s, nssmt2s, nssmis,  ntovss,   &amp;
                         nothers, namdars, nqscats, nprofls,nbuoyss,   &amp;
                         nboguss, nairss, ntamdar, missing_r, time_analysis)

!-------------------------------------------------------------------------------
! Write observation at MM5 3D-VAR SYSTEM VERSION 2.0
! Output file is "obs_ascii.ccyymmddhh
!
! F. VANDENBERGHE, March 2000
!-------------------------------------------------------------------------------


  IMPLICIT NONE

  INTEGER,                                      INTENT (in) :: max_number_of_obs
  TYPE (report), DIMENSION (max_number_of_obs), INTENT (inout) :: obs
  INTEGER,                                      INTENT (in) :: number_of_obs
  INTEGER,       DIMENSION (max_number_of_obs), INTENT (in) :: windex
  REAL,                                         INTENT (in) :: missing_r
  CHARACTER (LEN =  19),                        INTENT (in) :: time_analysis
  INTEGER,                                      INTENT (in) :: nsynops,nmetars,&amp;
                                                               nshipss,nsounds,&amp;
                                                               npilots,naireps,&amp;
                                                               nsatems,nsatobs,&amp;
                                                               ngpspws,nssmt1s,&amp;
                                                               nssmt2s, nssmis,&amp;
                                                               ntovss, namdars,&amp;
                                                               nqscats,nothers,&amp;
                                                               nprofls,nbuoyss,&amp;
                                                               ngpsztd,ngpsref,&amp;
                                                               ngpseph,nboguss,&amp;
                                                               nairss,ntamdar

  TYPE (measurement ) , POINTER :: current
  INTEGER                       :: loop_index
  INTEGER                       :: i, ii, n, ntotal, k_levels
  INTEGER                       :: nvalids, nmultis, nsingles, nlevels, nwrites
  INTEGER                       :: is_sound, fm
  LOGICAL                       :: connected
  CHARACTER (LEN = 80)          :: filename
  CHARACTER (LEN = 120)         :: fmt_info, &amp;
                                   fmt_srfc,  &amp;
                                   fmt_each
  CHARACTER (LEN=40) :: SID
  INTEGER   ::    kx
  REAL                          :: val_slp, val_pw, pressure_error
  REAL                          :: val_u,  val_v,  val_p, val_t
  REAL                          :: val_td, val_rh, val_qv
!------------------------------------------------------------------------------
  REAL                          :: rew_cross, rns_cross
  LOGICAL                       :: change_qc

  rew_cross=real(nestjx(idd)-1)
  rns_cross=real(nestix(idd)-1)
!------------------------------------------------------------------------------!

      ntotal =   nsynops + nmetars + nshipss + &amp;
                 nsounds + npilots + naireps + &amp;
                 nsatems + nsatobs + ngpspws + &amp;
                 nssmt1s + nssmt2s + ntovss  + &amp;
                 namdars + nqscats + nprofls + &amp;
                 nbuoyss + nothers + ngpsztd + &amp;
                 ngpsref + ngpseph + nboguss + nairss + ntamdar

!------------------------------------------------------------------------------!
!     B. PRINT OBS USING THE NEW STRUCTURE
!------------------------------------------------------------------------------!

      WRITE (0,'(A)')  &amp;
'------------------------------------------------------------------------------'


! 0.  FORMAT
! ==========

!     fmt_info = '(A12,1X,A19,1X,A40,1X,I6,3(F12.3,11X),6X,A5)'
     fmt_info = '(A12,1X,A19,1X,A40,1X,I6,3(F12.3,11X),6X,A40)'
     fmt_srfc = '(F12.3,I4,F7.2,F12.3,I4,F7.3)'
     fmt_each = '(3(F12.3,I4,F7.2),11X,3(F12.3,I4,F7.2),11X,3(F12.3,I4,F7.2))'


! 1. OPEN FILE FOR VALID OBSERVATIONS OUTPUT
! ==========================================

! 1.1 Name of output file
!     -------------------

      write(filename,'("obs_gts_",a,".",a)') time_analysis, use_for

!      filename = 'obs_gts.'//use_for

      WRITE (0,'(7A)') 'Write ',use_for,' GTS observations in file ',&amp;
                        TRIM (filename),' (WRFDA ',TRIM(release_version),')'


! 1.2 OPEN FILE AT VERSION 3.1 FORMAT
!     -------------------------------

      INQUIRE ( UNIT = 99, OPENED = connected )

      IF ( .NOT. connected ) THEN
          OPEN ( UNIT   = 99,           &amp;
                 FILE   = filename,     &amp;
                 FORM   = 'FORMATTED',  &amp;
                 ACCESS = 'SEQUENTIAL', &amp;
                 STATUS = 'REPLACE')
      ENDIF

      REWIND ( UNIT = 99)

      if (ntotal == 0) then
         WRITE(0,'(A,I6,A)') "Ntotal=",ntotal, &amp;
                            " No observations other than SSMI is written out."
!        CLOSE (UNIT = 99) 
!        RETURN
      endif

! 1.3 FILE HEADER FOR NEW FORMAT
!     --------------------------

! 1.3.1 TOTAL NUMBER OF STATIONS CONTAINED IN FILE
!       ------------------------------------------

      WRITE  (UNIT = 99, FMT = '((A,I7),A)',ADVANCE='no' )    &amp;
      "TOTAL =",nsynops + nmetars + nshipss + &amp;
                nsounds + npilots + naireps + &amp;
                nsatems + nsatobs + ngpspws + &amp;
                nssmt1s + nssmt2s + namdars + &amp;
                ntovss  + nqscats + nprofls + &amp;
                nbuoyss + nothers + ngpsztd + &amp;
                ngpsref + ngpseph + nboguss + nairss + ntamdar,", "

! 1.3.5 MISSING VALUE FLAG 
!       ------------------

       WRITE  (UNIT = 99, FMT = '((A,F8.0),A)') "MISS. =",missing_r,","

! 1.3.2 NUMBER OF STATIONS PER TYPE
!       ---------------------------

!      WRITE  (UNIT = 99, FMT = '(3(6(A,I7,A),/,:))' )    &amp;
      WRITE  (UNIT = 99, FMT = '(6(A,I7,A))' )    &amp;
      "SYNOP =",nsynops,", ", &amp;
      "METAR =",nmetars,", ", &amp;
      "SHIP  =",nshipss,", ", &amp;
      "BUOY  =",nbuoyss,", ", &amp;
      "BOGUS =",nboguss,", ", &amp;
      "TEMP  =",nsounds,", ", &amp;
      "AMDAR =",namdars,", ", &amp;
      "AIREP =",naireps,", ", &amp;
      "TAMDAR=",ntamdar,", ", &amp;
      "PILOT =",npilots,", ", &amp;
      "SATEM =",nsatems,", ", &amp;
      "SATOB =",nsatobs,", ", &amp;
      "GPSPW =",ngpspws,", ", &amp;
      "GPSZD =",ngpsztd,", ", &amp;
      "GPSRF =",ngpsref,", ", &amp;
      "GPSEP =",ngpseph,", ", &amp;
      "SSMT1 =",nssmt1s,", ", &amp;
      "SSMT2 =",nssmt2s,", ", &amp;
!      "SSMI  =",nssmis, ", ", &amp;
      "TOVS  =",ntovss, ", ", &amp;
      "QSCAT =",nqscats,", ", &amp;
      "PROFL =",nprofls,", ", &amp;
      "AIRSR =",nairss ,", ", &amp;
      "OTHER =",nothers,", "


! 1.3.4 REFERENCE STATE INFO
!       --------------------

        WRITE (UNIT = 99, FMT = '(A,F7.2,A,F7.2,4(A,F7.2),A)') &amp;
        "PHIC  =", phic,", XLONC =", xlonc,", TRUE1 =", truelat1,&amp;
      ", TRUE2 =",truelat2,", XIM11 =",xim11(idd),", XJM11 =",xjm11(idd),","

        WRITE (UNIT = 99, FMT = '(2(A,F7.2),4(A,F7.0),A)') &amp;
        "base_temp=",  ts0, ", base_lapse=", tlp, &amp;
        ", PTOP  =",  ptop,", base_pres=",  ps0, &amp;
        ", base_tropo_pres=", pis0, ", base_strat_temp=", tis0, ","  

! 1.3.4 DOMAINS INFO
!       ------------

        WRITE (UNIT = 99, FMT = '(5(A,I7),A)' ) &amp;
        "IXC   =", ixc,", JXC   =", jxc,", IPROJ =", iproj,&amp;
        ", IDD   =", idd,", MAXNES=",maxnes,","
        WRITE (UNIT = 99, FMT = '(A,10(:,I7,A))')  &amp;
       "NESTIX=",(nestix (i),", ", i = 1, maxnes)
        WRITE (UNIT = 99, FMT = '(A,10(:,I7,A))')  &amp;
       "NESTJX=",(nestjx (i),", ", i = 1, maxnes)
        WRITE (UNIT = 99, FMT = '(A,10(:,I7,A))')  &amp;
       "NUMC  =",(numc   (i),", ", i = 1, maxnes)
        WRITE (UNIT = 99, FMT = '(A,10(:,F7.2,A))')&amp;
       "DIS   =",(dis    (i),", ",i = 1, maxnes)
        WRITE (UNIT = 99, FMT = '(A,10(:,I7,A))')  &amp;
       "NESTI =",(nesti  (i),", ", i = 1, maxnes)
        WRITE (UNIT = 99, FMT = '(A,10(:,I7,A))')  &amp;
       "NESTJ =",(nestj  (i),", ", i = 1, maxnes)



! 1.3.6 VARIABLE NAME AND UNITS
!       -----------------------

       WRITE (UNIT = 99, FMT = '(A)' ) &amp;
      "INFO  = PLATFORM, DATE, NAME, LEVELS, LATITUDE, LONGITUDE, ELEVATION, ID."
       WRITE (UNIT = 99, FMT = '(A)' ) &amp;
      "SRFC  = SLP, PW (DATA,QC,ERROR)."
       WRITE (UNIT = 99, FMT = '(A)' ) &amp;
      "EACH  = PRES, SPEED, DIR, HEIGHT, TEMP, DEW PT, HUMID (DATA,QC,ERROR)*LEVELS."

! 1.3.7 FORMATS
!       -------

      WRITE (UNIT = 99, FMT = '(2A)' ) 'INFO_FMT = ', TRIM (fmt_info)
      WRITE (UNIT = 99, FMT = '(2A)' ) 'SRFC_FMT = ', TRIM (fmt_srfc)
      WRITE (UNIT = 99, FMT = '(2A)' ) 'EACH_FMT = ', TRIM (fmt_each)


! 1.3.7 END OF HEADER
!       -------------

        WRITE (UNIT = 99, FMT = '(A)') &amp;
"#------------------------------------------------------------------------------#"


! 2.  WRITE OBSERVATIONS
! ======================

      nmultis  = 0
      nsingles = 0
      nlevels  = 0
      nwrites  = 0


! 2.1  Loop over stations
!      ------------------

stations: &amp;
       DO n = 1, number_of_obs

! 2.2 Index of obs
!     ------------

      loop_index = windex (n)

! 2.3 Check if station is valid
!     -------------------------

stations_valid: &amp;
      IF (obs (loop_index)%info%discard ) THEN

          CYCLE  stations

      ELSE stations_valid

      READ (obs (loop_index) % info % platform (4:6), '(I3)') fm

      if ((fm == 125) .OR. (fm == 126))  CYCLE stations

      nvalids = nvalids + 1

! SATEM reference pressure is assigned to slp:

      if (fm == 86) then
           obs (loop_index) % ground % slp % data =  &amp;
              obs (loop_index) % ground % ref_pres % data
           obs (loop_index) % ground % slp % qc =  &amp;
              obs (loop_index) % ground % ref_pres % qc
           obs (loop_index) % ground % pw % data =  &amp;
              obs (loop_index) % ground % cloud_cvr % data
!           obs (loop_index) % ground % pw % qc =  &amp;
!              obs (loop_index) % ground % cloud_cvr % qc
      endif

! 2.4 Write station info
!     ------------------

! First, fix up the station id
!
      SELECT CASE (fm)
      CASE ( 86, 87, 88 )
        sid = obs (loop_index) % location % id
        kx = index(obs (loop_index) % location % id,'GOES')
        if (kx .eq. 0) then
          kx = index(obs (loop_index) % location % id,'MET')
          if (kx .ne. 0) then
            sid = 'MET' // sid(kx+3:40)
          else
            kx = index(obs (loop_index) % location % id,'MODIS')
            if (kx .ne. 0) sid = 'MODIS'
          endif
        else
          sid = 'G-' // sid(kx+5:40)
        endif
      CASE ( 141 )
        sid = 'MODIS'
      CASE ( 281 )
        sid = 'QSCAT'
      CASE ( 13, 18, 19 )
         kx = index(obs (loop_index) % location % name,' &gt;&gt;&gt;')
         sid = obs (loop_index) % location % name
         if (kx .ne. 0) then
           sid = sid(kx+5:kx+9)
         else
           if (fm .eq. 13) then
             sid = 'SHIP'
           else if (fm .eq. 18) then
             sid = 'BUOY'
           else if (fm .eq. 19) then
             sid = 'C-MAN'
           else
             sid = obs (loop_index) % location % id
           endif
         endif
      CASE ( 15, 16 )
        kx = index(obs (loop_index) % location % name,'ICAO ')
        sid = obs (loop_index) % location % name
        if (kx .ne. 0) then
          sid = sid(kx+5:kx+9)
        else
          sid = obs (loop_index) % location % id
        endif
      CASE ( 133 )
        sid = 'AIRSRET'
      CASE DEFAULT
        sid = obs (loop_index) % location % id
      END SELECT

! To keep the levels for use later. Because some of the BUOY data have the empty 
! data record from the NCAR archived LITTLE_R file, the number of levels could 
! become 0, which is not cosistent with the usage in WRFVar (YRG, 02/24/2009):

      k_levels = obs (loop_index) % info % levels 
      if ( (fm == 18 .or. fm == 19 ) .and. &amp;
           obs (loop_index) % info   % elevation == 0.0 ) then
           if ( obs (loop_index) % info % levels == 0 ) &amp;
                obs (loop_index) % info % levels = 1
      endif
! ..............................................................................

      WRITE (UNIT = 99, FMT = TRIM (fmt_info))          &amp;
             obs (loop_index) % info     % platform,    &amp;
             obs (loop_index) % valid_time % date_mm5,  &amp;
             obs (loop_index) % location % name,        &amp;
             obs (loop_index) % info % levels,          &amp;
             obs (loop_index) % location % latitude,    &amp;
             obs (loop_index) % location % longitude,   &amp;
             obs (loop_index) % info     % elevation,   &amp;
             sid
!            obs (loop_index) % location % id

! 2.4 Write surface info
!     ------------------

         change_qc = .false.

         if( domain_check_h .and. &amp;
           (obs (loop_index) % location % xjc &lt; 1.0 .or. &amp;
            obs (loop_index) % location % xjc &gt; rew_cross .or. &amp;
            obs (loop_index) % location % yic &lt; 1.0 .or. &amp;
            obs (loop_index) % location % yic &gt; rns_cross) ) then
            obs (loop_index) % ground % slp % qc = -88
            obs (loop_index) % ground % pw  % qc = -88
            change_qc = .true.
         end if

      WRITE (UNIT = 99, FMT = TRIM (fmt_srfc))          &amp;
             obs (loop_index) % ground % slp % data,    &amp;
             obs (loop_index) % ground % slp % qc,      &amp;
             obs (loop_index) % ground % slp % error,   &amp;
             obs (loop_index) % ground % pw  % data,    &amp;
             obs (loop_index) % ground % pw  % qc,      &amp;
             obs (loop_index) % ground % pw  % error

             nwrites = nwrites + 1

! 2.6 Initialise pointer
!     ------------------

      current =&gt; obs (loop_index) % surface

!~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
! In the NCAR archie LITTLE_R files (created by Jim Bresch), there is another 
! problem,
!
! The data record for some of BUOY (FM-18, 19) were filled with all parameters 
! (p, h, t, td,...) missing even though SLP and elevation=0.0m in the header 
! record are available. This caused the BUOY report has only 0-level data, 
! which will be discarded by WRFDA/var/da/da_obs_io/da_read_obs_ascii.inc.
!
! In tropical storm cases, however, assimilation of the SLP obs from BUOY could 
! be important. This BUOY SLP obs should not be discarded. 
!
! The following modifications attempt to fix these problems.
!
! In CWB, AFWA, and KMA LITTLE_R files, we did not find the above problems, and
! the following modifications may not needed. 
!
!                                        Yong-Run Guo, 02/19/2009
! .................................................................................  

      if ( (fm == 18 .or. fm == 19 ) .and. &amp;
           obs (loop_index) % info   % elevation == 0.0 ) then

           pressure_error = 100. ! for BUOY

           if ( k_levels == 0 ) then

             WRITE (UNIT = 99, FMT = TRIM (fmt_each))    &amp;
               obs (loop_index) % ground % slp % data,    &amp;
               obs (loop_index) % ground % slp % qc,      &amp;
               pressure_error, &amp;
               missing_r, -88, 1.40,  &amp;  ! speed 
               missing_r, -88, 5.00,  &amp;  ! direction
               obs (loop_index) % info   % elevation, 0, 6.0, &amp;
               missing_r, -88,  2.0,  &amp;  ! temperature
               missing_r, -88,  2.0,  &amp;  ! dew-point
               missing_r, -88, 10.0      ! RH
               CYCLE  stations
           endif
      endif
! ~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~

! 2.7 Loop over levels
!     ----------------

      is_sound = -1

levels:&amp;
      DO WHILE (ASSOCIATED (current))

      nlevels  = nlevels  + 1
      is_sound = is_sound + 1

! SATEM thickness is assigned to temperature field:

      if (fm == 86) &amp;
         current % meas % temperature = current % meas % thickness

! 2.9 Write height, pressure, temp, mixing ratio, wind and model vertical coord
!     -------------------------------------------------------------------------

      if(change_qc) then
         current % meas % temperature % qc = -88
         current % meas % dew_point   % qc = -88
         current % meas % rh          % qc = -88

         if(current % meas % height   % qc &gt;= 0) then
            current % meas % pressure % qc = -88
         end if
      end if

! Because there is no "qc" in pressure and height in data structure in WRFVar,
! all pressure and height with bad flags(&lt;0), the data value are set to be missing 
! (YRG, 02/11/2009)

      if (current % meas % pressure % qc &lt; 0) &amp;
          current % meas % pressure % data = missing_r
      if (current % meas % height   % qc &lt; 0) &amp;
          current % meas % height   % data = missing_r
! ...............................................................

          if (fm == 118 .or. fm == 116) then

      WRITE (UNIT = 99, FMT = TRIM (fmt_each))    &amp;
             current % meas % pressure    % data, &amp;    ! pressure 
             current % meas % pressure    % qc,   &amp; 
             current % meas % pressure    % error,&amp;
             current % meas % u       % data, &amp;        ! latitude
             current % meas % u       % qc,   &amp; 
             current % meas % u       % error,&amp;
             current % meas % v   % data, &amp;            ! longitude
             current % meas % v   % qc,   &amp; 
             current % meas % v   % error,&amp;
             current % meas % height      % data, &amp;    ! height
             current % meas % height      % qc,   &amp;
             current % meas % height      % error,&amp;
             current % meas % temperature % data, &amp;    ! temperature
             current % meas % temperature % qc,   &amp;
             current % meas % temperature % error,&amp;
             current % meas % dew_point   % data, &amp;    ! refractivity
             current % meas % dew_point   % qc,   &amp; 
             current % meas % dew_point   % error,&amp;
             current % meas % direction   % data, &amp;    ! azimuth
             current % meas % direction   % qc,   &amp; 
             current % meas % direction   % error,&amp;
             current % meas % speed       % data, &amp;    ! impact parameter /1000. 
             current % meas % speed       % qc,   &amp; 
             current % meas % speed       % error,&amp;
             current % meas % rh          % data, &amp;    ! bending angle*1.e7
             current % meas % rh          % qc,   &amp; 
             current % meas % rh          % error
          else

      WRITE (UNIT = 99, FMT = TRIM (fmt_each))    &amp;
             current % meas % pressure    % data, &amp;
             current % meas % pressure    % qc,   &amp; 
             current % meas % pressure    % error,&amp;
             current % meas % speed       % data, &amp; 
             current % meas % speed       % qc,   &amp; 
             current % meas % speed       % error,&amp;
             current % meas % direction   % data, &amp;
             current % meas % direction   % qc,   &amp; 
             current % meas % direction   % error,&amp;
             current % meas % height      % data, &amp;
             current % meas % height      % qc,   &amp;
             current % meas % height      % error,&amp;
             current % meas % temperature % data, &amp;
             current % meas % temperature % qc,   &amp;
             current % meas % temperature % error,&amp;
             current % meas % dew_point   % data, &amp;
             current % meas % dew_point   % qc,   &amp; 
             current % meas % dew_point   % error,&amp;
             current % meas % rh          % data, &amp;
             current % meas % rh          % qc,   &amp; 
             current % meas % rh          % error
          endif

             nwrites = nwrites + 1


! 3.  GO TO NEXT OBS
!     ==============

! 3.1 Go to next level
!     -----------------

      current =&gt; current%next

      ENDDO levels

! 3.2 Count surface and sounding
!     --------------------------

      if (is_sound .gt. 0) then
          nmultis = nmultis + 1
      else 
          nsingles  = nsingles + 1
      endif

! 3.3 Go to next valid station
!     -----------------

      ENDIF stations_valid

! 3.3 Go to next record
!     -----------------

      ENDDO stations


! 4.   CLOSE OUTPUT FILES
! ========================

      CLOSE (UNIT = 99) 


! 5.  PRINT DIAGNOSTIC
! =====================
 
      WRITE (0, '(/,A,I8,A,A)') &amp;
     'Wrote ',nwrites,' lines of data in file: ',TRIM (filename) 
      WRITE (0, '(A)') ' ' 


   RETURN

END SUBROUTINE output_gts_31

!----------------------------------------------------------------------
<A NAME='OUTPUT_PREP'><A href='../../html_code/obsproc/module_write.F90.html#OUTPUT_PREP' TARGET='top_target'><IMG SRC="../../gif/bar_red.gif" border=0></A>

SUBROUTINE output_prep (max_number_of_obs, obs, number_of_obs, windex,&amp; 1,33
                         prepbufr_table_filename, &amp;
                         prepbufr_output_filename, &amp;
                         nsynops, nshipss, nmetars,                    &amp;
                         npilots, nsounds, nsatems,                    &amp;
                         nsatobs, naireps, ngpspws, ngpsztd, ngpsref,  &amp;
                         ngpseph, nssmt1s, nssmt2s, nssmis,  ntovss,   &amp;
                         nothers, namdars, nqscats, nprofls,nbuoyss,   &amp;
                         nboguss, missing_r, time_analysis)

!----------------------------------------------------------------------
! Write observations in PREPBUFR
! Jim Bresch, February 2006
! J. F. Drake, November 2005
!----------------------------------------------------------------------


  IMPLICIT NONE


  INTEGER,                                      INTENT (in) :: max_number_of_obs
  TYPE (report), DIMENSION (max_number_of_obs), INTENT (inout) :: obs
  INTEGER,                                      INTENT (in) :: number_of_obs
  INTEGER,       DIMENSION (max_number_of_obs), INTENT (in) :: windex
  REAL,                                         INTENT (in) :: missing_r
  CHARACTER (LEN =  19),                        INTENT (in) :: time_analysis
  CHARACTER (LEN =  80),                        INTENT(in)  :: prepbufr_table_filename, &amp;
                                                               prepbufr_output_filename
  INTEGER,                                      INTENT (in) :: nsynops,nmetars,&amp;
                                                               nshipss,nsounds,&amp;
                                                               npilots,naireps,&amp;
                                                               nsatems,nsatobs,&amp;
                                                               ngpspws,nssmt1s,&amp;
                                                               nssmt2s, nssmis,&amp;
                                                               ntovss, namdars,&amp;
                                                               nqscats,nothers,&amp;
                                                               nprofls,nbuoyss,&amp;
                                                               ngpsztd,ngpsref,&amp;
                                                               ngpseph,nboguss

  TYPE (measurement ) , POINTER :: current
  INTEGER                       :: bfout, bftable, loop_index
  INTEGER                       :: i, n, nlv, nmax, ntotal
  INTEGER                       :: nvalids, nmultis, nsingles, nlevels, nwrites
  INTEGER                       :: is_sound, fm, idate
  INTEGER                       :: year, month, day, hour, minute, second
  INTEGER                       :: mxmn, kx
  LOGICAL                       :: connected, vld
  CHARACTER (LEN = 6)           :: cfm(300)
  REAL(kind=8), allocatable, dimension(:,:) :: r8arr
  REAL                          :: mixing_ratio, temperat
  REAL                          :: press
  REAL(kind=8)                  :: wqm, virtual_temperature, &amp;
                                   specific_humidity

  CHARACTER (LEN=40) :: SID
  REAL, parameter  :: PI=3.1415926535

!---------------------------------------------------------------------
!  REAL                          :: rew_cross, rns_cross

#ifdef BUFR

! rew_cross=real(nestjx(idd)-1)
! rns_cross=real(nestix(idd)-1)
!---------------------------------------------------------------------

! Set up missing value for BUFRLIB

      bfout = 11
      bftable = 10

! Initialilze cfm
!---------------------------------------------------------------------
 
      cfm = 'UNKNOW'
      cfm(12)    = 'ADPSFC'
      cfm(13)    = 'SFCSHP'
      cfm(14:16) = 'ADPSFC'
      cfm(18:19) = 'SFCSHP'
      cfm(32:38) = 'ADPUPA'
      cfm(42)    = 'AIRCFT'
      cfm(86:87) = 'GOESND'
      cfm(88)    = 'SATWND'
      cfm(96:97) = 'AIRCFT'
      cfm(111)   = 'GPSIPW'
      cfm(116)   = 'GPSREF'
      cfm(125)   = 'SPSSMI'
      cfm(132)   = 'PROFLR'
      cfm(135)   = 'SYNDAT'
      cfm(141)   = 'SATWND'     ! modis used to have fm code 141, but now uses 88
      cfm(281)   = 'QKSWND'
      
     
      ntotal =   nsynops + nmetars + nshipss + &amp;
                 nsounds + npilots + naireps + &amp;
                 nsatems + nsatobs + ngpspws + &amp;
                 nssmis  + &amp;
                 nssmt1s + nssmt2s + ntovss  + &amp;
                 namdars + nqscats + nprofls + &amp;
                 nbuoyss + nothers + ngpsztd + &amp;
                 ngpsref + nboguss 

      write(0,*) 'ntotal = ',ntotal
      if (ntotal == 0) then
         WRITE(0,'(A,I6,A)') "Ntotal=",ntotal, &amp;
                            " No prepbufr observations written out."
         RETURN
      endif

!     Determine the required size of the real*8 buffer and
!     allocate it.

      nmax = max(nsynops + nmetars, nshipss + nbuoyss, &amp;
                 nsounds, npilots, naireps + namdars, nprofls) 

      mxmn = 58
      ALLOCATE (r8arr(mxmn, 255))

! 1. Open unit bftable for the PREPBUFR table
!---------------------------------------------------------------------

      INQUIRE (UNIT=bftable, OPENED= connected )
      IF (connected) THEN
         WRITE(0,'(A, i4, A)') "A file is already connected to unit", bftable, &amp;
                        "which is needed for the PREPBUFR tables"
         STOP
      ENDIF

      OPEN (UNIT = bftable, FILE = prepbufr_table_filename) 

! 2. Open unit bfout FOR the PREPBUFR output file
!---------------------------------------------------------------------

      OPEN (UNIT = bfout, FILE = prepbufr_output_filename, &amp;
            FORM = "UNFORMATTED") 

      CALL OPENBF (bfout, 'OUT', bftable)

      WRITE (0,'(2A)') 'Write 3DVAR PREPBUFR observations in file ',&amp;
                        TRIM (prepbufr_output_filename)

! 3.  WRITE OBSERVATIONS
!---------------------------------------------------------------------

      nmultis  = 0
      nsingles = 0
      nlevels  = 0
      nwrites  = 0


! 3.1  Loop over stations
!      ------------------
   print *, 'number of obs=', number_of_obs
stations: &amp;
   DO n = 1, number_of_obs

! 3.2 Index of obs
!     ------------

   loop_index = windex (n)

! 3.3 Check if station is valid
!     -------------------------

stations_valid: &amp;
   IF (obs (loop_index)%info%discard ) THEN
      CYCLE stations
   ELSE stations_valid
      READ (obs (loop_index) % info % platform (4:6), '(I3)') fm
      IF (fm == 126 .OR. cfm(fm) == 'UNKNOW') &amp;
          CYCLE stations

      nvalids = nvalids + 1

! SATEM reference pressure is assigned to slp:

      IF (fm == 86) then
           obs (loop_index) % ground % slp % data =  &amp;
              obs (loop_index) % ground % ref_pres % data
           obs (loop_index) % ground % slp % qc =  &amp;
              obs (loop_index) % ground % ref_pres % qc
           obs (loop_index) % ground % pw % data =  &amp;
              obs (loop_index) % ground % cloud_cvr % data
!           obs (loop_index) % ground % pw % qc =  &amp;
!              obs (loop_index) % ground % cloud_cvr % qc
      endif

SUBSET: &amp;
       SELECT CASE (cfm(fm))
       CASE ('ADPSFC', 'SFCSHP', 'AIRCFT', 'ADPUPA', 'AIRCAR', 'PROFLR', 'SATWND', &amp;
             'SYNDAT', 'GPSIPW', 'GPSREF', 'QKSWND', 'SPSSMI')

! 3.4 Possibly open a new BUFR message
!     --------------------------------------
         CALL split_date_char ( obs (loop_index) % valid_time % date_mm5, &amp;
                                year , month , day , hour , minute , second )

         idate = year * 1000000 + month * 10000 + day * 100 + hour 

!        write(6,*) 'working on ',cfm(fm),' id = ',obs (loop_index) % location % id

         CALL OPENMB (bfout, cfm(fm), idate)

!        Fill r8arr with HEADR Table-B mnemonics
!        SID
         SELECT CASE (cfm(fm))
         CASE ('SATWND', 'SATEMP','GOESND')
           kx = index(obs (loop_index) % location % id,'GOES')
           if (kx .eq. 0) kx = index(obs (loop_index) % location % id,'MET')
           sid = obs (loop_index) % location % id
           sid = sid(kx:40)
         CASE ('QKSWND')
           sid = 'QUIKSCAT'
         CASE ('SPSSMI')
           sid = 'SSMI'
         CASE ('SFCSHP')
           kx = index(obs (loop_index) % location % name,' &gt;&gt;&gt;')
           sid = obs (loop_index) % location % name
           if (kx .ne. 0) then
             sid = sid(kx+5:kx+9)
           else
             if (fm .eq. 13) then
               sid = 'SHIP'
             else if (fm .eq. 18) then
               sid = 'BUOY'
             else if (fm .eq. 19) then
               sid = 'C-MAN'
             else
               sid = obs (loop_index) % location % id
             endif
           endif
         CASE ('ADPSFC')
           if (fm .eq. 15 .or. fm .eq. 16) then
             kx = index(obs (loop_index) % location % name,'ICAO ')
             sid = obs (loop_index) % location % name
             if (kx .ne. 0) then
               sid = sid(kx+5:kx+9)
             else
               sid = obs (loop_index) % location % id
             endif
           else
             sid = obs (loop_index) % location % id
           endif
         CASE DEFAULT
           sid = obs (loop_index) % location % id
         END SELECT
         r8arr(1,1) = stuff (sid)
!        XOB
         r8arr(2,1) = obs (loop_index) % location % longitude
!        YOB
         IF (r8arr(2,1) &lt; 0.) r8arr(2,1) = 360. + r8arr(2,1)
         r8arr(3,1) = obs (loop_index) % location % latitude 

!        observation time - cycle time, DHR
!        Assume that time_analysis is the same as cycle time.

         r8arr(4,1) = 0

!        ELV
!        r8arr(5,1) = obs (loop_index) % info % elevation
         call assignv( obs (loop_index) % info % elevation, r8arr(5,1) )

!        report sequence number SQN
         if ( obs (loop_index) % info % seq_num == missing ) then
            r8arr(10,1) = bufrlib_missing
         else
            r8arr(10,1) = obs (loop_index) % info % seq_num
         end if

!        reported observation time RPT
         r8arr(11,1) = hour + (minute + second / 60.) / 60.

!        indicator whether obs time in dhr was corrected, TCOR
         r8arr(12,1) = 0
         
!        instrument type ITP
         r8arr(9,1) = bufrlib_missing

!        input report type T29
         r8arr(7,1) = t29(fm, obs (loop_index) % location % id)

!        report subtype TSB
!           no distinction in little_r
         r8arr(8,1) = bufrlib_missing

	 current =&gt; obs (loop_index) % surface
	 IF (ASSOCIATED (current)) then
	   vld = .true.
	 else
	   vld = .false.
	 endif
	 press = missing_r
	 temperat = missing_r
	 mixing_ratio = missing_r
	 if (vld) then
	   press = obs (loop_index) % surface % meas % pressure % data
	   temperat = obs (loop_index) % surface % meas % temperature % data
	   mixing_ratio = obs (loop_index) % surface % meas % qv % data
         endif
!        write(0,*) 'temperat = ',temperat,' loop_index = ',loop_index

         IF ( .not. eps_equal(mixing_ratio, missing_r, 1.) ) THEN       ! Is Humidity available?
           specific_humidity = mixing_ratio / (1 + mixing_ratio)
           IF ( .not. eps_equal(temperat, missing_r, 1.) ) THEN        ! Is temperature available?
             virtual_temperature = temperat * (1 + mixing_ratio/eps) / &amp;    ! TOB is virtual temperature. 
                                                  (1 + mixing_ratio)
             virtual_temperature = virtual_temperature - celkel       ! convert to Celsius
             r8arr(6,1) = typ (press, cfm(fm), fm, .true., missing_r) 
             specific_humidity = 1e6 * specific_humidity              ! convert humidity to mg/kg
           else
             virtual_temperature = bufrlib_missing
             r8arr(6,1) = typ (press, cfm(fm), fm, .false., missing_r) 
           ENDIF
         ELSE                                    ! No mixing_ratio, so store temperature instead of Tv
           specific_humidity = bufrlib_missing
           if ( .not. eps_equal(temperat, missing_r, 1.) ) then
             virtual_temperature = temperat - celkel
           else
             virtual_temperature = bufrlib_missing
           endif
           r8arr(6,1) = typ (press, cfm(fm), fm, .false., missing_r) 
         ENDIF

!        Write out HEADR
         CALL UFBSEQ (bfout, r8arr, 12, 1, nlv, 'HEADR')

!        PREPBUFR data category, CAT
!        http://www.emc.ncep.noaa.gov/mmb/data_processing/prepbufr.doc/table_1.htm#c
         r8arr(1,1) = 6               ! default value
         SELECT CASE (cfm(fm))
         CASE ('ADPSFC', 'SFCSHP', 'AIRCAR', 'AIRCFT', 'SATWND', 'QKSWND')
            if ( .not. eps_equal(temperat, missing_r, 1.)) then
	      if ( eps_equal(obs (loop_index) % surface % meas % u % data, missing_r, 1.) ) &amp;
               r8arr(1,1) = 0  ! surface temperature only (therefore, a mass report)
            endif
!           write(0,*) 'cat is set to ',r8arr(1,1)
!           write(0,*) 'temperat = ',temperat,' missing_r = ',missing_r
         END SELECT

         CALL UFBINT (bfout, r8arr, mxmn, 1, nlv, 'CAT')

         if ( cfm(fm) .ne. 'GPSIPW') then

!        PINFO :  PEVN
         call assignv(press, r8arr(1,1))
!              Convert to mb if not missing.
         IF ( r8arr(1,1) /= bufrlib_missing ) r8arr(1,1) = r8arr(1,1) * .01    !  POB

	 r8arr(2,1) = bufrlib_missing
         if (vld) r8arr(2,1) = qz (obs (loop_index) % surface % meas % pressure % qc)   !  PQM
         r8arr(3,1) = 1                                  !  pressure program code PPC
         r8arr(4,1) = 100                                ! pressure reason code PRC
         CALL UFBINT (bfout, r8arr, mxmn, 1, nlv, 'POB PQM PPC PRC')

!           PBACKG : POE and PFC
!        Convert error from Pa to mb
	 r8arr(1,1) = bufrlib_missing
         if (vld) r8arr(1,1) = obs (loop_index) % surface % meas % pressure % error * &amp;   ! POE
                      0.01
         r8arr(2,1) = bufrlib_missing                                            ! PFC
!           PPOSTP :  pressure analyzed value PAN, PCL, PCS
         r8arr(3:5,1) = bufrlib_missing            
         CALL UFBINT (bfout, r8arr, mxmn, 1, nlv, &amp;
                   'POE PFC PAN PCL PCS')

!        QINFO  :    QEVN and TDO
         r8arr(1,1) = specific_humidity            ! QOB
	 r8arr(2,1) = bufrlib_missing
         if (vld) r8arr(2,1) = qz (obs (loop_index) % surface % meas % qv % qc)     ! QCM
         r8arr(3,1) = 1                            ! humidity program code QPC
         r8arr(4,1) = 100                          ! humidity reason code QRC
         r8arr(5,1) = bufrlib_missing              ! TDO

!           QBACKG : QOE and QFC
!  NCEP uses 2.0, while WRF-Var/obsproc uses 1.0
         ! r8arr(6,1) = 2.0
         r8arr(6,1) = 1.0
         r8arr(7:8,1) = bufrlib_missing

!           QPOSTP
         r8arr(9:11,1) = bufrlib_missing     ! specific humidity analyzed value QAN, PCL, PCS
         CALL UFBINT (bfout, r8arr, mxmn, 1, nlv, &amp;
                      'QOB QQM QPC QRC TDO QOE QFC QAN PCL PCS')

!        TINFO : TEVN and TVO
         r8arr(1,1) = virtual_temperature       ! TOB
	 r8arr(2,1) = bufrlib_missing
         if (vld) r8arr(2,1) = qz (obs (loop_index) % surface % meas % temperature % qc)    ! TQM
         r8arr(3,1) = 1                         ! temperature program code TPC
         r8arr(4,1) = 100                       ! temperature reason code TRC
         r8arr(5,1) = bufrlib_missing           ! TVO

!           TBACKG :  TOE and TFC
	 r8arr(6,1) = bufrlib_missing
         if (vld) r8arr(6,1) = obs (loop_index) % surface % meas % temperature % error 
         r8arr(7,1) = bufrlib_missing

!           QPOSTP
         r8arr(9:10,1) = bufrlib_missing        ! temperature analyzed value TAN, PCL, PCS
         CALL UFBINT (bfout, r8arr, mxmn, 1, nlv, &amp;
                      'TOB TQM TPC TRC TVO TOE TFC TAN PCL PCS')

!        ZINFO :  ZEVN
	 r8arr(1:2,1) = bufrlib_missing
         if (vld) call assignv( obs (loop_index) % surface % meas % height % data, &amp;
            r8arr(1,1) )                        ! ZOB
	 if (vld) then
         if ( cfm(fm) .eq. 'SFCSHP' .and. &amp;
              eps_equal( obs (loop_index) % surface % meas % height % data, 0., 0.5) ) then
           r8arr(2,1) = 0.          ! If a ship's elevation is zero, fix the zqm
         else
           r8arr(2,1) = qz (obs (loop_index) % surface % meas % height % qc)     ! ZQM
         endif
         endif
         r8arr(3,1) = 1                         ! program code ZPC
         r8arr(4,1) = 100                       ! reason code ZRC

!           ZBACKG :  ZOE and ZFC
	 r8arr(5:6,1) = bufrlib_missing
         if (vld) r8arr(5,1) = obs (loop_index) % surface % meas % height % error * 0.1

!           ZPOSTP
         r8arr(7:9,1) = bufrlib_missing         ! analyzed value ZAN, PCL, PCS
         CALL UFBINT (bfout, r8arr, mxmn, 1, nlv, &amp;
                      'ZOB ZQM ZPC ZRC ZOE ZFC ZAN PCL PCS')

!        WINFO : WEVN
	 if (vld) then
         if ( eps_equal( obs (loop_index) % surface % meas % speed % data, missing_r, 1.) .or.  &amp;
              eps_equal( obs (loop_index) % surface % meas % direction % data, missing_r, 1.) ) then
           r8arr(1,1) = bufrlib_missing   ! UOB
           r8arr(5,1) = bufrlib_missing   ! VOB
         else
           r8arr(1,1) = obs (loop_index) % surface % meas % speed % data * &amp;  ! UOB
                              (-sin(pi/180.* obs (loop_index) % surface % meas % direction % data))
           r8arr(5,1) = obs (loop_index) % surface % meas % speed % data * &amp;  ! VOB
                              (-cos(pi/180.* obs (loop_index) % surface % meas % direction % data))
         endif

!        Combination of direction%qc and speed%qc give WQM
         r8arr(2,1) = qz (MAX(obs (loop_index) % surface % meas % speed % qc, &amp;    !  WQM
                          obs (loop_index) % surface % meas % direction % qc))
         wqm = r8arr(2,1)
         r8arr(3,1) = 1                         ! wind program code WPC
         r8arr(4,1) = 100                       ! wind reason code WRC

!           DFEVN Wind (direction/speed)
         call assignv( obs (loop_index) % surface % meas % direction % data, &amp;
            r8arr(6,1) )                        ! DDO

         call assignv( obs (loop_index) % surface % meas % speed % data, &amp;
            r8arr(7,1) )                        ! FFO
            r8arr(7,1) = r8arr(7,1) * 1.9425    ! convert to knots

         r8arr(8,1) = qz (MAX(obs (loop_index) % surface % meas % direction % qc, &amp;
                          obs (loop_index) % surface % meas % speed % qc))        ! DFQ
         r8arr(9,1) = 1                         ! wind program code DFP
         r8arr(10,1) = 100                      ! wind reason code DFR
	 endif
         if ( cfm(fm) .ne. 'GPSREF' ) then
           CALL UFBINT (bfout, r8arr, mxmn, 1, nlv, &amp;
                        'UOB WQM WPC WRC VOB DDO FFO DFQ DFP DFR')
         endif

         SELECT CASE (cfm(fm))
         CASE ('ADPSFC', 'ADPUPA', 'AIRCAR', 'AIRCFT', 'SFCSHP', 'SATWND')
!           WBACKG 
            if (vld) then
            r8arr(1,1) = obs (loop_index) % surface % meas % speed % error     ! WOE
            r8arr(2:3,1) = bufrlib_missing      ! UFC, VFC
            r8arr(4:5,1) = bufrlib_missing      ! WFC_MSQ = UFC_MOD VFC_MOD
!           WPOSTP 
            r8arr(6:9,1) = bufrlib_missing      ! analyzed values UAN and VAN, PCL, PCS
            CALL UFBINT (bfout, r8arr, mxmn, 1, nlv, &amp;
                         'WOE UFC VFC UFC_MOD VFC_MOD UAN VAN PCL PCS')
	    endif
         END SELECT

         SELECT CASE (cfm(fm))
         CASE ('ADPSFC', 'SFCSHP')
!     PMSL
!           write(6,*) 'sid = ',sid,' slp = ',obs (loop_index) % ground % slp % data
            if ( eps_equal( obs (loop_index) % ground % slp % data, &amp;
                                  missing_r, 1.) ) then
              r8arr(1:2,1) = bufrlib_missing      ! PMO PMQ
            else
              r8arr(1,1) = obs (loop_index) % ground % slp % data * 0.01     ! PMO
              r8arr(2,1) = qz (obs (loop_index) % ground % slp % qc)         ! PMQ
            endif
!           write(6,*) 'storing PMO = ',r8arr(1,1)
            CALL UFBINT (bfout, r8arr, 2, 1, nlv, 'PMO PMQ')

            IF (cfm(fm) == 'ADPSFC') THEN
               r8arr(1,1) = bufrlib_missing     !     ALTMSQ (ALSE)
               CALL UFBINT (bfout, r8arr, 1, 1, nlv, 'ALSE')
!     WSPDSQ
	       if (vld) then
               IF (obs (loop_index) % surface % meas % direction % data ==  &amp;
                   missing_r) THEN
                  IF ( eps_equal( obs (loop_index) % surface % meas % speed % data, &amp;
                                  missing_r, 1.) ) then
                     r8arr(1,1) =  bufrlib_missing
                  ELSE
                     r8arr(1,1) = obs (loop_index) % surface % meas % speed % data  ! SOB
                  ENDIF   
               ENDIF   
               r8arr(2,1) = wqm                                      ! SQM
               CALL UFBINT (bfout, r8arr, 2, 1, nlv, 'SOB SQM')
               endif
            ENDIF
        END SELECT

        else

        SELECT CASE (cfm(fm))
        CASE ('GPSIPW')
          r8arr(1,1) = 6.
          r8arr(2,1) = obs (loop_index) % ground  % pw   % data
          r8arr(3,1) = qz (obs (loop_index) % ground  % pw   % qc)
          r8arr(4,1) = 1
          r8arr(5,1) = 100
          r8arr(6,1) = obs (loop_index) % ground  % pw   % error
          CALL UFBINT (bfout, r8arr, 6, 1, nlv, 'CAT PWO PWQ PWP PWR PWE')
        END SELECT

        endif    ! gpsipw if-test

        if (cfm(fm) .eq. 'SPSSMI') then
          r8arr(1:11,1) = bufrlib_missing
          r8arr(1,1) = 6.
          r8arr(2,1) = 10.0*obs (loop_index) % ground  % pw  % data  !cm to mm
          r8arr(3,1) = qz (obs (loop_index) % ground  % pw   % qc)
          r8arr(4,1) = 1
          r8arr(5,1) = 100
          r8arr(6,1) = 10.0*obs (loop_index) % ground  % pw  % error !cm to mm
	  if (vld) then
            call assignv( obs (loop_index) % surface % meas % speed % data, &amp;
              r8arr(7,1) )                        ! FFO
            r8arr(7,1) = r8arr(7,1) * 1.9425    ! convert to knots

            r8arr(8,1) = qz (MAX(obs (loop_index) % surface % meas % direction % qc, &amp;
                          obs (loop_index) % surface % meas % speed % qc))        ! DFQ
           r8arr(9,1) = 1                         ! wind program code DFP
           r8arr(10,1) = 100                      ! wind reason code DFR
           r8arr(11,1) = obs (loop_index) % surface % meas % speed % error     ! WOE
	  endif
          CALL UFBINT (bfout, r8arr, 11, 1, nlv, 'CAT PWO PWQ PWP PWR PWE FFO DFQ DFP DFR WOE')
        endif

UPA: &amp;
      SELECT CASE (cfm(fm))
      CASE ('ADPUPA', 'PROFLR', 'SYNDAT', 'GPSREF')
!  
      current =&gt; obs (loop_index) % surface
!
!     Split the processing up into 2 do-loops because prebufr has a character string
!     limit of 80 characters in the ufbint call

      is_sound = -1

      nlevels = 0

levels1:&amp;
      DO WHILE (ASSOCIATED (current))

      nlevels  = nlevels  + 1
      is_sound = is_sound + 1

! SATEM thickness is assigned to temperature field:

!     if (fm == 86) &amp;
!        current % meas % temperature = current % meas % thickness


!     if(change_qc) then
!        current % meas % temperature % qc = -88
!        current % meas % dew_point   % qc = -88
!        current % meas % rh          % qc = -88
!
!        if(current % meas % height   % qc &gt;= 0) then
!           current % meas % pressure % qc = -88
!        end if
!     end if

      r8arr(1,nlevels) = 1           ! assign cat 1 (mandatory level) for all levels
      call assignv(current % meas % pressure % data, r8arr(2,nlevels))
      if ( r8arr(2,nlevels) /= bufrlib_missing ) r8arr(2,nlevels) = r8arr(2,nlevels) * .01
      r8arr(3,nlevels) = qz (current % meas % pressure % qc)
      r8arr(4,nlevels) = 1
      r8arr(5,nlevels) = 100
      r8arr(6,nlevels) = current % meas % pressure % error * 0.01
      press = current % meas % pressure % data
      temperat = current % meas % temperature % data
      mixing_ratio = current % meas % qv % data
      if ( .not. eps_equal(mixing_ratio, missing_r, 1.) ) then
        specific_humidity = mixing_ratio / (1 + mixing_ratio)
        if ( .not. eps_equal(temperat, missing_r, 1.) ) then        !  Is temperature available?
          virtual_temperature = temperat * (1 + mixing_ratio/eps) / &amp;     !  TOB is virtual temperature.
                                           (1 + mixing_ratio)
          virtual_temperature = virtual_temperature - celkel      !  convert to Celsius
          r8arr(12,nlevels) = virtual_temperature
          specific_humidity = 1e6 * specific_humidity             !  convert humidity to mg/kg
        else
          virtual_temperature = bufrlib_missing
        endif
      else                 ! mixing ratio missing
        specific_humidity = bufrlib_missing
        if ( .not. eps_equal(temperat, missing_r, 1.) ) then
          virtual_temperature = temperat - celkel
        else
          virtual_temperature = bufrlib_missing
        endif
      endif

      r8arr(7,nlevels) = specific_humidity
      r8arr(12,nlevels) = virtual_temperature
      r8arr(8,nlevels) = qz (current % meas % dew_point % qc)
      r8arr(9,nlevels) = 1
      r8arr(10,nlevels) = 100
! convert error to percent divided by 10
      r8arr(11,nlevels) = current % meas % rh % error * 0.1
      r8arr(13,nlevels) = qz (current % meas % temperature % qc)
      r8arr(14,nlevels) = 1
      r8arr(15,nlevels) = 100
      r8arr(16,nlevels) = current % meas % temperature % error 

      current =&gt; current%next

      ENDDO levels1

      CALL UFBINT (bfout, r8arr, mxmn, nlevels, nlv, 'CAT POB PQM PPC PRC POE QOB QQM QPC QRC QOE TOB TQM TPC TRC TOE')

      current =&gt; obs (loop_index) % surface
!
      is_sound = -1

      nlevels = 0

      sid = obs (loop_index) % location % id
!!    if ( index (sid,'47678') .ne. 0 ) then
!     if ( trim(sid) .eq. '47678') then
!       write(6,*) 'sid = ', TRIM(sid)
!     endif

levels2:&amp;
      DO WHILE (ASSOCIATED (current))

      nlevels  = nlevels  + 1
      is_sound = is_sound + 1

!     if ( index (sid,'47678') .ne. 0 ) then
!     if ( trim(sid) .eq. '47678') then
!     if ( trim(sid) .eq. 'ZB678') then
!       write(6,*) 'level = ',nlevels,' z = ',current % meas % height % data
!       write(6,*) '   press  = ',current % meas % pressure % data
!       write(6,*) '   dir = ',current % meas % direction % data,'  speed = ',current % meas % speed % data
!       write(6,*) '   speed qc = ',current % meas % speed % qc,'  dir qc = ',current % meas % direction % qc
!       write(6,*) '   t = ',current % meas % temperature % data
!     endif

      call assignv(current % meas % height % data, r8arr(1,nlevels))
      if ( r8arr(1,nlevels) /= bufrlib_missing ) r8arr(1,nlevels) = r8arr(1,nlevels) 
      r8arr(2,nlevels) = qz (current % meas % height % qc)
      r8arr(3,nlevels) = 1
      r8arr(4,nlevels) = 100
      r8arr(5,nlevels) = current % meas % height % error 
REF: &amp;
      SELECT CASE (cfm(fm))
      CASE ('GPSREF')
        if ( eps_equal( current % meas % dew_point % data, missing_r, 1.)) then
          r8arr(6,nlevels) = bufrlib_missing
        else
          r8arr(6,nlevels) = current % meas % dew_point % data
        endif
        r8arr(7,nlevels) = qz (current % meas % dew_point % qc)
        r8arr(8,nlevels) = 1
        r8arr(9,nlevels) = 100
        r8arr(10,nlevels) = current % meas % dew_point % error 
        r8arr(11,nlevels) = bufrlib_missing
      CASE DEFAULT
        if ( eps_equal( current % meas % speed % data, missing_r, 1.) .or.  &amp;
             eps_equal( current % meas % direction % data, missing_r, 1.) ) then
          r8arr(6,nlevels) = bufrlib_missing
          r8arr(10,nlevels) = bufrlib_missing
        else
          r8arr(6,nlevels) = current % meas % speed % data * (-sin(pi/180.* current % meas % direction % data))
          r8arr(10,nlevels) = current % meas % speed % data * (-cos(pi/180.* current % meas % direction % data))
        endif
        r8arr(7,nlevels) = qz (MAX(current % meas % direction % qc, current % meas % speed % qc))
        r8arr(8,nlevels) = 1
        r8arr(9,nlevels) = 100
        r8arr(11,nlevels) = current % meas % u % error 

      END SELECT REF

      current =&gt; current%next

      ENDDO levels2

      SELECT CASE (cfm(fm))
      CASE ('GPSREF')
        CALL UFBINT (bfout, r8arr, mxmn, nlevels, nlv, 'ZOB ZQM ZPC ZRC ZOE ROB RQM RPC RRC ROE RFC')
      CASE DEFAULT
        CALL UFBINT (bfout, r8arr, mxmn, nlevels, nlv, 'ZOB ZQM ZPC ZRC ZOE UOB WQM WPC WRC VOB WOE')
      END SELECT
      
      END SELECT UPA

      SATWIND: &amp;
      SELECT CASE (cfm(fm))        ! set the said parameter
      CASE ('SATWND')
        if (index(obs(loop_index) % location % id, 'GOES') .ne. 0) then
          r8arr(1,1) = 252
        else if (index(obs(loop_index) % location % id, 'MET') .ne. 0) then
          r8arr(1,1) = 54
        endif

!       current =&gt; obs (loop_index) % surface
!  write(6,*) ' ID = ',obs(loop_index) % location % id,' name = ',obs(loop_index) % location % name
!  write(6,*) 'lat = ',obs(loop_index) % location % latitude,' lon = ',obs(loop_index) % location % longitude
!  write(6,*) 'p = ',current % meas % pressure % data, &amp;
!   ' speed = ',current % meas % speed % data,' dir = ',current % meas % direction % data
!   write(6,*) 'said = ',r8arr(1,1)

        CALL UFBINT (bfout, r8arr, 1, 1, nlv, 'SAID')

      CASE ('QKSWND')
        r8arr(1,1) = 281
        CALL UFBINT (bfout, r8arr, 1, 1, nlv, 'SAID')
      END SELECT SATWIND


      CALL WRITSB (bfout)

      CASE DEFAULT   
!       PRINT *, 'Erroneous cfm value,  fm = ',fm,' cfm = ',cfm(fm)

     END SELECT SUBSET  

      ENDIF stations_valid

! 3.3 Go to next record
!     -----------------

      ENDDO stations

      CALL CLOSBF (bfout)

#else
      PRINT *, 'No Prepbufr data output, BUFR compilation is needed to turn it on !!!'
#endif

   RETURN

END SUBROUTINE output_prep

!-------------------------------------------------------
<A NAME='STUFF'><A href='../../html_code/obsproc/module_write.F90.html#STUFF' TARGET='top_target'><IMG SRC="../../gif/bar_green.gif" border=0></A>

   FUNCTION stuff (c)
   REAL (KIND=8) :: stuff

!  Puts the first 8 characters in c into an 8 byte array

!  Original: James F. Drake, 09/22/05
!  This function may not work on some of the Cray fortran
!  processors, which store character variables in an acceptable
!  but unusual way.

   CHARACTER (LEN=40) c
   CHARACTER (LEN=1) d(8)
   integer (kind=1) :: x(8)
   REAL (KIND=8) :: y
   INTEGER clen, i
   EQUIVALENCE(x, y)

   READ (c, '(8a1)') d
   x = IACHAR(d)
   stuff = y
   RETURN

END FUNCTION stuff

!-------------------------------------------------------
<A NAME='T29'><A href='../../html_code/obsproc/module_write.F90.html#T29' TARGET='top_target'><IMG SRC="../../gif/bar_green.gif" border=0></A>

   FUNCTION t29(fm, sid) 1
   IMPLICIT NONE
   REAL (KIND=8) :: t29
   INTEGER :: fm
   character*40 sid

!     http://www.emc.ncep.noaa.gov/mmb/data_processing/prepbufr.doc/table_6.htm
!     input report type T29

      SELECT CASE (fm)
      CASE (12, 14)              ! synoptic
         t29 = 511
      CASE (13)             ! ship
         IF (TRIM(sid) /= 'SHIP') THEN
!           ship with name
            t29 = 522
         ELSE
!           ship without name
            t29 = 523
         ENDIF
      CASE (15:16)              ! METAR   
            t29 = 512 
      CASE (18)                 ! buoy 
!        What are possible identifiers for drifting buoys?
         IF (TRIM(sid) /= 'DRIB') THEN
!           fixed buoy     
            t29 = 561
         ELSE
!           drifting buoy     
            t29 = 562
         ENDIF
      CASE (19)               ! C-MAN
         t29 = 531
      CASE (32, 35)           ! sounding
         t29 = 11
      CASE (34, 38)           ! land mobil sounding
         t29 = 13
      CASE (33, 36)           ! ship sounding
         t29 = 22
      CASE (37)               ! dropsonde
         t29 = 22
      CASE (42, 96:97)        ! aircraft flight level
         t29 = 41
      CASE (86:87)            ! satellite
         t29 = 61
      CASE (88)               ! satellite-derived winds
         t29 = 63
      CASE (111)              ! assign 583 to gpspwv until we find what NCEP uses
         t29 = 583 
      CASE (116)              ! assign 584 to gpsref 
         t29 = 584 
      CASE (125)              ! ssmi pw
         t29 = 65  
      CASE (132)              ! wind profiler
         t29 = 71  
      CASE (141)              ! modis 
         t29 = 63  
      CASE (281)              ! quikscat
         t29 = 582
      CASE DEFAULT
         t29 = 500            ! default to 500 (things we haven't added yet)
      END SELECT
END FUNCTION t29

!-------------------------------------------------------
<A NAME='TYP'><A href='../../html_code/obsproc/module_write.F90.html#TYP' TARGET='top_target'><IMG SRC="../../gif/bar_green.gif" border=0></A>

   FUNCTION typ (press, cfmfm, fm, ltemp, missing_r)  5
   IMPLICIT NONE
   REAL (KIND=8) :: typ

REAL :: press, missing_r
INTEGER :: fm
CHARACTER*6 :: cfmfm
LOGICAL :: ltemp   ! temperature available?

!     http://www.emc.ncep.noaa.gov/mmb/data_processing/prepbufr.doc/table_2.htm
!     PREPBUFR report type TYP

   if ( cfmfm .eq. 'ADPSFC' .or. cfmfm .eq. 'SFCSHP' ) then
   IF ( ltemp ) THEN
      IF ( .not. eps_equal(press, missing_r, 1.) ) THEN
!        TYP the PREPBUFR report type.
         SELECT CASE(cfmfm)
         CASE ('ADPSFC')
               typ = 181    ! per direction of Jim Bresch, NCAR
         CASE ( 'SFCSHP')
               typ = 180
         END SELECT
      ELSE
!        No. 
         press = bufrlib_missing
!        Determine the code for TYP the PREPBUFR report type.
!        Altimeter setting always missing.
         typ = 183
      ENDIF 
   ELSE
!     temperature, and hence TOB, is missing
!     TYP
!     Station pressure reported?
      IF (.not. eps_equal(press, missing_r, 1.) ) THEN
!        Determine the code for TYP the PREPBUFR report type.
         SELECT CASE(cfmfm)
         CASE ('ADPSFC')
            typ = 181
         CASE ('SFCSHP')
            typ = 183
         END SELECT
      ELSE
!        No. Determine the code for TYP the PREPBUFR report type.
!        Altimeter setting always missing.
         typ = 183
         SELECT CASE(cfmfm)
         CASE ('ADPSFC', 'SFCSHP')
            typ = 183
         END SELECT
      ENDIF
   ENDIF
   else
     SELECT CASE (fm)
     CASE (32, 33) 
        typ = 221
     CASE (34, 38) 
        typ = 222
     CASE (35, 36) 
        typ = 120
     CASE (37) 
        typ = 232
     CASE (42) 
        typ = 231
     CASE (86:87)        ! incomplete (but not necessary)
        typ = 164
     CASE (88) 
        typ = 146
     CASE (96:97) 
        typ = 230
     CASE (111) 
        typ = 156       ! use goes entry for gpspw
     CASE (116) 
        typ = 160       ! assign 160 to gpsref
     CASE (125) 
        typ = 152       ! ssmi pw
     CASE (132) 
        typ = 223
     CASE (135)         ! tc bogus
        typ = 111
     CASE (141)         ! use satwnd for modis
        typ = 146
     CASE (281) 
        typ = 285
     CASE DEFAULT
        write(6,*) 'Cannot determine typ for FM = ',fm
     END SELECT
   endif
END FUNCTION typ

!-------------------------------------------------------
<A NAME='ASSIGNV'><A href='../../html_code/obsproc/module_write.F90.html#ASSIGNV' TARGET='top_target'><IMG SRC="../../gif/bar_red.gif" border=0></A>

subroutine assignv(x, y) 8
   real (kind=8) :: y
   real x

   if (eps_equal(x, missing_r, 1.)) then
      y = bufrlib_missing
   else
      y = x
   end if
end subroutine assignv
 
!-------------------------------------------------------
<A NAME='QZ'><A href='../../html_code/obsproc/module_write.F90.html#QZ' TARGET='top_target'><IMG SRC="../../gif/bar_green.gif" border=0></A>

   FUNCTION qz (qc)
   IMPLICIT NONE
   real (kind=8) :: qz
   INTEGER :: qc

!  convert qc flag to the ncep prepbufr qc value

if (qc .le. 128 .and. qc .ge. -5 ) then
  qz = 0
else
  qz = 4    ! &gt;= 4 is reject
endif

END FUNCTION qz

END MODULE module_write