Ignore:
Timestamp:
Dec 4, 2009, 8:26:01 PM (14 years ago)
Author:
George Lilly
Message:

WorldVistAEHR overlayed on FOIAVistA

Location:
FOIAVistA/tag/r
Files:
9 edited
1 copied

Legend:

Unmodified
Added
Removed
  • FOIAVistA/tag/r/BAR_CODE_MED_ADMIN-ALPB-PSB/ALPBGEN1.m

    r628 r636  
    1 ALPBGEN1 ;SFVAMC/JC - Parse and File HL7 PMU messages ;05/10/07
    2  ;;3.0;BAR CODE MED ADMIN;**8,37**;Mar 2004;Build 10
    3  ;;Per VHA Directive 2004-038, this routine should not be modified.
     1ALPBGEN1 ;SFVAMC/JC - Parse and File HL7 PMU messages ;04/30/2003  07:59
     2 ;;3.0;BAR CODE MED ADMIN;**8**;Mar 2004
    43 Q
    54 ;
     
    4544 ;If SSN lookup fails, try name lookup and add
    4645 I +Y<1 S DLAYGO=200,DIC="^VA(200,",DIC(0)="LM",X=ALPBNAM D ^DIC K DIC,DA,DR
    47  I +Y>0 S (ALPBDA,DA,DUZ)=+Y S ALPBMENU=$O(^DIC(19,"B","PSB BCBU WRKSTN MAIN",0)) D
     46 I +Y>0 S (ALPBDA,DA)=+Y S ALPBMENU=$O(^DIC(19,"B","PSB BCBU WRKSTN MAIN",0)) D
    4847 . S DIE="^VA(200,",DR="2////^S X=ALPBAC"
    4948 . ;Update name too
  • FOIAVistA/tag/r/BAR_CODE_MED_ADMIN-ALPB-PSB/ALPBINP.m

    r628 r636  
    11ALPBINP ;OIFO-DALLAS/SED/KC/MW  BCMA - BCBU INPT TO HL7 ;5/2/2002
    2  ;;3.0;BAR CODE MED ADMIN;**8,37**;May 2007;Build 10
    3  ;;Per VHA Directive 2004-038, this routine should not be modified.
     2 ;;3.0;BAR CODE MED ADMIN;**8**;Mar 2004
    43 ;This routine will intercept the HL7 message that it sent from Pharmacy
    54 ;to CPRS to update order information. The message is then parsed and
     
    4645 D EN^PSJBCBU(ALPDFN,ALPORD,.ALPB)
    4746SEED ;Entry point for ^ALPBIND
    48  N VAIN
    4947 D INIT
    5048 S SUB=0 F  S SUB=$O(ALPB(SUB)) Q:'SUB  D
     
    6765 ;Get the Division that the patient is associated with
    6866 D PDIV
    69  I ALPDIV="DOM",+$$GET^XPAR("PKG.BAR CODE MED ADMIN","PSB BKUP DOM FILTER",1,"Q")>0 Q "0^^Screen of DOMICILIARY"
     67 I ALPDIV="DOM" Q "0^^Screen of DOMICILIARY"
    7068 I '$D(HLL("LINKS")) Q "0^HL7^Missing HLL Links Array Division # "_ALPDIV
    7169 ;SET NEW PV1
     
    144142 S ALPDIV=$$DIV^ALPBUTL1(ALPDFN,ALPBMDT)
    145143 ;Screen Dom
    146  I ALPDIV="DOM",+$$GET^XPAR("PKG.BAR CODE MED ADMIN","PSB BKUP DOM FILTER",1,"Q")>0 Q
     144 Q:ALPDIV="DOM"
    147145 ;Now do I send the Message or not Based of Division
    148146 I $D(ALPHLL("LINKS")) M HLL("LINKS")=ALPHLL("LINKS")
     
    161159 ;Get the Division that the patient is associated with
    162160 D PDIV
    163  I ALPDIV="DOM",+$$GET^XPAR("PKG.BAR CODE MED ADMIN","PSB BKUP DOM FILTER",1,"Q")>0 Q "0^^Screen of DOMICILIARY"
     161 I ALPDIV="DOM" Q "0^^Screen of DOMICILIARY"
    164162 I '$D(HLL("LINKS")) Q "0^"_ALPML_"^Missing HLL Links Array Med-Log"
    165163 S ALPST=$P($G(^PSB(53.79,ALPML,0)),U,9)
     
    202200 ;Get the Division that the patient is associated with
    203201 D PDIV
    204  I ALPDIV="DOM",+$$GET^XPAR("PKG.BAR CODE MED ADMIN","PSB BKUP DOM FILTER",1,"Q")>0 Q "0^^Screen of DOMICILIARY"
     202 I ALPDIV="DOM" Q "0^^Screen of DOMICILIARY"
    205203 I '$D(HLL("LINKS")) Q "0^"_ALPDFN_"^Missing HLL Links Array Pat-Move"
    206204 S HLA("HLS",1)=$$EN^VAFHLPID(ALPDFN,"2,7,8,19")
  • FOIAVistA/tag/r/BAR_CODE_MED_ADMIN-ALPB-PSB/ALPBPWRD.m

    r628 r636  
    11ALPBPWRD ;OIFO-DALLAS MW,SED,KC-PRINT 3-DAY MAR BCMA BCBU REPORT FOR A SELECTED WARD ;01/01/03
    2  ;;3.0;BAR CODE MED ADMIN;**8,37**;Mar 2004;Build 10
    3  ;;Per VHA Directive 2004-038, this routine should not be modified.
     2 ;;3.0;BAR CODE MED ADMIN;**8**;Mar 2004
    43 ;
    54 ; NOTE: this routine is designed for hard-copy output.
     
    144143 I ALPBSORT="R" D
    145144 .S ALPBD="",ALPRM=""
    146  .F  S ALPBPTN=$O(^TMP($J,ALPBPTN)) Q:ALPBPTN=""  D  Q:ALPBPTN=""
     145 .F  S ALPBPTN=$O(^TMP($J,ALPBPTN)) Q:ALPBPTN=""  D
    147146 ..I ALPBPTN="BCBU" S ALPBPTN=$O(^TMP($J,ALPBPTN)) ;SKIP "BCBU" SUBSCRIBE
    148  ..I ALPBPTN="" Q  ;PSB*3*37 Stop null subscript when "BCBU" is the last entry in ^TMP
    149147 ..S ALPBIEN=^TMP($J,ALPBPTN) S ALPRM=$P($G(^ALPB(53.7,ALPBIEN,0)),"^",6),ALPBD=$P($G(^ALPB(53.7,ALPBIEN,0)),"^",7)
    150148 ..I ALPBD="" S ALPB="NONE" I ALPRM="" S ALPB="NONE" ;INCASE NO ROOM AND BED YET
  • FOIAVistA/tag/r/BAR_CODE_MED_ADMIN-ALPB-PSB/ALPBUTL1.m

    r628 r636  
    11ALPBUTL1 ;OIFO-DALLAS MW,SED,KC-BCBU BACKUP REPORT FUNCTIONS AND UTILITIES  ;01/01/03
    2  ;;3.0;BAR CODE MED ADMIN;**8,37**;Mar 2004;Build 10
    3  ;;Per VHA Directive 2004-038, this routine should not be modified.
     2 ;;3.0;BAR CODE MED ADMIN;**8**;Mar 2004
    43 ;
    54 ; Reference/IA
     
    181180 Q:+ALPWRD'>0 ""
    182181 ;Check to see if ward is a DOMICILIARY
    183  I $P($G(^DIC(42,ALPWRD,0)),U,3)="D",+$$GET^XPAR("PKG.BAR CODE MED ADMIN","PSB BKUP DOM FILTER",1,"Q")>0 Q "DOM"
     182 I $P($G(^DIC(42,ALPWRD,0)),U,3)="D" Q "DOM"
    184183 S ALPBDIV=$P($G(^DIC(42,ALPWRD,0)),U,11)
    185184 Q:+ALPBDIV'>0 ""
  • FOIAVistA/tag/r/BAR_CODE_MED_ADMIN-ALPB-PSB/PSBO.m

    r628 r636  
    11PSBO ;BIRMINGHAM/EFC-BCMA OUTPUTS ;Mar 2004
    2  ;;3.0;BAR CODE MED ADMIN;**13,32,2**;Mar 2004;Build 22
     2 ;;3.0;BAR CODE MED ADMIN;**13,32**;Mar 2004;Build 32
    33 ;Per VHA Directive 2004-038 (or future revisions regarding same), this routine should not be modified.
    44 ; Reference/IA
     
    7171 D:PSBSAVE
    7272 .;Check Drug to Patient Relationship.
    73  .I (PSBTYPE="BL")!(PSBTYPE="BZ") S PSBANS="" D CHECK  I PSBANS=0!($D(DIRUT)) W !,"Cancelling Request..." S DIK="^PSB(53.69," D ^DIK W "Cancelled!" Q
     73 .I PSBTYPE="BL" S PSBANS="" D CHECK  I PSBANS=0!($D(DIRUT)) W !,"Cancelling Request..." S DIK="^PSB(53.69," D ^DIK W "Cancelled!" Q
    7474 .;
    7575 .;Allow "'BROWSER" Device
  • FOIAVistA/tag/r/BAR_CODE_MED_ADMIN-ALPB-PSB/PSBO1.m

    r628 r636  
    11PSBO1 ;BIRMINGHAM/EFC-BCMA OUTPUTS ;Mar 2004
    2  ;;3.0;BAR CODE MED ADMIN;**4,13,32,2**;Mar 2004;Build 22
     2 ;;3.0;BAR CODE MED ADMIN;**4,13,32**;Mar 2004;Build 32
    33 ;Per VHA Directive 2004-038 (or future revisions regarding same), this routine should not be modified.
    44 ; Reference/IA
     
    99 K RESULTS
    1010 ; Check Type
    11  I '$F("DL^MD^MH^ML^MM^MV^MT^PE^PM^WA^BL^PI^AL^DO^VT^PF^XA^IV^CM^CP^CE^CI^BZ^",PSBRTYP) S RESULTS(0)="-1^Invalid Report Type" Q
     11 I '$F("DL^MD^MH^ML^MM^MV^MT^PE^PM^WA^BL^PI^AL^DO^VT^PF^XA^IV^CM^CP^CE^CI^",PSBRTYP) S RESULTS(0)="-1^Invalid Report Type" Q
    1212 I '+$G(DUZ) S RESULTS(0)="-1^Undefined User" Q
    1313 I '$G(DUZ(2)) S RESULTS(0)="-1^Undefined Division" Q
    1414 ; Lock Log
    15  L +(^PSB(53.69,0)):$S($G(DILOCKTM)>0:DILOCKTM,1:3)
     15 L +(^PSB(53.69,0)):0
    1616 E  S RESULTS(0)="-1^Request Log Locked" Q
    1717 ; Generate Unique Entry and Create
  • FOIAVistA/tag/r/BAR_CODE_MED_ADMIN-ALPB-PSB/PSBOMH1.m

    r628 r636  
    1 PSBOMH1 ;BIRMINGHAM/EFC-MAH ;Mar 2004
    2  ;;3.0;BAR CODE MED ADMIN;**6,3,9,11,26,38**;Mar 2004;Build 8
     1PSBOMH1 ;BIRMINGHAM/EFC-MAH ;7:40 PM  30 Jan 2008
     2 ;;3.0;BAR CODE MED ADMIN;**6,3,9,11,26,38,VWEHR1**;WorldVistA 30-Jan-08
    33 ;Per VHA Directive 2004-038, this routine should not be modified.
     4 ;
     5 ;Modified from FOIA VISTA,
     6 ;Copyright 2008 WorldVistA.  Licensed under the terms of the GNU
     7 ;General Public License See attached copy of the License.
     8 ;
     9 ;This program is free software; you can redistribute it and/or modify
     10 ;it under the terms of the GNU General Public License as published by
     11 ;the Free Software Foundation; either version 2 of the License, or
     12 ;(at your option) any later version.
     13 ;
     14 ;This program is distributed in the hope that it will be useful,
     15 ;but WITHOUT ANY WARRANTY; without even the implied warranty of
     16 ;MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
     17 ;GNU General Public License for more details.
     18 ;
     19 ;You should have received a copy of the GNU General Public License along
     20 ;with this program; if not, write to the Free Software Foundation, Inc.,
     21 ;51 Franklin Street, Fifth Floor, Boston, MA 02110-1301 USA.
    422 ;
    523 ; Reference/IA
     
    123141 I PSBGA'=1 S PSBTMP(10000000-$P(PSBMLA(0),U,6),"A")=$P(PSBMLA(0),U,6)_U_$$INITIAL^PSBRPC2($P(PSBMLA(0),U,7))
    124142 S PSBQRY="PSBTMP",PSBCNT=1 F  S PSBQRY=$Q(@PSBQRY) Q:PSBQRY=""  D  ; does comment go with action
    125  .S PSBPQRY=$Q(@PSBQRY,-1)
     143 .;
     144 .;WV/EHR REVERSE $Q REPLACEMENT; SO 01/12/08 ;VWEHR1
     145 .;
     146 .;S PSBPQRY=$Q(@PSBQRY,-1)
     147 .S PSBPQRY=$$Q^VWUTIL($NA(@PSBQRY),-1)
     148 .;
     149 .;END CHANGE
     150 .;
    126151 .I PSBPQRY="" S PSBTAR(PSBCNT)=@PSBQRY,PSBCNT=PSBCNT+1 Q  ; no prev action
    127152 .I $QS(PSBPQRY,2)="C"  S PSBTAR(PSBCNT)=@PSBQRY,PSBCNT=PSBCNT+1 Q  ; prev line = comment
  • FOIAVistA/tag/r/BAR_CODE_MED_ADMIN-ALPB-PSB/PSBPOIV.m

    r628 r636  
    11PSBPOIV ;BIRMINGHAM/EFC-IV PARAMETER VALIDATION ;Mar 2004
    2  ;;3.0;BAR CODE MED ADMIN;**2**;Mar 2004;Build 22
    3  ;;Per VHA Directive 2004-038 (or future revisions regarding same), this routine should not be modified.
     2 ;;3.0;BAR CODE MED ADMIN;;Mar 2004
    43 ;
    54 ; Reference/IA
     5 ; ^DIC(42/1377
    66 ; ^DIC(42/2440
     7 ; EN^PSJCBMA1/2829
    78 ; EN^PSJBCMA2/2830
    8  ; VADPT/10061
    9  ;
     9 ; DIQ(2/10035
    1010 ;
    1111EN(PSBDFN,PSBORD) ;
     
    1616 ; get IV parameters for the current ward
    1717 S PSBCSTR="^ADDITIVE^STRENGTH^BOTTLE^SOLUTION^VOLUME^INFUSION RATE^MED ROUTE^SCHEDULE^ADMIN TIME^REMARKS^OTHER PRINT INFO^PROVIDER^START DATE/TIME^STOP DATE/TIME^PROVIDER COMMENTS"
    18  D INP^VADPT S PSBWARD=$P(VAIN(4),"^"),PSBWDIV=PSBWARD D KVAR^VADPT
     18 S PSBWARD=$$GET1^DIQ(2,PSBDFN_",",.1),PSBWARD=$$FIND1^DIC(42,"","X",PSBWARD),PSBWDIV=PSBWARD
    1919 I $G(PSBWARD)'="",$D(^PSB(53.66,"B",PSBWARD)) D  ; if IV paramaters defined for ward use them
    2020 .S PSBWARD=$O(^PSB(53.66,"B",PSBWARD,""))
     
    2222 I '$D(PSBIVPAR) S PSBIVPAR=PSBIVT D  ; if IV parameters not defined for ward get defaults for division
    2323 .D:$D(PSBWDIV)  ; Get the appropriate DIV for ward and DIVISIONAL IV PARAMETERS
    24  ..S PSBWDIV=$$GET1^DIQ(42,PSBWDIV_",",.015,"I")
     24 ..S PSBWDIV=$$GET1^DIQ(42,PSBWDIV_",",.015,"I"),PSBWDIV=$P($$SITE^VASITE(DT,PSBWDIV),U,1)
    2525 ..I $G(PSBWDIV)']"" S PSBWDIV="DIV"
    26  ..E  S PSBWDIV=$P($$SITE^VASITE(DT,PSBWDIV),U,1),PSBWDIV="DIV.`"_PSBWDIV
     26 ..E  S PSBWDIV="DIV.`"_PSBWDIV
    2727 ..F X=2:1 Q:$P(PSBCSTR,U,X)=""  S PSBIVPAR=PSBIVPAR_U_$P($P($$GET^XPAR(PSBWDIV,"PSBIV "_$P(PSBCSTR,U,X),PSBIVT,"B"),U,2),"-",1)
    2828 ..K PSBWDIV ; Kill temp variable.
  • FOIAVistA/tag/r/BAR_CODE_MED_ADMIN-ALPB-PSB/PSBRPC2.m

    r628 r636  
    1 PSBRPC2 ;BIRMINGHAM/EFC-BCMA RPC BROKER CALLS ;Mar 2004
    2  ;;3.0;BAR CODE MED ADMIN;**6,3,16,32**;Mar 2004;Build 32
     1PSBRPC2 ;BIRMINGHAM/EFC-BCMA RPC BROKER CALLS ;7:42 PM  30 Jan 2008
     2 ;;3.0;BAR CODE MED ADMIN;**6,3,16,32,WVEHR1**;WorldVistA 30-Jan-08
    33 ;Per VHA Directive 2004-038 (or future revisions regarding same), this routine should not be modified.
     4 ;
     5 ;Modified from FOIA VISTA,
     6 ;Copyright 2008 WorldVistA.  Licensed under the terms of the GNU
     7 ;General Public License See attached copy of the License.
     8 ;
     9 ;This program is free software; you can redistribute it and/or modify
     10 ;it under the terms of the GNU General Public License as published by
     11 ;the Free Software Foundation; either version 2 of the License, or
     12 ;(at your option) any later version.
     13 ;
     14 ;This program is distributed in the hope that it will be useful,
     15 ;but WITHOUT ANY WARRANTY; without even the implied warranty of
     16 ;MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE.  See the
     17 ;GNU General Public License for more details.
     18 ;
     19 ;You should have received a copy of the GNU General Public License along
     20 ;with this program; if not, write to the Free Software Foundation, Inc.,
     21 ;51 Franklin Street, Fifth Floor, Boston, MA 02110-1301 USA.
    422 ;
    523 ; Reference/IA
     
    5472 Q
    5573 ;
    56 BAGDTL(RESULTS,PSBUID,PSBORD)  ; bag detail
     74BAGDTL(RESULTS,PSBUID,PSBORD) ; bag detail
    5775 I $G(DFN)="" S DFN=+PSBUID
    5876 S (PSBIEN,X)="" F  S X=$O(^PSB(53.79,"AUID",DFN,X)) Q:X=""  S:$D(^PSB(53.79,"AUID",DFN,X,PSBUID)) PSBIEN=$O(^PSB(53.79,"AUID",DFN,X,PSBUID,"")) Q:PSBIEN]""
     
    85103INITIAL(PSBDUZ) ;
    86104 Q $$GET1^DIQ(200,PSBDUZ,"INITIAL")
    87 SCANMED(RESULTS,PSBDIEN,PSBTAB)  ; Lookup Medication
     105SCANMED(RESULTS,PSBDIEN,PSBTAB) ; Lookup Medication
    88106 ;
    89107 ; RPC: PSB SCANMED
Note: See TracChangeset for help on using the changeset viewer.