473,416 Members | 1,767 Online
Bytes | Software Development & Data Engineering Community
Post Job

Home Posts Topics Members FAQ

Join Bytes to post your question to a community of 473,416 software developers and data experts.

Error Handler best practices

I use this convention frequently:

Exit_Here:
Exit Sub
HandleErr:
Select Case Err.Number
Case 3163
Resume Next
Case 3376
Resume Next
Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description
Resume Exit_Here
End Select

Is there a way to include the current procedure name on Case Else?

perhaps something like this:

Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description &
vbCrLf & _
Me.ProcedureName & Me.Form
Resume Exit_Here
End Select
(note: "Me.ProcedureName" is pseudo code - I don't know if it's possible to
get this...)

How about offloading this to a module so I don't have to type it out every
time:

Case Else
strP = Me!Procedure
strF = Me.Form
modErr.caseElse
End Select

thoughts ? suggestions ?

Thanks in advance...
Nov 12 '05 #1
13 6559
RE/
I use this convention frequently:

Exit_Here:
Exit Sub
HandleErr:
Select Case Err.Number
Case 3163
Resume Next
Case 3376
Resume Next
Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description
Resume Exit_Here
End Select

Is there a way to include the current procedure name on Case Else?

perhaps something like this:

Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description &
vbCrLf & _
Me.ProcedureName & Me.Form
Resume Exit_Here
End Select
(note: "Me.ProcedureName" is pseudo code - I don't know if it's possible to
get this...)

How about offloading this to a module so I don't have to type it out every
time:

Case Else
strP = Me!Procedure
strF = Me.Form
modErr.caseElse
End Select

thoughts ? suggestions ?

Thanks in advance...


Every routine I write is within the skeleton below.

"DebugStackPush()", "DebugStackPop()", and "BugAlert()" are all in
a module I call "basBugAlert".

The Push/Pop routines push the routine's name into an array/pop it out.

"BugAlert" refers to the array to get a trace of where we've been
just before the error popped. It then displays a little error screen to
the user and logs the error and the trace in a .TXT file.

The module is at the end of this note. If somebody can make it a little
better, I'd appreciate a copy of the improved code.

If you're trying to compile it and the line breaks are making you crazy, post
a reply and I'll email the .bas file to you.

-----------------------------------------------
Whatever()
DebugStackPush mModulename & ": Whatever"
On Error GoTo Whatever_err

' PURPOSE: To do whatever
' ACCEPTS:
' RETURNS:
'
' NOTES: 1).....
(code goes here...)

Whatever_xit:
DebugStackPop
On Error Resume Next
(release pointers, close recordsets)
Exit Sub

Whatever_err:
BugAlert True, ""
(optionally case out on Err if some errors are acceptable)
Resume Whatever_xit
----------------------------------------------
Option Compare Database 'Use database order for string comparisons
Option Explicit

' This module contains the routines used to trap/log errors and
' show the "bugAlert" screen.

' REQUIRES: 1) A table named "---------- Program Changes ----------" in the app
'
' 2) A global constant:
' Global Const gIniGroupName = "TretsParms"
'
' 3) Two forms:
' frmBugAlertConcise
' frmBugAlertVerbose
'
' NOTES: 1) To avoid loops, most of these routines should be using their own
own error trapping,
' which would be limited to just showing message boxes - as opposed
to potentially-recursive
' calls to debugStackPush() and debugStackPop()

Const mModuleName = "basBugAlert"

Global Const gStackLimit = 50

Const debugStackTotalSize = 52
Global gDebugStack(debugStackTotalSize)

Global gStackPointer As Integer

Global gErrorMessage As String 'For any calling routine
that wants to trap the error message before bugAlert munches on it.
Global gErrorLocation As String 'Ditto above, but contains
name of routine

Private Declare Function GetComputerName_bal Lib "kernel32" Alias
"GetComputerNameA" (ByVal lpBuffer As String, nSize As Long) As Long
Private Declare Function GetUserName_bal Lib "advapi32.dll" Alias "GetUserNameA"
(ByVal lpBuffer As String, nSize As Long) As Long
Private Declare Function GetPrivateProfileString Lib "kernel32" Alias
"GetPrivateProfileStringA" (ByVal lpApplicationName As String, ByVal lpKeyName
As Any, ByVal lpDefault As String, ByVal lpReturnedString As String, ByVal nSize
As Long, ByVal lpFileName As String) As Long
Sub bugAlert(ByVal theDisplaySwitch As Integer, ByVal theSupplementalMessage As
String)

' PURPOSE: To log an error and, maybe, show an error screen to the user
' ACCEPTS: - A boolean telling whether-or-not to show a screen to the user
' - Supplemental text to be added to the log entry and shown on the
screen
' USES: - An optional .INI file parm called "myErrorPath", which tells where
to write the error
' - An optional .INI file parm called "VerboseErrorDisplay" that tells
us if we want
' to show frmBugAlertVerbose
'
' NOTES: 1) We are in error mode: anything could be happening.
' Therefore error trapping is limited to a messagebox.
' 2) We assume that the calling routine, after invoking this, will
gracefully proceed
' to it's "Exit" coding and pop the debug stack on the way out.
' 3) Note that out "On Error" statement isn't until *After* we've
captured error info.
' 4) Setting the display switch to False and suppling a supplemental
message allows the programmer
' to record things in the error log which did not result from
errors in the technical sense.
' e.g. bugAlert, False, "This sentence gets written to the error
log"
' 5) If there is no path specified in the .INI file, we write to the
root of C:

1001 Dim myErrorLine As Long
Dim myErrorNumber As Long
Dim myErrorMessage As String

1002 myErrorLine = Erl 'Capture relevant info ASAP
1003 myErrorNumber = Err
1004 myErrorMessage = Error$
1005 gErrorMessage = Error$
1006 gErrorLocation = gDebugStack(gStackPointer)

1007 On Error GoTo bugAlert_err
1008 DoCmd.Echo True 'In case it was turned off elsewhere

Dim v As Variant
Dim X As Integer
Dim myMessage As String
Dim myTimeStamp As String
Dim i As Integer
Dim L As Long
Dim myErrorPath As String
Dim myHeaderLine As String
Dim myAppVersion As String
Dim myVerboseSw As Boolean

Dim ParmValue As String

Const cannotDoAtThisTime = 2486

Dim skipLine As String

1010 skipLine = Chr$(13) & Chr$(10) & Chr$(13) & Chr$(10) & " "

1011 DoCmd.SetWarnings True

1020 ParmValue = String(255, 0)
1021 L = GetPrivateProfileString(gIniGroupName, "ErrorLogPath", "{NotFound}",
ParmValue, 255, SysCmd(acSysCmdIniFile))
1022 If L And Left(ParmValue, 10) <> "{NotFound}" Then
1023 myErrorPath = Left(ParmValue, L)
1024 Else
1025 myErrorPath = CurrentDb().Name
1026 If Right(myErrorPath, 4) = ".mdb" Then
1027 myErrorPath = Left(myErrorPath, Len(myErrorPath) - 4)
1028 End If
1029 myErrorPath = myErrorPath & ".Errors.txt"
1030 End If

1040 ParmValue = String(255, 0)
1041 L = GetPrivateProfileString(gIniGroupName, "VerboseErrorDisplay",
"{NotFound}", ParmValue, 255, SysCmd(acSysCmdIniFile))
1042 If L And Left(ParmValue, 10) <> "{NotFound}" Then
1043 If (Left(ParmValue, L) = "True") Or (Left(ParmValue, L) = "Yes") Then
1044 myVerboseSw = True
1045 End If
1046 End If

1049 myVerboseSw = True 'FORCE VERBOSE ERROR DISPLAY

1050 X = FreeFile
1051 Open myErrorPath For Append As X

1060 Print #X,
"-----------------------------------------------------------------"

1070 myAppVersion = currentVersionGet_bal
1071 myHeaderLine = VBA.Format$(Now, "mm/dd/yy hh:nn:ss") & myAppVersion & "
Userid: " & windozeIdGet_bal() & " on " & computerNameGet_bal()

1080 Print #X, myHeaderLine

1090 If theDisplaySwitch = False Then
1091 Print #X, "(ERROR SCREEN SUPPRESSED)"
1092 End If

1100 Print #X, " Proc: " & gDebugStack(gStackPointer)

1101 If myErrorNumber <> 0 Then
1102 If myErrorLine > 0 Then
1103 Print #X, String(9, " ") & "Line " & VBA.Format$(myErrorLine,
"000000") & " " & VBA.Format$(myErrorNumber, "0000") & ": " & myErrorMessage
1104 Else
1105 Print #X, String(13, " ") & VBA.Format$(myErrorNumber, "0000") & ": "
& myErrorMessage
1109 End If
1110 Else
1111 If myErrorLine > 0 Then
1112 Print #X, String(9, " ") & "Line " & VBA.Format$(myErrorLine,
"000000") & ": "
1113 Else
1114 Print #X, String(13, " ")
1115 End If
1119 End If

1120 If theSupplementalMessage <> "" Then
1121 Print #X, Space$(19) & theSupplementalMessage
1122 End If

1130 Print #X, ""

1140 If gStackPointer > 1 Then
1141 For i = 0 To gStackLimit
1142 If gDebugStack(i) <> "" Then
1143 If i = gStackPointer Then
1144 Print #X, Space$(9) & " " & Format(i, "00") & ">>" &
gDebugStack(i)
1145 Else
1146 If i = 1 Then
1150 Print #X, Space$(9) & "CallOuts: " & Format(i, "00") & " "
& gDebugStack(i)
1151 Else
1152 Print #X, Space$(9) & " " & Format(i, "00") & " "
& gDebugStack(i)
1153 End If
1154 End If
1155 End If
1156 Next i
1157 End If
1158 Close #X

1170 If theDisplaySwitch = True Then
1171 If myVerboseSw = True Then
1172 If myErrorLine > 0 Then
1173 myMessage = " " & "... at line " & Str(myErrorLine) & " in " &
Chr$(34) & gDebugStack(gStackPointer) & Chr$(34)
1174 Else
1175 myMessage = " " & "in " & Chr$(34) & gDebugStack(gStackPointer)
& Chr$(34)
1176 End If

1180 myMessage = myMessage & skipLine & "Error# " & Str(myErrorNumber) &
": " & myErrorMessage
1181 myMessage = myMessage & skipLine & theSupplementalMessage
1182 DoCmd.OpenForm "frmBugAlertVerbose", , , , , , myMessage
1183 Else
1184 DoCmd.OpenForm "frmBugAlertConcise", , , , , , myErrorPath
1185 End If
1999 End If

bugAlert_xit:
On Error Resume Next
Close #X
ExitSub

bugAlert_err:
Select Case Err
Case cannotDoAtThisTime
'Do nothing: There is probably a print dialog active, which prevents
opening the bugALert screen.
'Error has, however been writen to the error log...

Case Else
MsgBox "bugAlert() failed at line " & Str(Erl) & ", Error " & Str(Err) &
": " & Error$ & vbCrLf & "StackPointer=" & Val(gStackPointer) & vbCrLf & vbCrLf
& "Original error Info:" & vbCrLf & "Error " & Str(myErrorNumber) & " at line "
& Str(myErrorLine) & ": " & myErrorMessage & vbCrLf & theSupplementalMessage,
48, "Error In Error Handler"
stackFlush
End Select
Resume bugAlert_xit
End Sub
Sub stackFlush()

' PURPOSE: Flush the debug stack to the log file in case we find it is
overloaded
' ACCEPTS: - A boolean telling whether-or-not to show a screen to the user
' - Supplemental text to be added to the log entry and shown on the
screen

1010 Dim myErrorLine As Long
Dim myErrorNumber As Long
Dim myErrorMessage As String

1011 myErrorLine = Erl 'Capture relevant info ASAP
1012 myErrorNumber = Err
1013 myErrorMessage = Error$

1014 On Error GoTo stackFlush_err

Dim X As Integer
Dim i As Integer
Dim L As Long
Dim myErrorPath As String
Dim myHeaderLine As String
Dim myAppVersion As String

Dim ParmValue As String

Const myOptionGroup = "ProgramParms"
Const cannotDoAtThisTime = 2486

Dim skipLine As String
1020 skipLine = Chr$(13) & Chr$(10) & Chr$(13) & Chr$(10) & " "

1021 DoCmd.SetWarnings True

1030 ParmValue = String(255, 0)
1031 L = GetPrivateProfileString(myOptionGroup, "ErrorPath", "{NotFound}",
ParmValue, 255, SysCmd(acSysCmdIniFile))
1032 If L And Left(ParmValue, 10) <> "{NotFound}" Then
1033 myErrorPath = Left(ParmValue, L)
1034 Else
1035 myErrorPath = "C:\Error.txt"
1036 End If

1050 X = FreeFile
1051 Open myErrorPath For Append As X

1060 Print #X,
"-----------------------------------------------------------------"
1061 Print #X, "<================= STACK FLUSH
=================================>"

1071 myHeaderLine = VBA.Format$(Now, "mm/dd/yy hh:nn:ss") & " Userid: " &
CurrentUser() & " on " & computerNameGet_bal()

1080 Print #X, myHeaderLine
1100 Print #X, " Proc: " & gDebugStack(gStackPointer)
1130 Print #X, ""

1140 If gStackPointer > 1 Then
1141 For i = 0 To gStackLimit
1142 If gDebugStack(i) <> "" Then
1143 If i = gStackPointer Then
1144 Print #X, Space$(9) & " " & Format(i, "00") & ">>" &
gDebugStack(i)
1145 Else
1146 If i = 1 Then
1150 Print #X, Space$(9) & "CallOuts: " & Format(i, "00") & " "
& gDebugStack(i)
1151 Else
1152 Print #X, Space$(9) & " " & Format(i, "00") & " "
& gDebugStack(i)
1153 End If
1154 End If
1155 End If
1156 Next i
1157 End If
1999 Close #X

stackFlush_xit:
On Error Resume Next
Close #X
Exit Sub

stackFlush_err:
Select Case Err
Case cannotDoAtThisTime
'Do nothing: There is probably a print dialog active, which prevents
opening the stackFlush screen.
'Error has, however been writen to the error log...

Case Else
MsgBox "stackFlush() failed at line " & Str(Erl) & ", Error " & Str(Err)
& ": " & Error$ & vbCrLf & "StackPointer=" & Val(gStackPointer) & vbCrLf &
vbCrLf & "Original error Info:" & vbCrLf & "Error " & Str(myErrorNumber) & " at
line " & Str(myErrorLine) & ": " & myErrorMessage, 48, "Error In Error Handler"
End Select
Resume stackFlush_xit
End Sub
Sub aaTestBugAlert()
debugStackPush mModuleName & ": aaTestBugAlert"
On Error GoTo aaTestBugAlert_err

' PURPOSE: To supply a model for using the BugAlert routines and to demo the
routines
'
' NOTES: 1) Fire up a Debug window and type "aaTestBugAlert"

DoCmd.OpenForm "frmNon-Existant"

aaTestBugAlert_xit:
debugStackPop
On Error Resume Next
Exit Sub

aaTestBugAlert_err:
' bugAlert False, "This is the supplemental text...."
bugAlert True, "This is the supplemental text...."
Resume aaTestBugAlert_xit
End Sub
Sub debugStackPop()
On Error GoTo debugStackPop_err

' PURPOSE: To pop the last procedure name off the top of the debug stack

Dim i As Integer

If gStackPointer <= gStackLimit Then
gDebugStack(gStackPointer) = ""
End If

gStackPointer = gStackPointer - 1

If gStackPointer < 0 Then
gStackPointer = 0
End If

debugStackPop_xit:
On Error Resume Next
Exit Sub

debugStackPop_err:
MsgBox "debugStackPop() failed. Error " & Str(Err) & ": " & Error$, 48, "Error
In Error Handler"
Resume debugStackPop_xit
End Sub
Function debugStackPrint()
On Error GoTo debugStackPrint_err

Dim i As Integer

DoCmd.Hourglass True
Debug.Print "-------- Begin Debug Stack ---------"

For i = 1 To gStackPointer
Debug.Print VBA.Format$(i, "00") & ": " & gDebugStack(i)
Next i

Debug.Print "---------- End Debug Stack ---------"
DoCmd.Hourglass False

debugStackPrint_xit:
On Error Resume Next
Exit Function

debugStackPrint_err:
MsgBox "debugStackPrint() failed. Error " & Str(Err) & ": " & Error$, 48,
"Error In Error Handler"
Resume debugStackPrint_xit
End Function
Sub debugStackPush(ByVal theProcedureName As String)
On Error GoTo debugStackPush_err

' PURPOSE: To push a procedure name into the debug stack
' ACCEPTS: The procedure name
Dim i As Integer

gStackPointer = gStackPointer + 1

If gStackPointer <= gStackLimit Then
gDebugStack(gStackPointer) = theProcedureName
Else
gDebugStack(gStackLimit + 2) = theProcedureName
End If

debugStackPush_xit:
On Error Resume Next
Exit Sub

debugStackPush_err:
MsgBox "debugStackPush() failed. Error " & Str(Err) & ": " & Error$, 48,
"Error In Error Handler"
Resume debugStackPush_err
End Sub
Private Function computerNameGet_bal() As String
On Error GoTo computerNameGet_bal_err

' PURPOSE: To extract the name of the user's PC from via Windows API instead of
environment variables
' RETURNS: Name of user's PC or a blank string

Dim L As Long
Dim lpBuffer As String * 255
Dim myComputerName As String

L = GetComputerName_bal(lpBuffer, 255)
myComputerName = stripNulls_bal(lpBuffer)

computerNameGet_bal = myComputerName

computerNameGet_bal_xit:
On Error Resume Next
Exit Function

computerNameGet_bal_err:
MsgBox "computerNameGet_bal() failed. Error " & Str(Err) & ": " & Error$, 48,
"Error In Error Handler"
Resume computerNameGet_bal_xit
End Function
Private Function stripNulls_bal(theOriginalString As String)
On Error GoTo stripNulls_bal_err

If InStr(1, theOriginalString, Chr(0), vbTextCompare) Then
theOriginalString = Mid(theOriginalString, 1, InStr(theOriginalString,
Chr(0)) - 1)
End If

stripNulls_bal = theOriginalString

stripNulls_bal_xit:
On Error Resume Next
Exit Function

stripNulls_bal_err:
MsgBox "stipNulls() failed. Error " & Str(Err) & ": " & Error$, 48, "Error In
Error Handler"
Resume stripNulls_bal_xit
End Function
Private Function currentVersionGet_bal() As String
1001 On Error GoTo currentVersionGet_bal_err

' PURPOSE: To retrieve the current version of the app
' RETURNS: Current version of the app as a formatted number. e.g. "5.31"
' USES: A special application-resident table named "---------- Program
Changes ----------"
'
' NOTES: 1) The table's name is designed to float it to the top of the table
list and call attention
' to the fact that is something out-of-the-ordinary table-wise

1010 Dim myRS As DAO.Recordset

Static myCurrentVersion As String

1060 If Len(myCurrentVersion) = 0 Then
1160 Set myRS = CurrentDb().OpenRecordset("SELECT Max([---------- Program
Changes ----------].versionNumber) AS MaxOfversionNumber FROM [----------
Program Changes ----------];", dbOpenSnapshot)
1180 myCurrentVersion = "v" & VBA.Format$(Nz(myRS!MaxOfversionNumber,
"0.00"))
1240 End If

1999 currentVersionGet_bal = myCurrentVersion

currentVersionGet_bal_xit:
On Error Resume Next
myRS.Close
Set myRS = Nothing
Exit Function

currentVersionGet_bal_err:
MsgBox "currentVersionGet() failed at line " & Str(Erl) & ", Error " & Str(Err)
& ": " & Error$, 48, "Error In Error Handler"
Resume currentVersionGet_bal_xit
End Function
Sub stackClear()

' PURPOSE: To clear the debug stack. Intended for use while debugging.

Dim i As Integer

If gStackPointer > 1 Then
For i = 0 To gStackLimit
If gDebugStack(i) <> "" Then
gDebugStack(i) = ""
End If
Next i
End If

gStackPointer = 0

stackClear_xit:
On Error Resume Next
Exit Sub

stackClear_err:
Resume stackClear_xit
End Sub
Private Function windozeIdGet_bal()
On Error GoTo windozeIdGet_bal_err

' PURPOSE: To get the current Windows UserID
' RETURNS: ID or error message

Dim myBuffer As String * 255
Dim myUserName As String

GetUserName_bal myBuffer, Len(myBuffer) 'Get the
user name
myUserName = Left(Trim(myBuffer), InStr(myBuffer, Chr(0)) - 1) 'Trim excess
characters

If Len(myUserName) > 0 Then
windozeIdGet_bal = myUserName
Else
windozeIdGet_bal "windozeIdGet_bal() Unable to get Windows UserID"
End If

windozeIdGet_bal_xit:
On Error Resume Next
Exit Function

windozeIdGet_bal_err:
MsgBox "stipNulls() failed. Error " & Str(Err) & ": " & Error$, 48, "Error In
Error Handler"
Resume windozeIdGet_bal_xit
End Function
----------------------------------------------
--
PeteCresswell
Nov 12 '05 #2
Surely -- code it right in. Some third party tools hold it in a compile-time
variable and you can insert that variable. Check a free tool of this kind
CodeWrite2 at MVP Arvin Meyer's site, http://www.datastrat.com.

Larry Linson
Microsoft Access MVP
"deko" <dj****@hotmail.com> wrote in message
news:Is******************@newssvr25.news.prodigy.c om...
I use this convention frequently:

Exit_Here:
Exit Sub
HandleErr:
Select Case Err.Number
Case 3163
Resume Next
Case 3376
Resume Next
Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description
Resume Exit_Here
End Select

Is there a way to include the current procedure name on Case Else?

perhaps something like this:

Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description &
vbCrLf & _
Me.ProcedureName & Me.Form
Resume Exit_Here
End Select
(note: "Me.ProcedureName" is pseudo code - I don't know if it's possible to get this...)

How about offloading this to a module so I don't have to type it out every
time:

Case Else
strP = Me!Procedure
strF = Me.Form
modErr.caseElse
End Select

thoughts ? suggestions ?

Thanks in advance...

Nov 12 '05 #3
On Wed, 10 Dec 2003 22:52:24 GMT, "deko" <dj****@hotmail.com> wrote:

Literally: no.
Therefore in VBA people often resort to secondary solutions. For
example at the top of each function you "Push" the name of the current
function on a stack, and at the bottom you "Pop" it off again. This
boilerplate code can be added by writing some code that works with the
Module object.

In .NET you *do* have access to a Stack object, so you can do what you
ask for, and more.

-Tom.

I use this convention frequently:

Exit_Here:
Exit Sub
HandleErr:
Select Case Err.Number
Case 3163
Resume Next
Case 3376
Resume Next
Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description
Resume Exit_Here
End Select

Is there a way to include the current procedure name on Case Else?

perhaps something like this:

Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description &
vbCrLf & _
Me.ProcedureName & Me.Form
Resume Exit_Here
End Select
(note: "Me.ProcedureName" is pseudo code - I don't know if it's possible to
get this...)

How about offloading this to a module so I don't have to type it out every
time:

Case Else
strP = Me!Procedure
strF = Me.Form
modErr.caseElse
End Select

thoughts ? suggestions ?

Thanks in advance...


Nov 12 '05 #4
You might want an "On Error Resume Next" as the first thing in your
Exit section.

Exit_Here:
On Error Resume Next
'do some stuff here
Exit Sub

Reason: if an error gets raised in the Exit section, your
ErrorHandler will go into an infinite loop.

-Matt

On Wed, 10 Dec 2003 22:52:24 GMT, "deko" <dj****@hotmail.com> wrote:
Exit_Here:
Exit Sub


Nov 12 '05 #5
good point...

"Matthew Sullivan" <Ma**@NoSpam.com> wrote in message
news:lk********************************@4ax.com...
You might want an "On Error Resume Next" as the first thing in your
Exit section.

Exit_Here:
On Error Resume Next
'do some stuff here
Exit Sub

Reason: if an error gets raised in the Exit section, your
ErrorHandler will go into an infinite loop.

-Matt

On Wed, 10 Dec 2003 22:52:24 GMT, "deko" <dj****@hotmail.com> wrote:
Exit_Here:
Exit Sub

Nov 12 '05 #6
Have a look at MZ-Tools. This will automate writing error handlers for you
an dyou can edit the error hanldler it inserts.

Plus it does an awful lot of other things that you will find useful.

http://www.mztools.com/
Terry

"deko" <dj****@hotmail.com> wrote in message
news:Is******************@newssvr25.news.prodigy.c om...
I use this convention frequently:

Exit_Here:
Exit Sub
HandleErr:
Select Case Err.Number
Case 3163
Resume Next
Case 3376
Resume Next
Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description
Resume Exit_Here
End Select

Is there a way to include the current procedure name on Case Else?

perhaps something like this:

Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description &
vbCrLf & _
Me.ProcedureName & Me.Form
Resume Exit_Here
End Select
(note: "Me.ProcedureName" is pseudo code - I don't know if it's possible to get this...)

How about offloading this to a module so I don't have to type it out every
time:

Case Else
strP = Me!Procedure
strF = Me.Form
modErr.caseElse
End Select

thoughts ? suggestions ?

Thanks in advance...

Nov 12 '05 #7
thanks for the tip... will check it out...

"Terry Kreft" <te*********@mps.co.uk> wrote in message
news:2q********************@karoo.co.uk...
Have a look at MZ-Tools. This will automate writing error handlers for you
an dyou can edit the error hanldler it inserts.

Plus it does an awful lot of other things that you will find useful.

http://www.mztools.com/
Terry

"deko" <dj****@hotmail.com> wrote in message
news:Is******************@newssvr25.news.prodigy.c om...
I use this convention frequently:

Exit_Here:
Exit Sub
HandleErr:
Select Case Err.Number
Case 3163
Resume Next
Case 3376
Resume Next
Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description
Resume Exit_Here
End Select

Is there a way to include the current procedure name on Case Else?

perhaps something like this:

Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description & vbCrLf & _
Me.ProcedureName & Me.Form
Resume Exit_Here
End Select
(note: "Me.ProcedureName" is pseudo code - I don't know if it's possible

to
get this...)

How about offloading this to a module so I don't have to type it out every time:

Case Else
strP = Me!Procedure
strF = Me.Form
modErr.caseElse
End Select

thoughts ? suggestions ?

Thanks in advance...


Nov 12 '05 #8
Ma**@NoSpam.com (Matthew Sullivan) wrote in
<lk********************************@4ax.com>:
You might want an "On Error Resume Next" as the first thing in
your Exit section.

Exit_Here:
On Error Resume Next
'do some stuff here
Exit Sub

Reason: if an error gets raised in the Exit section, your
ErrorHandler will go into an infinite loop.


Er, I've never written a single error handler with that in it, nor
ever seen one in any of the Access books I've used, and I've never
encountered an error in an error handler. Of course, the only thing
I ever do in an error handler is to display an error message and
redirect to the appropriate location in code.

--
David W. Fenton http://www.bway.net/~dfenton
dfenton at bway dot net http://www.bway.net/~dfassoc
Nov 12 '05 #9
Thanks... you may be getting me in over my head, but I'll see if I can get
that module to work in my mdb...

for now, I've come up with this:

Exit_Here:
On Error Resume Next
Exit Sub
HandleErr:
Select Case Err.Number
Case Else
Dim fn As String
fn = Me.Form.Name
modHandler.Ermsg (fn)
Resume Exit_Here
End Select

Here is code for modHandler:

Public Sub Ermsg (fn)
MsgBox "Error Number " & Err.Number & ": " & Err.Description & vbCrLf &
fn
End Sub

the next step is putting this into every procedure in the database...
perhaps there is a way to automate this... ?
"(Pete Cresswell)" <x@y.z> wrote in message
news:gi********************************@4ax.com...
RE/
I use this convention frequently:

Exit_Here:
Exit Sub
HandleErr:
Select Case Err.Number
Case 3163
Resume Next
Case 3376
Resume Next
Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description
Resume Exit_Here
End Select

Is there a way to include the current procedure name on Case Else?

perhaps something like this:

Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description &vbCrLf & _
Me.ProcedureName & Me.Form
Resume Exit_Here
End Select
(note: "Me.ProcedureName" is pseudo code - I don't know if it's possible toget this...)

How about offloading this to a module so I don't have to type it out everytime:

Case Else
strP = Me!Procedure
strF = Me.Form
modErr.caseElse
End Select

thoughts ? suggestions ?

Thanks in advance...

Every routine I write is within the skeleton below.

"DebugStackPush()", "DebugStackPop()", and "BugAlert()" are all in
a module I call "basBugAlert".

The Push/Pop routines push the routine's name into an array/pop it out.

"BugAlert" refers to the array to get a trace of where we've been
just before the error popped. It then displays a little error screen to
the user and logs the error and the trace in a .TXT file.

The module is at the end of this note. If somebody can make it a little
better, I'd appreciate a copy of the improved code.

If you're trying to compile it and the line breaks are making you crazy,

post a reply and I'll email the .bas file to you.

-----------------------------------------------
Whatever()
DebugStackPush mModulename & ": Whatever"
On Error GoTo Whatever_err

' PURPOSE: To do whatever
' ACCEPTS:
' RETURNS:
'
' NOTES: 1).....
(code goes here...)

Whatever_xit:
DebugStackPop
On Error Resume Next
(release pointers, close recordsets)
Exit Sub

Whatever_err:
BugAlert True, ""
(optionally case out on Err if some errors are acceptable)
Resume Whatever_xit
----------------------------------------------
Option Compare Database 'Use database order for string comparisons
Option Explicit

' This module contains the routines used to trap/log errors and
' show the "bugAlert" screen.

' REQUIRES: 1) A table named "---------- Program Changes ----------" in the app '
' 2) A global constant:
' Global Const gIniGroupName = "TretsParms"
'
' 3) Two forms:
' frmBugAlertConcise
' frmBugAlertVerbose
'
' NOTES: 1) To avoid loops, most of these routines should be using their own own error trapping,
' which would be limited to just showing message boxes - as opposed to potentially-recursive
' calls to debugStackPush() and debugStackPop()

Const mModuleName = "basBugAlert"

Global Const gStackLimit = 50

Const debugStackTotalSize = 52
Global gDebugStack(debugStackTotalSize)

Global gStackPointer As Integer

Global gErrorMessage As String 'For any calling routine that wants to trap the error message before bugAlert munches on it.
Global gErrorLocation As String 'Ditto above, but contains name of routine

Private Declare Function GetComputerName_bal Lib "kernel32" Alias
"GetComputerNameA" (ByVal lpBuffer As String, nSize As Long) As Long
Private Declare Function GetUserName_bal Lib "advapi32.dll" Alias "GetUserNameA" (ByVal lpBuffer As String, nSize As Long) As Long
Private Declare Function GetPrivateProfileString Lib "kernel32" Alias
"GetPrivateProfileStringA" (ByVal lpApplicationName As String, ByVal lpKeyName As Any, ByVal lpDefault As String, ByVal lpReturnedString As String, ByVal nSize As Long, ByVal lpFileName As String) As Long
Sub bugAlert(ByVal theDisplaySwitch As Integer, ByVal theSupplementalMessage As String)

' PURPOSE: To log an error and, maybe, show an error screen to the user
' ACCEPTS: - A boolean telling whether-or-not to show a screen to the user ' - Supplemental text to be added to the log entry and shown on the screen
' USES: - An optional .INI file parm called "myErrorPath", which tells where to write the error
' - An optional .INI file parm called "VerboseErrorDisplay" that tells us if we want
' to show frmBugAlertVerbose
'
' NOTES: 1) We are in error mode: anything could be happening.
' Therefore error trapping is limited to a messagebox.
' 2) We assume that the calling routine, after invoking this, will gracefully proceed
' to it's "Exit" coding and pop the debug stack on the way out. ' 3) Note that out "On Error" statement isn't until *After* we've captured error info.
' 4) Setting the display switch to False and suppling a supplemental message allows the programmer
' to record things in the error log which did not result from
errors in the technical sense.
' e.g. bugAlert, False, "This sentence gets written to the error log"
' 5) If there is no path specified in the .INI file, we write to the root of C:

1001 Dim myErrorLine As Long
Dim myErrorNumber As Long
Dim myErrorMessage As String

1002 myErrorLine = Erl 'Capture relevant info ASAP
1003 myErrorNumber = Err
1004 myErrorMessage = Error$
1005 gErrorMessage = Error$
1006 gErrorLocation = gDebugStack(gStackPointer)

1007 On Error GoTo bugAlert_err
1008 DoCmd.Echo True 'In case it was turned off elsewhere
Dim v As Variant
Dim X As Integer
Dim myMessage As String
Dim myTimeStamp As String
Dim i As Integer
Dim L As Long
Dim myErrorPath As String
Dim myHeaderLine As String
Dim myAppVersion As String
Dim myVerboseSw As Boolean

Dim ParmValue As String

Const cannotDoAtThisTime = 2486

Dim skipLine As String

1010 skipLine = Chr$(13) & Chr$(10) & Chr$(13) & Chr$(10) & " "

1011 DoCmd.SetWarnings True

1020 ParmValue = String(255, 0)
1021 L = GetPrivateProfileString(gIniGroupName, "ErrorLogPath", "{NotFound}", ParmValue, 255, SysCmd(acSysCmdIniFile))
1022 If L And Left(ParmValue, 10) <> "{NotFound}" Then
1023 myErrorPath = Left(ParmValue, L)
1024 Else
1025 myErrorPath = CurrentDb().Name
1026 If Right(myErrorPath, 4) = ".mdb" Then
1027 myErrorPath = Left(myErrorPath, Len(myErrorPath) - 4)
1028 End If
1029 myErrorPath = myErrorPath & ".Errors.txt"
1030 End If

1040 ParmValue = String(255, 0)
1041 L = GetPrivateProfileString(gIniGroupName, "VerboseErrorDisplay",
"{NotFound}", ParmValue, 255, SysCmd(acSysCmdIniFile))
1042 If L And Left(ParmValue, 10) <> "{NotFound}" Then
1043 If (Left(ParmValue, L) = "True") Or (Left(ParmValue, L) = "Yes") Then 1044 myVerboseSw = True
1045 End If
1046 End If

1049 myVerboseSw = True 'FORCE VERBOSE ERROR DISPLAY

1050 X = FreeFile
1051 Open myErrorPath For Append As X

1060 Print #X,
"-----------------------------------------------------------------"

1070 myAppVersion = currentVersionGet_bal
1071 myHeaderLine = VBA.Format$(Now, "mm/dd/yy hh:nn:ss") & myAppVersion & " Userid: " & windozeIdGet_bal() & " on " & computerNameGet_bal()

1080 Print #X, myHeaderLine

1090 If theDisplaySwitch = False Then
1091 Print #X, "(ERROR SCREEN SUPPRESSED)"
1092 End If

1100 Print #X, " Proc: " & gDebugStack(gStackPointer)

1101 If myErrorNumber <> 0 Then
1102 If myErrorLine > 0 Then
1103 Print #X, String(9, " ") & "Line " & VBA.Format$(myErrorLine,
"000000") & " " & VBA.Format$(myErrorNumber, "0000") & ": " & myErrorMessage 1104 Else
1105 Print #X, String(13, " ") & VBA.Format$(myErrorNumber, "0000") & ": " & myErrorMessage
1109 End If
1110 Else
1111 If myErrorLine > 0 Then
1112 Print #X, String(9, " ") & "Line " & VBA.Format$(myErrorLine,
"000000") & ": "
1113 Else
1114 Print #X, String(13, " ")
1115 End If
1119 End If

1120 If theSupplementalMessage <> "" Then
1121 Print #X, Space$(19) & theSupplementalMessage
1122 End If

1130 Print #X, ""

1140 If gStackPointer > 1 Then
1141 For i = 0 To gStackLimit
1142 If gDebugStack(i) <> "" Then
1143 If i = gStackPointer Then
1144 Print #X, Space$(9) & " " & Format(i, "00") & ">>" & gDebugStack(i)
1145 Else
1146 If i = 1 Then
1150 Print #X, Space$(9) & "CallOuts: " & Format(i, "00") & " " & gDebugStack(i)
1151 Else
1152 Print #X, Space$(9) & " " & Format(i, "00") & " " & gDebugStack(i)
1153 End If
1154 End If
1155 End If
1156 Next i
1157 End If
1158 Close #X

1170 If theDisplaySwitch = True Then
1171 If myVerboseSw = True Then
1172 If myErrorLine > 0 Then
1173 myMessage = " " & "... at line " & Str(myErrorLine) & " in " & Chr$(34) & gDebugStack(gStackPointer) & Chr$(34)
1174 Else
1175 myMessage = " " & "in " & Chr$(34) & gDebugStack(gStackPointer) & Chr$(34)
1176 End If

1180 myMessage = myMessage & skipLine & "Error# " & Str(myErrorNumber) & : " & myErrorMessage
1181 myMessage = myMessage & skipLine & theSupplementalMessage
1182 DoCmd.OpenForm "frmBugAlertVerbose", , , , , , myMessage
1183 Else
1184 DoCmd.OpenForm "frmBugAlertConcise", , , , , , myErrorPath
1185 End If
1999 End If

bugAlert_xit:
On Error Resume Next
Close #X
Exit Sub

bugAlert_err:
Select Case Err
Case cannotDoAtThisTime
'Do nothing: There is probably a print dialog active, which prevents opening the bugALert screen.
'Error has, however been writen to the error log...

Case Else
MsgBox "bugAlert() failed at line " & Str(Erl) & ", Error " & Str(Err) & ": " & Error$ & vbCrLf & "StackPointer=" & Val(gStackPointer) & vbCrLf & vbCrLf & "Original error Info:" & vbCrLf & "Error " & Str(myErrorNumber) & " at line " & Str(myErrorLine) & ": " & myErrorMessage & vbCrLf & theSupplementalMessage, 48, "Error In Error Handler"
stackFlush
End Select
Resume bugAlert_xit
End Sub
Sub stackFlush()

' PURPOSE: Flush the debug stack to the log file in case we find it is
overloaded
' ACCEPTS: - A boolean telling whether-or-not to show a screen to the user ' - Supplemental text to be added to the log entry and shown on the screen

1010 Dim myErrorLine As Long
Dim myErrorNumber As Long
Dim myErrorMessage As String

1011 myErrorLine = Erl 'Capture relevant info ASAP
1012 myErrorNumber = Err
1013 myErrorMessage = Error$

1014 On Error GoTo stackFlush_err

Dim X As Integer
Dim i As Integer
Dim L As Long
Dim myErrorPath As String
Dim myHeaderLine As String
Dim myAppVersion As String

Dim ParmValue As String

Const myOptionGroup = "ProgramParms"
Const cannotDoAtThisTime = 2486

Dim skipLine As String
1020 skipLine = Chr$(13) & Chr$(10) & Chr$(13) & Chr$(10) & " "

1021 DoCmd.SetWarnings True

1030 ParmValue = String(255, 0)
1031 L = GetPrivateProfileString(myOptionGroup, "ErrorPath", "{NotFound}", ParmValue, 255, SysCmd(acSysCmdIniFile))
1032 If L And Left(ParmValue, 10) <> "{NotFound}" Then
1033 myErrorPath = Left(ParmValue, L)
1034 Else
1035 myErrorPath = "C:\Error.txt"
1036 End If

1050 X = FreeFile
1051 Open myErrorPath For Append As X

1060 Print #X,
"-----------------------------------------------------------------"
1061 Print #X, "<================= STACK FLUSH
=================================>"

1071 myHeaderLine = VBA.Format$(Now, "mm/dd/yy hh:nn:ss") & " Userid: " &
CurrentUser() & " on " & computerNameGet_bal()

1080 Print #X, myHeaderLine
1100 Print #X, " Proc: " & gDebugStack(gStackPointer)
1130 Print #X, ""

1140 If gStackPointer > 1 Then
1141 For i = 0 To gStackLimit
1142 If gDebugStack(i) <> "" Then
1143 If i = gStackPointer Then
1144 Print #X, Space$(9) & " " & Format(i, "00") & ">>" & gDebugStack(i)
1145 Else
1146 If i = 1 Then
1150 Print #X, Space$(9) & "CallOuts: " & Format(i, "00") & " " & gDebugStack(i)
1151 Else
1152 Print #X, Space$(9) & " " & Format(i, "00") & " " & gDebugStack(i)
1153 End If
1154 End If
1155 End If
1156 Next i
1157 End If
1999 Close #X

stackFlush_xit:
On Error Resume Next
Close #X
Exit Sub

stackFlush_err:
Select Case Err
Case cannotDoAtThisTime
'Do nothing: There is probably a print dialog active, which prevents opening the stackFlush screen.
'Error has, however been writen to the error log...

Case Else
MsgBox "stackFlush() failed at line " & Str(Erl) & ", Error " & Str(Err) & ": " & Error$ & vbCrLf & "StackPointer=" & Val(gStackPointer) & vbCrLf &
vbCrLf & "Original error Info:" & vbCrLf & "Error " & Str(myErrorNumber) & " at line " & Str(myErrorLine) & ": " & myErrorMessage, 48, "Error In Error Handler" End Select
Resume stackFlush_xit
End Sub
Sub aaTestBugAlert()
debugStackPush mModuleName & ": aaTestBugAlert"
On Error GoTo aaTestBugAlert_err

' PURPOSE: To supply a model for using the BugAlert routines and to demo the routines
'
' NOTES: 1) Fire up a Debug window and type "aaTestBugAlert"

DoCmd.OpenForm "frmNon-Existant"

aaTestBugAlert_xit:
debugStackPop
On Error Resume Next
Exit Sub

aaTestBugAlert_err:
' bugAlert False, "This is the supplemental text...."
bugAlert True, "This is the supplemental text...."
Resume aaTestBugAlert_xit
End Sub
Sub debugStackPop()
On Error GoTo debugStackPop_err

' PURPOSE: To pop the last procedure name off the top of the debug stack

Dim i As Integer

If gStackPointer <= gStackLimit Then
gDebugStack(gStackPointer) = ""
End If

gStackPointer = gStackPointer - 1

If gStackPointer < 0 Then
gStackPointer = 0
End If

debugStackPop_xit:
On Error Resume Next
Exit Sub

debugStackPop_err:
MsgBox "debugStackPop() failed. Error " & Str(Err) & ": " & Error$, 48, "Error In Error Handler"
Resume debugStackPop_xit
End Sub
Function debugStackPrint()
On Error GoTo debugStackPrint_err

Dim i As Integer

DoCmd.Hourglass True
Debug.Print "-------- Begin Debug Stack ---------"

For i = 1 To gStackPointer
Debug.Print VBA.Format$(i, "00") & ": " & gDebugStack(i)
Next i

Debug.Print "---------- End Debug Stack ---------"
DoCmd.Hourglass False

debugStackPrint_xit:
On Error Resume Next
Exit Function

debugStackPrint_err:
MsgBox "debugStackPrint() failed. Error " & Str(Err) & ": " & Error$, 48, "Error In Error Handler"
Resume debugStackPrint_xit
End Function
Sub debugStackPush(ByVal theProcedureName As String)
On Error GoTo debugStackPush_err

' PURPOSE: To push a procedure name into the debug stack
' ACCEPTS: The procedure name
Dim i As Integer

gStackPointer = gStackPointer + 1

If gStackPointer <= gStackLimit Then
gDebugStack(gStackPointer) = theProcedureName
Else
gDebugStack(gStackLimit + 2) = theProcedureName
End If

debugStackPush_xit:
On Error Resume Next
Exit Sub

debugStackPush_err:
MsgBox "debugStackPush() failed. Error " & Str(Err) & ": " & Error$, 48,
"Error In Error Handler"
Resume debugStackPush_err
End Sub
Private Function computerNameGet_bal() As String
On Error GoTo computerNameGet_bal_err

' PURPOSE: To extract the name of the user's PC from via Windows API instead of environment variables
' RETURNS: Name of user's PC or a blank string

Dim L As Long
Dim lpBuffer As String * 255
Dim myComputerName As String

L = GetComputerName_bal(lpBuffer, 255)
myComputerName = stripNulls_bal(lpBuffer)

computerNameGet_bal = myComputerName

computerNameGet_bal_xit:
On Error Resume Next
Exit Function

computerNameGet_bal_err:
MsgBox "computerNameGet_bal() failed. Error " & Str(Err) & ": " & Error$, 48, "Error In Error Handler"
Resume computerNameGet_bal_xit
End Function
Private Function stripNulls_bal(theOriginalString As String)
On Error GoTo stripNulls_bal_err

If InStr(1, theOriginalString, Chr(0), vbTextCompare) Then
theOriginalString = Mid(theOriginalString, 1, InStr(theOriginalString, Chr(0)) - 1)
End If

stripNulls_bal = theOriginalString

stripNulls_bal_xit:
On Error Resume Next
Exit Function

stripNulls_bal_err:
MsgBox "stipNulls() failed. Error " & Str(Err) & ": " & Error$, 48, "Error In Error Handler"
Resume stripNulls_bal_xit
End Function
Private Function currentVersionGet_bal() As String
1001 On Error GoTo currentVersionGet_bal_err

' PURPOSE: To retrieve the current version of the app
' RETURNS: Current version of the app as a formatted number. e.g. "5.31" ' USES: A special application-resident table named "---------- Program
Changes ----------"
'
' NOTES: 1) The table's name is designed to float it to the top of the table list and call attention
' to the fact that is something out-of-the-ordinary table-wise

1010 Dim myRS As DAO.Recordset

Static myCurrentVersion As String

1060 If Len(myCurrentVersion) = 0 Then
1160 Set myRS = CurrentDb().OpenRecordset("SELECT Max([---------- Program Changes ----------].versionNumber) AS MaxOfversionNumber FROM [----------
Program Changes ----------];", dbOpenSnapshot)
1180 myCurrentVersion = "v" & VBA.Format$(Nz(myRS!MaxOfversionNumber,
"0.00"))
1240 End If

1999 currentVersionGet_bal = myCurrentVersion

currentVersionGet_bal_xit:
On Error Resume Next
myRS.Close
Set myRS = Nothing
Exit Function

currentVersionGet_bal_err:
MsgBox "currentVersionGet() failed at line " & Str(Erl) & ", Error " & Str(Err) & ": " & Error$, 48, "Error In Error Handler"
Resume currentVersionGet_bal_xit
End Function
Sub stackClear()

' PURPOSE: To clear the debug stack. Intended for use while debugging.

Dim i As Integer

If gStackPointer > 1 Then
For i = 0 To gStackLimit
If gDebugStack(i) <> "" Then
gDebugStack(i) = ""
End If
Next i
End If

gStackPointer = 0

stackClear_xit:
On Error Resume Next
Exit Sub

stackClear_err:
Resume stackClear_xit
End Sub
Private Function windozeIdGet_bal()
On Error GoTo windozeIdGet_bal_err

' PURPOSE: To get the current Windows UserID
' RETURNS: ID or error message

Dim myBuffer As String * 255
Dim myUserName As String

GetUserName_bal myBuffer, Len(myBuffer) 'Get the user name
myUserName = Left(Trim(myBuffer), InStr(myBuffer, Chr(0)) - 1) 'Trim excess characters

If Len(myUserName) > 0 Then
windozeIdGet_bal = myUserName
Else
windozeIdGet_bal "windozeIdGet_bal() Unable to get Windows UserID"
End If

windozeIdGet_bal_xit:
On Error Resume Next
Exit Function

windozeIdGet_bal_err:
MsgBox "stipNulls() failed. Error " & Str(Err) & ": " & Error$, 48, "Error In Error Handler"
Resume windozeIdGet_bal_xit
End Function
----------------------------------------------
--
PeteCresswell

Nov 12 '05 #10
I've dressed it up a bit:

Private Sub AllSubsAllMods()
On Error GoTo HandleErr
'code
Exit_Here:
On Error Resume Next
Exit Sub
HandleErr:
Select Case Err.Number
Case Else
Dim fn As String
fn = Me.Form.Name
modHandler.Ermsg (fn)
Resume Exit_Here
End Select
End Sub

'modHandler
Public Sub Ermsg(fn)
Dim strErrMsg As String
Dim strSql As String
strErrMsg = fn & " -- Error Number " & Err.Number & ": " &
Err.Description
MsgBox strErrMsg
strSql = "INSERT INTO tblErrors ( [ErrMsg] ) VALUES (" & """" &
strErrMsg & """)"
DoCmd.SetWarnings False
DoCmd.RunSQL strSql
DoCmd.SetWarnings True
End Sub


"deko" <dj****@hotmail.com> wrote in message
news:33*******************@newssvr25.news.prodigy. com...
Thanks... you may be getting me in over my head, but I'll see if I can get that module to work in my mdb...

for now, I've come up with this:

Exit_Here:
On Error Resume Next
Exit Sub
HandleErr:
Select Case Err.Number
Case Else
Dim fn As String
fn = Me.Form.Name
modHandler.Ermsg (fn)
Resume Exit_Here
End Select

Here is code for modHandler:

Public Sub Ermsg (fn)
MsgBox "Error Number " & Err.Number & ": " & Err.Description & vbCrLf & fn
End Sub

the next step is putting this into every procedure in the database...
perhaps there is a way to automate this... ?
"(Pete Cresswell)" <x@y.z> wrote in message
news:gi********************************@4ax.com...
RE/
I use this convention frequently:

Exit_Here:
Exit Sub
HandleErr:
Select Case Err.Number
Case 3163
Resume Next
Case 3376
Resume Next
Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description Resume Exit_Here
End Select

Is there a way to include the current procedure name on Case Else?

perhaps something like this:

Case Else
MsgBox "Error Number " & Err.Number & ": " &
Err.Description
&vbCrLf & _
Me.ProcedureName & Me.Form
Resume Exit_Here
End Select
(note: "Me.ProcedureName" is pseudo code - I don't know if it's
possible
toget this...)

How about offloading this to a module so I don't have to type it out everytime:

Case Else
strP = Me!Procedure
strF = Me.Form
modErr.caseElse
End Select

thoughts ? suggestions ?

Thanks in advance...

Every routine I write is within the skeleton below.

"DebugStackPush()", "DebugStackPop()", and "BugAlert()" are all in
a module I call "basBugAlert".

The Push/Pop routines push the routine's name into an array/pop it out.

"BugAlert" refers to the array to get a trace of where we've been
just before the error popped. It then displays a little error screen to the user and logs the error and the trace in a .TXT file.

The module is at the end of this note. If somebody can make it a little better, I'd appreciate a copy of the improved code.

If you're trying to compile it and the line breaks are making you crazy,

post
a reply and I'll email the .bas file to you.

-----------------------------------------------
Whatever()
DebugStackPush mModulename & ": Whatever"
On Error GoTo Whatever_err

' PURPOSE: To do whatever
' ACCEPTS:
' RETURNS:
'
' NOTES: 1).....
(code goes here...)

Whatever_xit:
DebugStackPop
On Error Resume Next
(release pointers, close recordsets)
Exit Sub

Whatever_err:
BugAlert True, ""
(optionally case out on Err if some errors are acceptable)
Resume Whatever_xit
----------------------------------------------
Option Compare Database 'Use database order for string comparisons
Option Explicit

' This module contains the routines used to trap/log errors and
' show the "bugAlert" screen.

' REQUIRES: 1) A table named "---------- Program Changes ----------" in

the app
'
' 2) A global constant:
' Global Const gIniGroupName = "TretsParms"
'
' 3) Two forms:
' frmBugAlertConcise
' frmBugAlertVerbose
'
' NOTES: 1) To avoid loops, most of these routines should be using

their own
own error trapping,
' which would be limited to just showing message boxes - as

opposed
to potentially-recursive
' calls to debugStackPush() and debugStackPop()

Const mModuleName = "basBugAlert"

Global Const gStackLimit = 50

Const debugStackTotalSize = 52
Global gDebugStack(debugStackTotalSize)

Global gStackPointer As Integer

Global gErrorMessage As String 'For any calling

routine
that wants to trap the error message before bugAlert munches on it.
Global gErrorLocation As String 'Ditto above, but

contains
name of routine

Private Declare Function GetComputerName_bal Lib "kernel32" Alias
"GetComputerNameA" (ByVal lpBuffer As String, nSize As Long) As Long
Private Declare Function GetUserName_bal Lib "advapi32.dll" Alias

"GetUserNameA"
(ByVal lpBuffer As String, nSize As Long) As Long
Private Declare Function GetPrivateProfileString Lib "kernel32" Alias
"GetPrivateProfileStringA" (ByVal lpApplicationName As String, ByVal

lpKeyName
As Any, ByVal lpDefault As String, ByVal lpReturnedString As String, ByVal nSize
As Long, ByVal lpFileName As String) As Long
Sub bugAlert(ByVal theDisplaySwitch As Integer, ByVal theSupplementalMessage As
String)

' PURPOSE: To log an error and, maybe, show an error screen to the user
' ACCEPTS: - A boolean telling whether-or-not to show a screen to the

user
' - Supplemental text to be added to the log entry and shown

on the
screen
' USES: - An optional .INI file parm called "myErrorPath", which
tells where
to write the error
' - An optional .INI file parm called "VerboseErrorDisplay"
that tells
us if we want
' to show frmBugAlertVerbose
'
' NOTES: 1) We are in error mode: anything could be happening.
' Therefore error trapping is limited to a messagebox.
' 2) We assume that the calling routine, after invoking this, will
gracefully proceed
' to it's "Exit" coding and pop the debug stack on the way

out.
' 3) Note that out "On Error" statement isn't until *After*

we've
captured error info.
' 4) Setting the display switch to False and suppling a

supplemental
message allows the programmer
' to record things in the error log which did not result

from errors in the technical sense.
' e.g. bugAlert, False, "This sentence gets written to the

error
log"
' 5) If there is no path specified in the .INI file, we write to the
root of C:

1001 Dim myErrorLine As Long
Dim myErrorNumber As Long
Dim myErrorMessage As String

1002 myErrorLine = Erl 'Capture relevant info ASAP
1003 myErrorNumber = Err
1004 myErrorMessage = Error$
1005 gErrorMessage = Error$
1006 gErrorLocation = gDebugStack(gStackPointer)

1007 On Error GoTo bugAlert_err
1008 DoCmd.Echo True 'In case it was turned off elsewhere

Dim v As Variant
Dim X As Integer
Dim myMessage As String
Dim myTimeStamp As String
Dim i As Integer
Dim L As Long
Dim myErrorPath As String
Dim myHeaderLine As String
Dim myAppVersion As String
Dim myVerboseSw As Boolean

Dim ParmValue As String

Const cannotDoAtThisTime = 2486

Dim skipLine As String

1010 skipLine = Chr$(13) & Chr$(10) & Chr$(13) & Chr$(10) & " "

1011 DoCmd.SetWarnings True

1020 ParmValue = String(255, 0)
1021 L = GetPrivateProfileString(gIniGroupName, "ErrorLogPath",

"{NotFound}",
ParmValue, 255, SysCmd(acSysCmdIniFile))
1022 If L And Left(ParmValue, 10) <> "{NotFound}" Then
1023 myErrorPath = Left(ParmValue, L)
1024 Else
1025 myErrorPath = CurrentDb().Name
1026 If Right(myErrorPath, 4) = ".mdb" Then
1027 myErrorPath = Left(myErrorPath, Len(myErrorPath) - 4)
1028 End If
1029 myErrorPath = myErrorPath & ".Errors.txt"
1030 End If

1040 ParmValue = String(255, 0)
1041 L = GetPrivateProfileString(gIniGroupName, "VerboseErrorDisplay",
"{NotFound}", ParmValue, 255, SysCmd(acSysCmdIniFile))
1042 If L And Left(ParmValue, 10) <> "{NotFound}" Then
1043 If (Left(ParmValue, L) = "True") Or (Left(ParmValue, L) =

"Yes") Then
1044 myVerboseSw = True
1045 End If
1046 End If

1049 myVerboseSw = True 'FORCE VERBOSE ERROR DISPLAY

1050 X = FreeFile
1051 Open myErrorPath For Append As X

1060 Print #X,
"-----------------------------------------------------------------"

1070 myAppVersion = currentVersionGet_bal
1071 myHeaderLine = VBA.Format$(Now, "mm/dd/yy hh:nn:ss") &
myAppVersion & "
Userid: " & windozeIdGet_bal() & " on " & computerNameGet_bal()

1080 Print #X, myHeaderLine

1090 If theDisplaySwitch = False Then
1091 Print #X, "(ERROR SCREEN SUPPRESSED)"
1092 End If

1100 Print #X, " Proc: " &
gDebugStack(gStackPointer)
1101 If myErrorNumber <> 0 Then
1102 If myErrorLine > 0 Then
1103 Print #X, String(9, " ") & "Line " & VBA.Format$(myErrorLine,
"000000") & " " & VBA.Format$(myErrorNumber, "0000") & ": " &

myErrorMessage
1104 Else
1105 Print #X, String(13, " ") & VBA.Format$(myErrorNumber, "0000") & ": "
& myErrorMessage
1109 End If
1110 Else
1111 If myErrorLine > 0 Then
1112 Print #X, String(9, " ") & "Line " & VBA.Format$(myErrorLine,
"000000") & ": "
1113 Else
1114 Print #X, String(13, " ")
1115 End If
1119 End If

1120 If theSupplementalMessage <> "" Then
1121 Print #X, Space$(19) & theSupplementalMessage
1122 End If

1130 Print #X, ""

1140 If gStackPointer > 1 Then
1141 For i = 0 To gStackLimit
1142 If gDebugStack(i) <> "" Then
1143 If i = gStackPointer Then
1144 Print #X, Space$(9) & " " & Format(i, "00") & ">>" &
gDebugStack(i)
1145 Else
1146 If i = 1 Then
1150 Print #X, Space$(9) & "CallOuts: " & Format(i, "00")

& " "
& gDebugStack(i)
1151 Else
1152 Print #X, Space$(9) & " " & Format(i, "00")
& " "
& gDebugStack(i)
1153 End If
1154 End If
1155 End If
1156 Next i
1157 End If
1158 Close #X

1170 If theDisplaySwitch = True Then
1171 If myVerboseSw = True Then
1172 If myErrorLine > 0 Then
1173 myMessage = " " & "... at line " & Str(myErrorLine) & " in " &
Chr$(34) & gDebugStack(gStackPointer) & Chr$(34)
1174 Else
1175 myMessage = " " & "in " & Chr$(34) &

gDebugStack(gStackPointer)
& Chr$(34)
1176 End If

1180 myMessage = myMessage & skipLine & "Error# " &

Str(myErrorNumber) &
": " & myErrorMessage
1181 myMessage = myMessage & skipLine & theSupplementalMessage
1182 DoCmd.OpenForm "frmBugAlertVerbose", , , , , , myMessage
1183 Else
1184 DoCmd.OpenForm "frmBugAlertConcise", , , , , , myErrorPath
1185 End If
1999 End If

bugAlert_xit:
On Error Resume Next
Close #X
Exit Sub

bugAlert_err:
Select Case Err
Case cannotDoAtThisTime
'Do nothing: There is probably a print dialog active, which

prevents
opening the bugALert screen.
'Error has, however been writen to the error log...

Case Else
MsgBox "bugAlert() failed at line " & Str(Erl) & ", Error " &

Str(Err) &
": " & Error$ & vbCrLf & "StackPointer=" & Val(gStackPointer) & vbCrLf &

vbCrLf
& "Original error Info:" & vbCrLf & "Error " & Str(myErrorNumber) & " at

line "
& Str(myErrorLine) & ": " & myErrorMessage & vbCrLf &

theSupplementalMessage,
48, "Error In Error Handler"
stackFlush
End Select
Resume bugAlert_xit
End Sub
Sub stackFlush()

' PURPOSE: Flush the debug stack to the log file in case we find it is
overloaded
' ACCEPTS: - A boolean telling whether-or-not to show a screen to the

user
' - Supplemental text to be added to the log entry and shown

on the
screen

1010 Dim myErrorLine As Long
Dim myErrorNumber As Long
Dim myErrorMessage As String

1011 myErrorLine = Erl 'Capture relevant info ASAP
1012 myErrorNumber = Err
1013 myErrorMessage = Error$

1014 On Error GoTo stackFlush_err

Dim X As Integer
Dim i As Integer
Dim L As Long
Dim myErrorPath As String
Dim myHeaderLine As String
Dim myAppVersion As String

Dim ParmValue As String

Const myOptionGroup = "ProgramParms"
Const cannotDoAtThisTime = 2486

Dim skipLine As String
1020 skipLine = Chr$(13) & Chr$(10) & Chr$(13) & Chr$(10) & " "

1021 DoCmd.SetWarnings True

1030 ParmValue = String(255, 0)
1031 L = GetPrivateProfileString(myOptionGroup, "ErrorPath", "{NotFound}",
ParmValue, 255, SysCmd(acSysCmdIniFile))
1032 If L And Left(ParmValue, 10) <> "{NotFound}" Then
1033 myErrorPath = Left(ParmValue, L)
1034 Else
1035 myErrorPath = "C:\Error.txt"
1036 End If

1050 X = FreeFile
1051 Open myErrorPath For Append As X

1060 Print #X,
"-----------------------------------------------------------------"
1061 Print #X, "<================= STACK FLUSH
=================================>"

1071 myHeaderLine = VBA.Format$(Now, "mm/dd/yy hh:nn:ss") & " Userid: "

& CurrentUser() & " on " & computerNameGet_bal()

1080 Print #X, myHeaderLine
1100 Print #X, " Proc: " & gDebugStack(gStackPointer) 1130 Print #X, ""

1140 If gStackPointer > 1 Then
1141 For i = 0 To gStackLimit
1142 If gDebugStack(i) <> "" Then
1143 If i = gStackPointer Then
1144 Print #X, Space$(9) & " " & Format(i, "00") &

">>" &
gDebugStack(i)
1145 Else
1146 If i = 1 Then
1150 Print #X, Space$(9) & "CallOuts: " & Format(i, "00") & " "
& gDebugStack(i)
1151 Else
1152 Print #X, Space$(9) & " " & Format(i, "00")
& " "
& gDebugStack(i)
1153 End If
1154 End If
1155 End If
1156 Next i
1157 End If
1999 Close #X

stackFlush_xit:
On Error Resume Next
Close #X
Exit Sub

stackFlush_err:
Select Case Err
Case cannotDoAtThisTime
'Do nothing: There is probably a print dialog active, which prevents
opening the stackFlush screen.
'Error has, however been writen to the error log...

Case Else
MsgBox "stackFlush() failed at line " & Str(Erl) & ", Error " &

Str(Err)
& ": " & Error$ & vbCrLf & "StackPointer=" & Val(gStackPointer) & vbCrLf

& vbCrLf & "Original error Info:" & vbCrLf & "Error " & Str(myErrorNumber) & " at
line " & Str(myErrorLine) & ": " & myErrorMessage, 48, "Error In Error Handler"
End Select
Resume stackFlush_xit
End Sub
Sub aaTestBugAlert()
debugStackPush mModuleName & ": aaTestBugAlert"
On Error GoTo aaTestBugAlert_err

' PURPOSE: To supply a model for using the BugAlert routines and to demo

the
routines
'
' NOTES: 1) Fire up a Debug window and type "aaTestBugAlert"

DoCmd.OpenForm "frmNon-Existant"

aaTestBugAlert_xit:
debugStackPop
On Error Resume Next
Exit Sub

aaTestBugAlert_err:
' bugAlert False, "This is the supplemental text...."
bugAlert True, "This is the supplemental text...."
Resume aaTestBugAlert_xit
End Sub
Sub debugStackPop()
On Error GoTo debugStackPop_err

' PURPOSE: To pop the last procedure name off the top of the debug stack

Dim i As Integer

If gStackPointer <= gStackLimit Then
gDebugStack(gStackPointer) = ""
End If

gStackPointer = gStackPointer - 1

If gStackPointer < 0 Then
gStackPointer = 0
End If

debugStackPop_xit:
On Error Resume Next
Exit Sub

debugStackPop_err:
MsgBox "debugStackPop() failed. Error " & Str(Err) & ": " & Error$,

48, "Error
In Error Handler"
Resume debugStackPop_xit
End Sub
Function debugStackPrint()
On Error GoTo debugStackPrint_err

Dim i As Integer

DoCmd.Hourglass True
Debug.Print "-------- Begin Debug Stack ---------"

For i = 1 To gStackPointer
Debug.Print VBA.Format$(i, "00") & ": " & gDebugStack(i)
Next i

Debug.Print "---------- End Debug Stack ---------"
DoCmd.Hourglass False

debugStackPrint_xit:
On Error Resume Next
Exit Function

debugStackPrint_err:
MsgBox "debugStackPrint() failed. Error " & Str(Err) & ": " & Error$, 48,
"Error In Error Handler"
Resume debugStackPrint_xit
End Function
Sub debugStackPush(ByVal theProcedureName As String)
On Error GoTo debugStackPush_err

' PURPOSE: To push a procedure name into the debug stack
' ACCEPTS: The procedure name
Dim i As Integer

gStackPointer = gStackPointer + 1

If gStackPointer <= gStackLimit Then
gDebugStack(gStackPointer) = theProcedureName
Else
gDebugStack(gStackLimit + 2) = theProcedureName
End If

debugStackPush_xit:
On Error Resume Next
Exit Sub

debugStackPush_err:
MsgBox "debugStackPush() failed. Error " & Str(Err) & ": " & Error$,

48, "Error In Error Handler"
Resume debugStackPush_err
End Sub
Private Function computerNameGet_bal() As String
On Error GoTo computerNameGet_bal_err

' PURPOSE: To extract the name of the user's PC from via Windows API

instead of
environment variables
' RETURNS: Name of user's PC or a blank string

Dim L As Long
Dim lpBuffer As String * 255
Dim myComputerName As String

L = GetComputerName_bal(lpBuffer, 255)
myComputerName = stripNulls_bal(lpBuffer)

computerNameGet_bal = myComputerName

computerNameGet_bal_xit:
On Error Resume Next
Exit Function

computerNameGet_bal_err:
MsgBox "computerNameGet_bal() failed. Error " & Str(Err) & ": " &

Error$, 48,
"Error In Error Handler"
Resume computerNameGet_bal_xit
End Function
Private Function stripNulls_bal(theOriginalString As String)
On Error GoTo stripNulls_bal_err

If InStr(1, theOriginalString, Chr(0), vbTextCompare) Then
theOriginalString = Mid(theOriginalString, 1,

InStr(theOriginalString,
Chr(0)) - 1)
End If

stripNulls_bal = theOriginalString

stripNulls_bal_xit:
On Error Resume Next
Exit Function

stripNulls_bal_err:
MsgBox "stipNulls() failed. Error " & Str(Err) & ": " & Error$, 48,

"Error In
Error Handler"
Resume stripNulls_bal_xit
End Function
Private Function currentVersionGet_bal() As String
1001 On Error GoTo currentVersionGet_bal_err

' PURPOSE: To retrieve the current version of the app
' RETURNS: Current version of the app as a formatted number. e.g.

"5.31"
' USES: A special application-resident table named "---------- Program Changes ----------"
'
' NOTES: 1) The table's name is designed to float it to the top of the

table
list and call attention
' to the fact that is something out-of-the-ordinary table-wise
1010 Dim myRS As DAO.Recordset

Static myCurrentVersion As String

1060 If Len(myCurrentVersion) = 0 Then
1160 Set myRS = CurrentDb().OpenRecordset("SELECT Max([----------

Program
Changes ----------].versionNumber) AS MaxOfversionNumber FROM [---------- Program Changes ----------];", dbOpenSnapshot)
1180 myCurrentVersion = "v" & VBA.Format$(Nz(myRS!MaxOfversionNumber,
"0.00"))
1240 End If

1999 currentVersionGet_bal = myCurrentVersion

currentVersionGet_bal_xit:
On Error Resume Next
myRS.Close
Set myRS = Nothing
Exit Function

currentVersionGet_bal_err:
MsgBox "currentVersionGet() failed at line " & Str(Erl) & ", Error " &

Str(Err)
& ": " & Error$, 48, "Error In Error Handler"
Resume currentVersionGet_bal_xit
End Function
Sub stackClear()

' PURPOSE: To clear the debug stack. Intended for use while debugging.

Dim i As Integer

If gStackPointer > 1 Then
For i = 0 To gStackLimit
If gDebugStack(i) <> "" Then
gDebugStack(i) = ""
End If
Next i
End If

gStackPointer = 0

stackClear_xit:
On Error Resume Next
Exit Sub

stackClear_err:
Resume stackClear_xit
End Sub
Private Function windozeIdGet_bal()
On Error GoTo windozeIdGet_bal_err

' PURPOSE: To get the current Windows UserID
' RETURNS: ID or error message

Dim myBuffer As String * 255
Dim myUserName As String

GetUserName_bal myBuffer, Len(myBuffer) 'Get

the
user name
myUserName = Left(Trim(myBuffer), InStr(myBuffer, Chr(0)) - 1)

'Trim excess
characters

If Len(myUserName) > 0 Then
windozeIdGet_bal = myUserName
Else
windozeIdGet_bal "windozeIdGet_bal() Unable to get Windows UserID"
End If

windozeIdGet_bal_xit:
On Error Resume Next
Exit Function

windozeIdGet_bal_err:
MsgBox "stipNulls() failed. Error " & Str(Err) & ": " & Error$, 48,

"Error In
Error Handler"
Resume windozeIdGet_bal_xit
End Function
----------------------------------------------
--
PeteCresswell


Nov 12 '05 #11
David,
It's not in his error handler it's in the cleanup code just before the
procedure exit point.

Terry

"David W. Fenton" <dX********@bway.net.invalid> wrote in message
news:94***************************@24.168.128.74.. .
Ma**@NoSpam.com (Matthew Sullivan) wrote in
<lk********************************@4ax.com>:
You might want an "On Error Resume Next" as the first thing in
your Exit section.

Exit_Here:
On Error Resume Next
'do some stuff here
Exit Sub

Reason: if an error gets raised in the Exit section, your
ErrorHandler will go into an infinite loop.


Er, I've never written a single error handler with that in it, nor
ever seen one in any of the Access books I've used, and I've never
encountered an error in an error handler. Of course, the only thing
I ever do in an error handler is to display an error message and
redirect to the appropriate location in code.

--
David W. Fenton http://www.bway.net/~dfenton
dfenton at bway dot net http://www.bway.net/~dfassoc

Nov 12 '05 #12
Perhaps I can put a call to a Function in the On Error event of each form:

= modHandler.LogErr (Me.Form.Name)

Will that work?

shouldn't that trap all errors from any sub within the form's module? (much
easier than adding handler code to every sub in the entire mdb!)

BUT...

how to deal with stuff I want to trap? If I put something like the below
code in modHandler.LogErr, shouldn't that let me trap a particular error in
a particular form? But what if I want to run different code in *different
subs* for the same error in the same form module? Can the On Error event of
the form be overridden?

Or am I missing something and totally on the wrong track?

Public Function LogErr (fn)
Dim strErrMsg As String
Dim strSql As String
Exit_Here:
On Error Resume Next
Exit Function
Select Case Err.Number
Case 94
If fn = "frm1" Then
run code stuff specific to error 94 in *ALL SUBS* in frm1
Resume Exit_Here
End If
If fn = "frm2"
run code specific to error 94 in *ALL SUBS* in frm2
Resume Exit_Here
End If
'... and so on for each form in question
Case Else
Resume Exit_Here
End Select
strErrMsg = fn & " -- Error Number " & Err.Number & ": " &
Err.Description
MsgBox strErrMsg
strSql = "INSERT INTO tblErrors ( [ErrMsg] ) VALUES (" & """" &
strErrMsg & """)"
DoCmd.SetWarnings False
DoCmd.RunSQL strSql
DoCmd.SetWarnings True
End Function
"deko" <dj****@hotmail.com> wrote in message
news:Is******************@newssvr25.news.prodigy.c om...
I use this convention frequently:

Exit_Here:
Exit Sub
HandleErr:
Select Case Err.Number
Case 3163
Resume Next
Case 3376
Resume Next
Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description
Resume Exit_Here
End Select

Is there a way to include the current procedure name on Case Else?

perhaps something like this:

Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description &
vbCrLf & _
Me.ProcedureName & Me.Form
Resume Exit_Here
End Select
(note: "Me.ProcedureName" is pseudo code - I don't know if it's possible to get this...)

How about offloading this to a module so I don't have to type it out every
time:

Case Else
strP = Me!Procedure
strF = Me.Form
modErr.caseElse
End Select

thoughts ? suggestions ?

Thanks in advance...


Nov 12 '05 #13
so far, I cannot get this idea to work...

"deko" <dj****@hotmail.com> wrote in message
news:Qs******************@newssvr25.news.prodigy.c om...
Perhaps I can put a call to a Function in the On Error event of each form:

= modHandler.LogErr (Me.Form.Name)

Will that work?

shouldn't that trap all errors from any sub within the form's module? (much easier than adding handler code to every sub in the entire mdb!)

BUT...

how to deal with stuff I want to trap? If I put something like the below
code in modHandler.LogErr, shouldn't that let me trap a particular error in a particular form? But what if I want to run different code in *different
subs* for the same error in the same form module? Can the On Error event of the form be overridden?

Or am I missing something and totally on the wrong track?

Public Function LogErr (fn)
Dim strErrMsg As String
Dim strSql As String
Exit_Here:
On Error Resume Next
Exit Function
Select Case Err.Number
Case 94
If fn = "frm1" Then
run code stuff specific to error 94 in *ALL SUBS* in frm1
Resume Exit_Here
End If
If fn = "frm2"
run code specific to error 94 in *ALL SUBS* in frm2
Resume Exit_Here
End If
'... and so on for each form in question
Case Else
Resume Exit_Here
End Select
strErrMsg = fn & " -- Error Number " & Err.Number & ": " &
Err.Description
MsgBox strErrMsg
strSql = "INSERT INTO tblErrors ( [ErrMsg] ) VALUES (" & """" &
strErrMsg & """)"
DoCmd.SetWarnings False
DoCmd.RunSQL strSql
DoCmd.SetWarnings True
End Function
"deko" <dj****@hotmail.com> wrote in message
news:Is******************@newssvr25.news.prodigy.c om...
I use this convention frequently:

Exit_Here:
Exit Sub
HandleErr:
Select Case Err.Number
Case 3163
Resume Next
Case 3376
Resume Next
Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description
Resume Exit_Here
End Select

Is there a way to include the current procedure name on Case Else?

perhaps something like this:

Case Else
MsgBox "Error Number " & Err.Number & ": " & Err.Description & vbCrLf & _
Me.ProcedureName & Me.Form
Resume Exit_Here
End Select
(note: "Me.ProcedureName" is pseudo code - I don't know if it's possible

to
get this...)

How about offloading this to a module so I don't have to type it out every time:

Case Else
strP = Me!Procedure
strF = Me.Form
modErr.caseElse
End Select

thoughts ? suggestions ?

Thanks in advance...


Nov 12 '05 #14

This thread has been closed and replies have been disabled. Please start a new discussion.

Similar topics

7
by: Pavils Jurjans | last post by:
Hallo, I have been programming for restricted environments where Internet Explorer is a standard, so I haven't stumbled upon this problem until now, when I need to write a DOM-compatible code. ...
136
by: Matt Kruse | last post by:
http://www.JavascriptToolbox.com/bestpractices/ I started writing this up as a guide for some people who were looking for general tips on how to do things the 'right way' with Javascript. Their...
4
by: Sandy | last post by:
Hello - I read an interesting article on the web wherein the author states he doesn't handle too many errors at page level, but handles them at the application level. He further goes on to show...
0
by: Benny Ng | last post by:
Hi,All, When i deploy Enterprise library with my application ,i used XCOPY to deploy it into my test server. But when application runs, shown some error related registry. (But actually I haven't...
10
by: jojobar | last post by:
Hello, I am trying to use vs.net 2005 to migrate a project originally in vs.net 2003. I started with creation of a "web site", and then created folders for each component of the site. I read...
10
by: Fao, Sean | last post by:
A guy I know never refactors his code and insists on putting everything in an event handler. For example, he does some initialization of a DataGrid in the ItemDataBound event handler (which is...
1
by: Phil Powell | last post by:
&lt;input type="submit" name="delete_student" value="Delete Applicant" onClick="setSubmitVal(this); return willDeleteApplicant('O&amp;#039;Connor, Kerry B');"&gt; This HTML tag causes Javascript errors in...
3
by: alvinwoon | last post by:
Hi guys, I find it frustrating that I need to sniff out IE to make event handler for the form's select element work across different browsers. Here's a summary of what I have right now: var...
0
by: joshfink | last post by:
Hey guys, I am writing an application where I want to follow the best practices on error handling. This is what I have: I created an enum for various issues that could happen within the...
0
by: emmanuelkatto | last post by:
Hi All, I am Emmanuel katto from Uganda. I want to ask what challenges you've faced while migrating a website to cloud. Please let me know. Thanks! Emmanuel
1
by: nemocccc | last post by:
hello, everyone, I want to develop a software for my android phone for daily needs, any suggestions?
0
marktang
by: marktang | last post by:
ONU (Optical Network Unit) is one of the key components for providing high-speed Internet services. Its primary function is to act as an endpoint device located at the user's premises. However,...
0
Oralloy
by: Oralloy | last post by:
Hello folks, I am unable to find appropriate documentation on the type promotion of bit-fields when using the generalised comparison operator "<=>". The problem is that using the GNU compilers,...
0
by: Hystou | last post by:
Overview: Windows 11 and 10 have less user interface control over operating system update behaviour than previous versions of Windows. In Windows 11 and 10, there is no way to turn off the Windows...
0
tracyyun
by: tracyyun | last post by:
Dear forum friends, With the development of smart home technology, a variety of wireless communication protocols have appeared on the market, such as Zigbee, Z-Wave, Wi-Fi, Bluetooth, etc. Each...
0
agi2029
by: agi2029 | last post by:
Let's talk about the concept of autonomous AI software engineers and no-code agents. These AIs are designed to manage the entire lifecycle of a software development project—planning, coding, testing,...
0
isladogs
by: isladogs | last post by:
The next Access Europe User Group meeting will be on Wednesday 1 May 2024 starting at 18:00 UK time (6PM UTC+1) and finishing by 19:30 (7.30PM). In this session, we are pleased to welcome a new...
0
by: conductexam | last post by:
I have .net C# application in which I am extracting data from word file and save it in database particularly. To store word all data as it is I am converting the whole word file firstly in HTML and...

By using Bytes.com and it's services, you agree to our Privacy Policy and Terms of Use.

To disable or enable advertisements and analytics tracking please visit the manage ads & tracking page.