asked on
Problem signature:
Problem Event Name: APPCRASH
Application Name: MSACCESS.EXE
Application Version: 12.0.6606.1000
Application Timestamp: 4e27ab6b
Fault Module Name: MSVCR80.dll
Fault Module Version: 8.0.50727.4940
Fault Module Timestamp: 4ca2b271
Exception Code: c0000005
Exception Offset: 000172d7
OS Version: 6.1.7601.2.1.0.1296.17
Locale ID: 2057
Additional information about the problem:
LCID: 1033
Brand: Office12Crash
skulcid: 1033
Read our privacy statement online:
http://go.microsoft.com/fwlink/?linkid=104288&clcid=0x0409
If the online privacy statement is not available, please read our privacy statement offline:
C:\Windows\system32\en-US\erofflps.t xt
ASKER
ASKER
Dim dbs As DAO.Database
Dim qdf As DAO.QueryDef
Dim rst As DAO.Recordset
Dim iSite as Integer
Set dbs = CurrentDb
Set qdf = dbs.QueryDefs("qryUpdER03")
fAddParamQDF qdf, "bLMS", False
fAddParamQDF qdf, "iSite", iSite
fOpenRecordset , rst, , dbOpenSnapshot, , , , qdf
I have the add params and open rst in subs with error handling, but other than that they do nothing special:
Public Sub fAddParamQDF(ByRef qdf As DAO.QueryDef, ByVal ParamName As String, ByVal ParamVal)
...
qdf.Parameters(ParamName) = ParamVal
...
End Sub
Public Function fOpenRecordset(Optional ByRef dbs As DAO.Database, Optional ByRef rst As DAO.Recordset, Optional ByVal sRST As String, Optional ByVal sOpenType As _
Variant, Optional ByVal sOptions As Variant, Optional ByVal sLockEdit As Variant, Optional bHandleErrors As Boolean = _
False, Optional ByRef qdf As DAO.QueryDef) As Boolean
....
Set rst = qdf.OpenRecordset(sOpenType, sOptions, sLockEdit)
...
End Function
The accdb manages APIs into online retail platforms, and links back to about 30 Access backends with tthe data in. However this query is just a simple select query (despite 'qryApp...' name). No references are broken. I'm just checking for non-essential updates to see if it changes it.Dim dbs As DAO.Database
Dim rst As DAO.Recordset
Dim SQL as String
Dim iSite as Integer
Set dbs = CurrentDb
SQL = "SELECT <fieldlist> FROM <TblName> WHERE iSite = " & iSite " " & _
"and bLMS= False"
Set rst = dbs.OpenRecordset(SQL)
ASKER
ASKER
ASKER
ASKER
SELECT tblD.*, tblChildCat.*, tblParentCat.* FROM (tblCategoryRef AS tblChildCat LEFT JOIN tblCategoryRef AS tblParentCat ON tblChildCat.nesc_ParentCat = tblParentCat.nesc_ID) INNER JOIN tblD ON tblChildCat.nesc_ID = tblD.d_ESCR;
This now runs fine. The structure has not been changed to the query which will not run:SELECT [...]
FROM (tblCategoryRef AS ChildCat LEFT JOIN tblCategoryRef AS ParentCat ON ChildCat.nesc_ParentCat = ParentCat.nesc_ID) INNER JOIN (qryIsbnData INNER JOIN tblD ON qryIsbnData.isbn_dewey = tblD.[dewey_#]) ON ChildCat.nesc_ID = tblD.dewey_ESCF;
For information, 'qryIsbnData' as referenced in that query is simply
SELECT tblIsbnDataA.*, tblIsbnDataB.isbn_desc
FROM tblIsbnDataA INNER JOIN tblIsbnDataB ON tblIsbnDataA.isbn_isbn = tblIsbnDataB.isbn_isbn;
ASKER
Problem signature:
Problem Event Name: APPCRASH
Application Name: MSACCESS.EXE
Application Version: 12.0.6606.1000
Application Timestamp: 4e27ab6b
Fault Module Name: MSVCR80.dll
Fault Module Version: 8.0.50727.6195
Fault Module Timestamp: 4dcddbf3
Exception Code: c0000005
Exception Offset: 000172d7
OS Version: 6.1.7601.2.1.0.1296.17
Locale ID: 2057
Additional information about the problem:
LCID: 1033
Brand: Office12Crash
skulcid: 1033
Read our privacy statement online:
http://go.microsoft.com/fwlink/?linkid=104288&clcid=0x0409
If the online privacy statement is not available, please read our privacy statement offline:
C:\Windows\system32\en-US\erofflps.t xt
ASKER
SELECT tblIsbnDataA.FldName1, tblIsbnDataA.FldName2,
tblIsbnDataA.FldName3, [...], tblIsbnDataB.isbn_desc
FROM tblIsbnDataA INNER JOIN tblIsbnDataB ON tblIsbnDataA.isbn_isbn = tblIsbnDataB.isbn_isbn;
ASKER
ASKER
ASKER
I was re-reading the thread and caught this. I hope you meant test machine but not production?
"The instruction at 0x73a672d7 referenced memory at 0x00000000. The memory could not be written. Click OK to terminate program."although Access does indeed restart OK.
DELETE tblSTA.sta_d_id, tblSTA.*
FROM tblIsbnDataA INNER JOIN tblSTA ON tblIsbnDataA.isbn_13dbl=tblSTA.sta_isbn13
WHERE (((tblSTA.sta_d_id)<>[isbn_d_id]));
Dim dbs As DAO.Database
Dim rst As DAO.Recordset
Set dbs = CurrentDb
dbs.Execute "qryDelIncorrectAssigned"
Set dbs = Nothing
ASKER
You need to pin this down a bit more; take a copy of a DB where it does run and they try it on this new server (not sure if you've actually done this or not).
If it runs, then it was VBA project corruption. If not, then it's something in the environment of the new server and if it's just this query, I would suspect your tripping over a bug based on the specific syntax of that SQL statement.
Also you said you cut and paste the SQL; did you literially do that? I mean execute and let the SQL statement build and then copy paste right from the debug window? If not, try that as well and make sure the statement executes.
Jim.
ASKER
DELETE tblSTA.sta_d_id, tblSTA.*
FROM tblIsbnDataA INNER JOIN tblSTA ON tblIsbnDataA.isbn_13dbl=tblSTA.sta_isbn13
WHERE (((tblSTA.sta_d_id)<>[isbn_d_id]))
; cause the crash, so does
SELECT tblSTA.sta_d_id, tblSTA.*
FROM tblIsbnDataA INNER JOIN tblSTA ON tblIsbnDataA.isbn_13dbl=tblSTA.sta_isbn13
WHERE (((tblSTA.sta_d_id)<>[isbn_d_id]));
ASKER
ASKER
ASKER
Still having the same issue; the new database(s) are failing after 1-3 days'. Once replaced it/they seem to work again fine, until they don't...Then something is amiss on the server, either in the Office or Windows installation. Unfortunately I don't know of any way to trace down the actual culprit, and you couldn't really do much even if you did find it - system files have such a long dependency chain that you can't really just pluck one component out and expect it to work properly.
ASKER
ASKER
Microsoft Access is a rapid application development (RAD) relational database tool. Access can be used for both desktop and web-based applications, and uses VBA (Visual Basic for Applications) as its coding language.
TRUSTED BY
ASKER
OK, does not crash on the old server either (Win 2003).