Home   Package List   Routine Alphabetical List   Global Alphabetical List   FileMan Files List   FileMan Sub-Files List   Package Component Lists   Package-Namespace Mapping  
Routine: RORX019A

RORX019A.m

Go to the documentation of this file.
  1. RORX019A ;BPOIFO/ACS - LIVER SCORE BY RANGE (CONT.) ; 8/23/11 8:38am
  1. ;;1.5;CLINICAL CASE REGISTRIES;**10,13,14,16**;Feb 17, 2006;Build 3
  1. ;
  1. ;08/23/2011 BP/KAM ROR*1.5*16 Remedy Call 512757 Correct the Liver
  1. ; Score Calculation
  1. ;
  1. ; This routine uses the following IAs:
  1. ;
  1. ; #10105 $$LN^XLFMTH (supported)
  1. ; #3556 GCPR^LA7QRY (supported)
  1. ; #10061 DEM^VADPT (supported)
  1. ;
  1. ;******************************************************************************
  1. ;******************************************************************************
  1. ; --- ROUTINE MODIFICATION LOG ---
  1. ;
  1. ;PKG/PATCH DATE DEVELOPER MODIFICATION
  1. ;----------- ---------- ----------- ----------------------------------------
  1. ;ROR*1.5*10 MAR 2010 A SAUNDERS Routine created
  1. ;ROR*1.5*13 DEC 2010 A SAUNDERS Moved tag CALCMLD to this routine
  1. ;ROR*1.5*14 APR 2011 A SAUNDERS Added logic to calculate the APRI and
  1. ; FIB4 scores.
  1. ;
  1. ;******************************************************************************
  1. ;******************************************************************************
  1. Q
  1. ;
  1. ;*****************************************************************************
  1. ;OUTPUT REPORT 'RANGE' PARAMETERS, SET UP REPORT ID LIST (EXTRINISIC FUNCTION)
  1. ;
  1. ; PARTAG Reference (IEN) to the parent tag
  1. ;
  1. ; Return Values:
  1. ; RORDATA("IDLST") - list of IDs for tests requested
  1. ; <0 Error code
  1. ; 0 Ok
  1. ;*****************************************************************************
  1. PARAMS(PARTAG,RORDATA,RORTSK) ;
  1. N PARAMS,DESC,TMP,RC S RC=0
  1. ;--- Lab test ranges
  1. S RORDATA("RANGE",1)=0 ;initialize MELD to 'no range passed in'
  1. S RORDATA("RANGE",2)=0 ;initialize MELD Na to 'no range passed in'
  1. S RORDATA("RANGE",3)=0 ;initialize APRI to 'no range passed in'
  1. S RORDATA("RANGE",4)=0 ;initialize FIB4 to 'no range passed in'
  1. I $D(RORTSK("PARAMS","LRGRANGES","C"))>1 D Q:RC<0 RC
  1. . N GRC,ELEMENT,NODE,RTAG,RANGE
  1. . S NODE=$NA(RORTSK("PARAMS","LRGRANGES","C"))
  1. . S RTAG=$$ADDVAL^RORTSK11(RORTSK,"LRGRANGES",,PARTAG)
  1. . S (GRC,RC)=0
  1. . F S GRC=$O(@NODE@(GRC)) Q:GRC'>0 D Q:RC<0
  1. .. S RANGE=0,DESC=$$RTEXT(GRC,.RORDATA,.RORTSK) ;get range description
  1. .. S ELEMENT=$$ADDVAL^RORTSK11(RORTSK,"LRGRANGE",DESC,RTAG) ;add desc to output
  1. .. I ELEMENT<0 S RC=ELEMENT Q
  1. .. D ADDATTR^RORTSK11(RORTSK,ELEMENT,"ID",GRC)
  1. .. ;add test ID to the test ID 'list'
  1. .. S RORDATA("IDLST")=$G(RORDATA("IDLST"))_$S($G(RORDATA("IDLST"))'="":","_GRC,1:GRC)
  1. .. ;--- Process the range values
  1. .. S TMP=$G(@NODE@(GRC,"L"))
  1. .. I TMP'="" D S RANGE=1
  1. ... D ADDATTR^RORTSK11(RORTSK,ELEMENT,"LOW",TMP) S RORDATA("RANGE",GRC)=1
  1. .. S TMP=$G(@NODE@(GRC,"H"))
  1. .. I TMP'="" D S RANGE=1
  1. ... D ADDATTR^RORTSK11(RORTSK,ELEMENT,"HIGH",TMP) S RORDATA("RANGE",GRC)=1
  1. .. I RANGE D ADDATTR^RORTSK11(RORTSK,ELEMENT,"RANGE",1)
  1. ;if user didn't select any tests, default to both tests
  1. ;I $G(RORDATA("IDLST"))="" S RORDATA("IDLST")="1,2" ;user must select a report in PATCH 12
  1. ;--- Success
  1. Q RC
  1. ;
  1. ;*****************************************************************************
  1. ;RETURN RANGE TEXT, ADD RANGE VALUES TO RORDATA (EXTRINISIC FUNCTION)
  1. ;
  1. ;INPUT:
  1. ; GRC Test ID number
  1. ; ID=1: MELD
  1. ; ID=2: MELD-Na
  1. ; ID=3: APRI
  1. ; ID=4: FIB4
  1. ; RORDATA - Array with ROR data
  1. ; RORTSK - Task parameters
  1. ;
  1. ;OUTPUT:
  1. ; RORDATA(ID,"L") - test ID low range
  1. ; RORDATA(ID,"H") - test ID high range
  1. ; Description - <range>
  1. ;*****************************************************************************
  1. RTEXT(GRC,RORDATA,RORTSK) ;
  1. N RANGE,TMP
  1. S RANGE=""
  1. ;--- Range
  1. I $D(RORTSK("PARAMS","LRGRANGES","C",GRC))>1 D
  1. . ;--- Low
  1. . S TMP=$G(RORTSK("PARAMS","LRGRANGES","C",GRC,"L"))
  1. . S RORDATA(GRC,"L")=$G(TMP)
  1. . S:TMP'="" RANGE=RANGE_" not less than "_TMP
  1. . ;--- High
  1. . S TMP=$G(RORTSK("PARAMS","LRGRANGES","C",GRC,"H"))
  1. . S RORDATA(GRC,"H")=$G(TMP)
  1. . I TMP'="" D:RANGE'="" S RANGE=RANGE_" not greater than "_TMP
  1. . . S RANGE=RANGE_" and"
  1. ;--- Description
  1. S TMP=$G(RORTSK("PARAMS","LRGRANGES","C",GRC))
  1. S:TMP="" TMP="Unknown ("_GRC_")"
  1. Q TMP_" - "_$S(RANGE'="":"numeric results"_RANGE,1:"all results")
  1. ;
  1. ;************************************************************************
  1. ;CALCULATE THE MELD SCORE(S) - MELD AND MELD-NA
  1. ;
  1. ;INPUT
  1. ; DFN Patient DFN in LAB DATA file (#63)
  1. ; PTAG Reference IEN to the 'body' parent XML tag
  1. ; RORDATA Array with ROR data
  1. ; RORDATA("FIELDS") - Field list for retrieving the test results
  1. ; RORPTIEN Patient IEN in the ROR registry
  1. ; RORLC sub-file and LOINC codes to search for
  1. ;
  1. ;OUTPUT
  1. ; RORDATA Array with ROR data
  1. ; RORDATA("BILI")=RESULT^DATE - Bilirubin result and date
  1. ; RORDATA("CR")=RESULT^DATE - Creatinine result and date
  1. ; RORDATA("INR")=RESULT^DATE - INR result and date
  1. ; RORDATA("NA")=RESULT^DATE - Sodium result and date
  1. ; RORDATA("SCORE",1) - MELD score
  1. ; RORDATA("SCORE",2) - MELD-Na score
  1. ;
  1. ; 1 Patient should appear on report
  1. ; -1 Patient should NOT appear on report
  1. ;
  1. ; NOTE: the 'invalid' results will be stored as 'backup' results, in
  1. ; case no valid result is found for Creatinine or Sodium. An invalid
  1. ; creatinine result is >12. An invalid Sodium result is <100 or >180.
  1. ; These results will be displayed on the report if no MELD range was
  1. ; specifically requested by the user, but the score will not be calculated.
  1. ; They will not be displayed on the report if the user requested a MELD
  1. ; range.
  1. ;************************************************************************
  1. CALCMLD(DFN,PTAG,RORDATA,RORPTIEN,RORLC) ;
  1. N RORID,RORST,ROREND,RORLAB,RORMSG,RC
  1. S RORDATA("CALC")=0,RORDATA("CALCNA")=0 ;don't automatically calculate scores
  1. K RORDATA("SCORE",1),RORDATA("SCORE",2) ;calculated test scores
  1. K RORDATA("BVAL"),RORDATA("CVAL"),RORDATA("IVAL"),RORDATA("SVAL") ;test results
  1. K RORDATA("CINV"),RORDATA("SINV") ;test results
  1. K RORDATA("BILI"),RORDATA("CR"),RORDATA("INR"),RORDATA("NA") ;test result&date
  1. ;get patient ICN or SSN
  1. S RORID=$$PTID^RORUTL02(DFN)
  1. Q:'$G(RORID) -1
  1. ;---SET UP LAB API INPUT/OUTPUT PARMS---
  1. S RORST="2000101^CD" ;start date 1/1/1900
  1. S ROREND=$G(RORDATA("DATE"))\1 ;end date
  1. ;add 1 to the end date so the Lab API INCLUDES the end date correctly
  1. N X1,X2,X3 S X1=ROREND,X2=1 D C^%DTC S ROREND=X K X,X1,X2
  1. S ROREND=ROREND_"^CD"
  1. S RORLAB=$NA(^TMP("ROROUT",$J)) ;lab API output global
  1. K RORMSG,@RORLAB ;initialize prior to call
  1. ;---CALL LAB API---
  1. S RC=$$GCPR^LA7QRY(RORID,RORST,ROREND,.RORLC,"*",.RORMSG,RORLAB)
  1. I RC="",$D(RORMSG)>1 D ;quit if error returned
  1. . N ERR,I,LST,TMP
  1. . S (ERR,LST)=""
  1. . F I=1:1 S ERR=$O(RORMSG(ERR)) Q:ERR="" D
  1. . . S LST=LST_","_ERR,TMP=RORMSG(ERR)
  1. . . K RORMSG(ERR) S RORMSG(I)=TMP
  1. . S LST=$P(LST,",",2,999) Q:(LST=3)!(LST=99)
  1. . S RC=$$ERROR^RORERR(-27,,.RORMSG,RORPTIEN)
  1. I RC<0 Q -1
  1. ;Note: the Lab API returns data in the form of HL7 segments
  1. N TMP,RORSPEC,RORVAL,RORNODE,RORSEG,SEGTYPE,RORLOINC,RORDONE,RORDATE,RORTEST
  1. N RORCR,RORBIL,RORSOD,RORINR,FS
  1. S FS="|" ;HL7 field separator for lab data
  1. S (RORCR,RORBIL,RORSOD,RORINR,RORDONE,RORNODE)=0
  1. F S RORNODE=$O(^TMP("ROROUT",$J,RORNODE)) Q:((RORNODE="")!(RORDONE)) D
  1. . S RORSEG=$G(^TMP("ROROUT",$J,RORNODE)) ;get entire HL7 segment
  1. . S SEGTYPE=$P(RORSEG,FS,1) ;get segment type (PID,OBR,OBX,etc.)
  1. . Q:SEGTYPE'="OBX" ;we want OBX segments only
  1. . S RORSPEC=$P($P(RORSEG,FS,4),U,2) ;specimen type string (urine, serum, etc.)
  1. . S RORSPEC=":"_RORSPEC_":" ;append ":" as prefix and suffix
  1. . I ((RORSPEC[":UA:")!(RORSPEC[":UR:")) Q ;quit if specimen type is urine
  1. . S RORLOINC=$P($P(RORSEG,FS,4),U,1) ;get LOINC code for test
  1. . S RORVAL=$P(RORSEG,FS,6) ;test result value
  1. . S RORVAL=$TR(RORVAL,"""","") ;get rid of double quotes around values
  1. . Q:($G(RORVAL)'>0) ;quit if no value
  1. . S RORDATE=$$HL7TFM^XLFDT($P(RORSEG,FS,15)) ;get date collected
  1. . S RORDATE=RORDATE\1
  1. . ;---check for Creatinine match on LOINC---
  1. . I 'RORCR,RORDATA("CR_LOINC")[(";"_RORLOINC_";") D Q
  1. .. ;store 'valid' value (12 or less) if no 'valid' value has been stored yet
  1. .. I RORVAL'>12,$O(RORDATA("CVAL",0))="" S RORDATA("CVAL",RORDATE)=RORVAL,RORCR=1 Q
  1. .. ;store 'invalid' value (>12) if no other value has been stored
  1. .. I RORVAL>12,$O(RORDATA("CVAL",0))="",$O(RORDATA("CINV",0))="" D
  1. ... S RORDATA("CINV",RORDATE)=$G(RORVAL)_"*" ;mark as 'invalid' value
  1. . ;---check for Sodium match on LOINC---
  1. . I 'RORSOD,RORDATA("SOD_LOINC")[(";"_RORLOINC_";") D Q
  1. .. ;store 'valid' value (100 to 180) if no other 'valid' value has been stored
  1. .. I RORVAL'<100,RORVAL'>180,$O(RORDATA("SVAL",0))="" D Q
  1. ... S RORDATA("SVAL",RORDATE)=$G(RORVAL),RORSOD=1
  1. .. ;store 'invalid' value (<100 or >180) if no other value has been stored yet
  1. .. I ((RORVAL<100)!(RORVAL>180)),$O(RORDATA("SVAL",0))="",$O(RORDATA("SINV",0))="" D Q
  1. ... S RORDATA("SINV",RORDATE)=RORVAL_"*" Q ;mark as 'invalid' value
  1. . ;---check for Bilirubin match on LOINC---
  1. . I 'RORBIL,RORDATA("BIL_LOINC")[(";"_RORLOINC_";") D Q
  1. .. ;store first Bilirubin value
  1. .. I $O(RORDATA("BVAL",0))="" S RORDATA("BVAL",RORDATE)=RORVAL,RORBIL=1
  1. . ;---check for INR match on LOINC---
  1. . I 'RORINR,RORDATA("INR_LOINC")[(";"_RORLOINC_";") D Q
  1. .. ;store first INR value
  1. .. I $O(RORDATA("IVAL",0))="" S RORDATA("IVAL",RORDATE)=RORVAL,RORINR=1
  1. . ;set flags to indicate if MELD/MELD-NA scores are ready to be calculated for this patient
  1. . I RORCR,RORBIL,RORINR S RORDATA("CALC")=1 D
  1. .. I RORDATA("IDLST")=1 S RORDONE=1 Q
  1. .. I RORSOD S RORDATA("CALCNA")=1,RORDONE=1
  1. ;
  1. ;if patient doesn't have data for either score, don't put them on report
  1. I '$G(RORDATA("CALC")),'$G(RORDATA("CALCNA")) Q -1
  1. ;--- put test result and test date into RORDATA(<test_name>)=result^date
  1. N DATE
  1. S DATE=$O(RORDATA("BVAL",0)) ;Bilirubin
  1. S RORDATA("BILI")=$S($G(DATE)="":U,1:$G(RORDATA("BVAL",DATE))_U_$G(DATE))
  1. S DATE=$O(RORDATA("CVAL",0)) ;Creatinine
  1. I $G(DATE)="" D ;if regular Creatinine value is null, take invalid value
  1. . S DATE=$O(RORDATA("CINV",0)) I $G(DATE)>0 S RORDATA("CVAL",DATE)=$G(RORDATA("CINV",DATE))
  1. S RORDATA("CR")=$S($G(DATE)="":U,1:$G(RORDATA("CVAL",DATE))_U_$G(DATE))
  1. S DATE=$O(RORDATA("IVAL",0)) ;INR
  1. S RORDATA("INR")=$S($G(DATE)="":U,1:$G(RORDATA("IVAL",DATE))_U_$G(DATE))
  1. S DATE=$O(RORDATA("SVAL",0)) ;Sodium
  1. I $G(DATE)="" D ;if regular Sodium value is null, take invalid value
  1. . S DATE=$O(RORDATA("SINV",0)) I $G(DATE)>0 S RORDATA("SVAL",DATE)=$G(RORDATA("SINV",DATE))
  1. S RORDATA("NA")=$S($G(DATE)="":U,1:$G(RORDATA("SVAL",DATE))_U_$G(DATE))
  1. ;
  1. N TEST,BILI,CR,INR,NA
  1. ;set lower limits for Bili, Cr, and INR to 1 if there's a value in there
  1. F TEST="BILI","CR","INR" D
  1. . S @TEST=$P($G(RORDATA(TEST)),U,1) Q:$G(@TEST)["*" I $G(@TEST),@TEST<1 S @TEST=1
  1. ;for valid creatinine, use max=4 for calculations
  1. I $G(CR)'["*" D
  1. . I $G(CR)>4 S CR=4
  1. S NA=$P($G(RORDATA("NA")),U,1)
  1. ;for valid sodium, use min=120, max=135 for calculations
  1. I $G(NA)'["*" D
  1. . I $G(NA)>135 S NA=135 Q
  1. . I $G(NA)'="" I NA<120 S NA=120
  1. ;
  1. N TMP1,TMP2
  1. ;RORDATA("SCORE",1) will hold the calculated MELD score
  1. ;RORDATA("SCORE",2) will hold the calculated MELD Na score
  1. S (RORDATA("SCORE",1),RORDATA("SCORE",2))="" ;init calculated scores to null
  1. D
  1. . Q:($G(CR)["*") ;quit if no calculation should occur
  1. . I $G(BILI),$G(CR),$G(INR) D
  1. .. ;MELD forumula: (.957*lne(Cr) + .378*lne(Bili) + 1.120*lne(Inr) + .643) * 10
  1. .. S TMP1=(.957*($$LN^XLFMTH(CR))+(.378*($$LN^XLFMTH(BILI)))+(1.120*($$LN^XLFMTH(INR)))+.643)*10
  1. .. S RORDATA("SCORE",1)=$J($G(TMP1),0,0) ;round MELD to whole number
  1. .. Q:($G(NA)["*") ;quit if no calculation should occur
  1. .. ;if meld NA requested, sodium test must have a valid value
  1. .. I $G(NA),RORDATA("SCORE",1),RORDATA("IDLST")[2 D
  1. ... ;MELD-Na forumula: MELD + (1.59 *(135-Na))
  1. ... S TMP2=$G(RORDATA("SCORE",1))+(1.59*(135-NA))
  1. ... S RORDATA("SCORE",2)=$J($G(TMP2),0,0)
  1. Q 1
  1. ;************************************************************************
  1. ;CALCULATE THE FIBROSIS SCORE(S) - APRI and FIB4
  1. ;
  1. ;INPUT
  1. ; DFN Patient DFN in LAB DATA file (#63)
  1. ; PTAG Reference IEN to the 'body' parent XML tag
  1. ; RORDATA Array with ROR data
  1. ; RORDATA("FIELDS") - Field list for retrieving the test results
  1. ; RORPTIEN Patient IEN in the ROR registry
  1. ; RORLC sub-file and LOINC codes to search for
  1. ;
  1. ;OUTPUT
  1. ; RORDATA Array with ROR data
  1. ; RORDATA("AST")=RESULT^DATE - AST result and date
  1. ; RORDATA("PLAT")=RESULT^DATE - Platelet result and date
  1. ; RORDATA("ALT")=RESULT^DATE - ALT result and date
  1. ; RORDATA("SCORE",3) - calculated APRI score
  1. ; RORDATA("SCORE",4) - calculated FIB4 score
  1. ; 1 Patient should appear on report
  1. ; -1 Patient should NOT appear on report
  1. ;
  1. ;************************************************************************
  1. CALCFIB(DFN,PTAG,RORDATA,RORPTIEN,RORLC) ;
  1. N RORID,RORST,ROREND,RORLAB,RORMSG,RC
  1. S RORDATA("CALCAPRI")=0,RORDATA("CALCFIB4")=0 ;don't automatically calculate scores
  1. K RORDATA("SCORE",3),RORDATA("SCORE",4) ;calculated test scores
  1. K RORDATA("SVAL"),RORDATA("PVAL"),RORDATA("LVAL") ;test results
  1. K RORDATA("ALT"),RORDATA("PLAT"),RORDATA("AST") ; tes result and date
  1. ;get patient ICN or SSN
  1. S RORID=$$PTID^RORUTL02(DFN)
  1. Q:'$G(RORID) -1
  1. ;---SET UP LAB API INPUT/OUTPUT PARMS---
  1. S RORST="2000101^CD" ;start date 1/1/1900
  1. S ROREND=$G(RORDATA("DATE"))\1 ;end date
  1. ;add 1 to the end date so the Lab API INCLUDES the end date correctly
  1. N X1,X2,X3 S X1=ROREND,X2=1 D C^%DTC S ROREND=X K X,X1,X2
  1. S ROREND=ROREND_"^CD"
  1. S RORLAB=$NA(^TMP("ROROUT",$J)) ;lab API output global
  1. K RORMSG,@RORLAB ;initialize prior to call
  1. ;---CALL LAB API TO GET TEST RESULTS---
  1. S RC=$$GCPR^LA7QRY(RORID,RORST,ROREND,.RORLC,"*",.RORMSG,RORLAB)
  1. I RC="",$D(RORMSG)>1 D Q -1 ;quit if error returned
  1. . N ERR,I,LST,TMP
  1. . S (ERR,LST)=""
  1. . F I=1:1 S ERR=$O(RORMSG(ERR)) Q:ERR="" D
  1. . . S LST=LST_","_ERR,TMP=RORMSG(ERR)
  1. . . K RORMSG(ERR) S RORMSG(I)=TMP
  1. . S LST=$P(LST,",",2,999) Q:(LST=3)!(LST=99)
  1. . S RC=$$ERROR^RORERR(-27,,.RORMSG,RORPTIEN)
  1. I RC<0 Q -1
  1. ;Note: the Lab API returns data in the form of HL7 segments
  1. N TMP,RORSPEC,RORVAL,RORNODE,RORSEG,SEGTYPE,RORLOINC,RORDONE,RORDATE,RORTEST
  1. N RORAST,RORPLAT,RORALT,FS
  1. S FS="|" ;HL7 field separator for lab data
  1. S (RORAST,RORPLAT,RORALT,RORDONE,RORNODE)=0
  1. F S RORNODE=$O(^TMP("ROROUT",$J,RORNODE)) Q:((RORNODE="")!(RORDONE)) D
  1. . S RORSEG=$G(^TMP("ROROUT",$J,RORNODE)) ;entire HL7 segment
  1. . S SEGTYPE=$P(RORSEG,FS,1) ;segment type (PID,OBR,OBX,etc.)
  1. . Q:SEGTYPE'="OBX" ;test results are in the OBX segment
  1. . S RORSPEC=$P($P(RORSEG,FS,4),U,2) ;specimen type (urine, serum, etc.)
  1. . S RORSPEC=":"_RORSPEC_":" ;append ":" as prefix and suffix
  1. . I ((RORSPEC[":UA:")!(RORSPEC[":UR:")) Q ;quit if specimen type is urine
  1. . S RORLOINC=$P($P(RORSEG,FS,4),U,1) ;LOINC code for test
  1. . S RORVAL=$P(RORSEG,FS,6) ;test result value
  1. . S RORVAL=$TR(RORVAL,"""","") ;get rid of double quotes around values
  1. . Q:($G(RORVAL)'>0) ;quit if no value
  1. . S RORDATE=$$HL7TFM^XLFDT($P(RORSEG,FS,15)) ;get date collected
  1. . S RORDATE=RORDATE\1
  1. . ;test results will be stored in RORDATA("SVAL"),RORDATA("PVAL"), and RORDATA("LVAL")
  1. . ;---check for AST match on LOINC if not yet found and store it---
  1. . I 'RORAST,RORDATA("AST_LOINC")[(";"_RORLOINC_";") D Q
  1. .. S RORDATA("SVAL",RORDATE)=RORVAL,RORAST=1 Q
  1. . ;---check for Platelet match on LOINC if not yet found and store it---
  1. . I 'RORPLAT,RORDATA("PLAT_LOINC")[(";"_RORLOINC_";") D Q
  1. .. S RORDATA("PVAL",RORDATE)=$G(RORVAL),RORPLAT=1
  1. . ;---check for ALT match on LOINC if not yet found and store it---
  1. . I 'RORALT,RORDATA("ALT_LOINC")[(";"_RORLOINC_";") D Q
  1. .. S RORDATA("LVAL",RORDATE)=RORVAL,RORALT=1
  1. . ;set flags to indicate if APRI/FIB4 scores are ready to be calculated for this patient
  1. . I RORAST,RORPLAT S RORDATA("CALCAPRI")=1 D
  1. .. I RORDATA("IDLST")=3 S RORDONE=1 ;done if APRI is the only score requested
  1. .. I RORALT S RORDATA("CALCFIB4")=1,RORDONE=1
  1. ;
  1. ;if patient doesn't have data for either score, then they shouldn't show up on report
  1. I '$G(RORDATA("CALCAPRI")),'$G(RORDATA("CALCFIB4")) Q -1
  1. ;--- put test result and test date into RORDATA(<test_name>)=result^date
  1. N DATE
  1. S DATE=$O(RORDATA("SVAL",0)) ;AST
  1. S RORDATA("AST")=$S($G(DATE)="":U,1:$G(RORDATA("SVAL",DATE))_U_$G(DATE))
  1. S DATE=$O(RORDATA("PVAL",0)) ;Platelet
  1. S RORDATA("PLAT")=$S($G(DATE)="":U,1:$G(RORDATA("PVAL",DATE))_U_$G(DATE))
  1. S DATE=$O(RORDATA("LVAL",0)) ;ALT
  1. S RORDATA("ALT")=$S($G(DATE)="":U,1:$G(RORDATA("LVAL",DATE))_U_$G(DATE))
  1. ;--- get just the test result values from array
  1. N TEST,AST,PLAT,ALT
  1. F TEST="AST","PLAT","ALT" S @TEST=$P($G(RORDATA(TEST)),U,1)
  1. ;--- calculate APRI/FIB4 scores
  1. N TMP1,TMP2
  1. ;RORDATA("SCORE",3) will hold the calculated APRI score
  1. ;RORDATA("SCORE",4) will hold the calculated FIB4 score
  1. S (RORDATA("SCORE",3),RORDATA("SCORE",4))="" ;init calculated scores to null
  1. S RC=1
  1. I $G(AST),$G(PLAT) D
  1. . I RORDATA("IDLST")[3 D ;calculate APRI score: [AST/ULNAST/PLAT] * 100
  1. .. S TMP1=(AST/RORDATA("ULNAST")/PLAT)*100
  1. .. S RORDATA("SCORE",3)=$J($G(TMP1),0,2) ;round to 2 decimal points
  1. . I $G(ALT),RORDATA("IDLST")[4 D ;calculate FIB4 score: (AGE*AST)/[(PLAT*ALT) to 1/2 power]
  1. .. N AGE S AGE=$$AGE(DFN,RORDATA("DATE")) ;get patient age
  1. .. I '$G(AGE) S RC=-1 Q ;quit if age can't be calculated
  1. .. ;
  1. .. ; ROR*1.5*16 remedy ticket 512757 changed next two lines
  1. .. ;S TMP2=(AGE*AST)/$$PWR^XLFMTH((PLAT*ALT),.5)
  1. .. ;S RORDATA("SCORE",4)=$J($G(TMP2),0,0) ;round to whole number
  1. .. S TMP2=(AGE*AST)/(PLAT*($$PWR^XLFMTH((ALT),.5)))
  1. .. S RORDATA("SCORE",4)=$J($G(TMP2),0,2) ;round to 2 decimal places
  1. .. ;
  1. Q RC
  1. ;
  1. ;************************************************************************
  1. ;CALCULATE PATIENT AGE - EXTRINSIC FUNCTION
  1. ;
  1. ;INPUT
  1. ; DFN Patient DFN in PATIENT file (#2)
  1. ; DATE user-selected date for report calculations
  1. ;
  1. ;OUTPUT
  1. ; Patient age is returned
  1. ;************************************************************************
  1. AGE(DFN,DATE) ;
  1. ;--- get patient dob and dod using DEM^VADPT
  1. N RORDEM,RORDOB,RORDOD,RORAGE,VAROOT
  1. S VAROOT="RORDEM" D DEM^VADPT
  1. S RORDOB=$P($G(RORDEM(3)),U,1) ;date of birth
  1. S RORAGE=$P($G(RORDEM(4)),U,1) ;age as of today (DT)
  1. S RORDOD=$P($G(RORDEM(6)),U,1) ;date of death
  1. I DATE=DT Q $G(RORAGE) ;if 'most recent' date, return age in API results
  1. ;compare DOD and user-selected 'as of' DATE
  1. I $G(RORDOD),$G(RORDOD)<DATE S DATE=RORDOD\1 ;use DOD if earlier than DATE
  1. S RORAGE=DATE-RORDOB ;calculate age
  1. S RORAGE=$S($L(RORAGE)=6:$E($G(RORAGE),1,2),1:$E($G(RORAGE),1,3))
  1. Q $G(RORAGE)