Link to home
Start Free TrialLog in
Avatar of Darlyne Pitt
Darlyne PittFlag for United States of America

asked on

VBA in Access 2010 - Run-time Error 430

I’m getting a Run-time error '430': Class does not support Automation or does not support expected interface" on this line of code
Set Me.lstResults.Recordset = rs

Open in new window

or this
Set Me![frmM_SearchForDocumentsSubForm].Form.Recordset = rs

Open in new window

. I am trying to get the ADO Recordset based on a SQL stored procedure to appear in an unbound Listbox or Subform of an Access form. I’m on Win 7 Machine using Access 2010 connecting to SQL Server 2008:

On_Click event:

Private Sub cmdRun_Click()
'On Error Resume Next

    Dim strSQL As String

    'Stored procedure + parameters called from form
    strSQL = "Exec sqlsp_searchalltables " & Me.txtTables & _
       ", " & "'%" & Me.txtSearchTerm & "%'"

    OpenMyRecordset rs, strSQL

    'debug - view procedure
    Me.lblQuery.Caption = strSQL
    Me.Repaint

    Set Me.lstResults.Recordset = rs
    'or this
    'Set Me![frmM_SearchForDocumentsSubForm].Form.Recordset = rs
End Sub

Open in new window


I found some solutions for this error on the web and tried all of them to no avail. Most suggested checking the references which I did and verified.

I am able to successfully connect to the SQL server and have the results display in both a Listbox and Subform when I use DAO Querydef and a passthrough query or if I use this .listbox method:

With Me.lstResults
    Do
       strItem = rs.Fields("CLIENT_ID").Value
       .AddItem strItem
       rs.MoveNext
    Loop Until rs.EOF
End With

Open in new window


I would prefer not to use the DAO method because I found I need the coding flexibility of ADO especially with connecting to multiple Recordsets in SQL. Thoughts?
Avatar of Anthony Berenguel
Anthony Berenguel
Flag of United States of America image

Where are you declaring the rs object?
Avatar of Darlyne Pitt

ASKER

In a separate module:

Public Function OpenMyRecordset(rs As ADODB.Recordset, strSQL As String, Optional rrCursor As rrCursorType, Optional rrLock As rrLockType, Optional bolClientSide As Boolean) As ADODB.Recordset

    If con.STATE = adStateClosed Then
        con.ConnectionString = "ODBC;Driver={SQL Server};Server=vnysql;DSN=RecordsMgmt_SQLDB;UID=DMP;Trusted_Connection=Yes;DATABASE=RecordsManagementDB;"
        con.Open
    End If

    Set rs = New ADODB.Recordset
    With rs
        .ActiveConnection = con
        If bolClientSide Then
            .CursorLocation = adUseClient
        Else
            .CursorLocation = adUseServer
        End If
        .CursorType = IIf((rrCursor = 0), adOpenStatic, rrCursor)
        .LockType = IIf((rrLock = 0), adLockReadOnly, rrLock)
        .Open strSQL
        If .EOF And .BOF Then
            NoRecords = True
            Exit Function
        End If
    End With
    
End Function

Open in new window

ASKER CERTIFIED SOLUTION
Avatar of Anthony Berenguel
Anthony Berenguel
Flag of United States of America image

Link to home
membership
This solution is only available to members.
To access this solution, you must be a member of Experts Exchange.
Start Free Trial
Avatar of Jim Horn
>Where are you declaring the rs object?
>In a separate module:
I don't see a 'Dim rs as ...' line in that function, which means it's being declared somewhere else, likely by the calling code block.

If you intend on that rs being available everywhere in your app, then in the top declaration section of any code module instead of Dim use..
Global rs as Recordset ' DAO. or ADODB., your call

Open in new window

If you intend on rs being an indifidual thing, then in the code block that calls the function use this
Global rs as Recordset ' DAO. or ADODB., your call

Open in new window

>when I use DAO Querydef and a passthrough query
Just for kicks and giggles, when you locate the 'Dim rs as...' line eyeball whether it is DAO.Recordset, ADODB.Recordset, or just rs.

If just rs, in any code window do a Tools:References and see whether DAO or ADODB is checked, and if so which is higher.   Reason I ask is because Access will interpret 'just rs' as whichever one is higher in the References dialog.
Okay, I think we're getting somewhere.  I did as @aebea suggested and changed the cursor type and the lock type and I'm no longer getting the Run Time error.  But what's happening now is that I'm getting  "run time error 7965: the object you entered is not a valid recordset property".  @jimhorn - I do have a global declaration in my module for rs.  Looks like this:

Option Compare Database
Option Explicit

Global con As New ADODB.Connection
Global rs As ADODB.Recordset
Global NoRecords As Boolean

Open in new window


My Access references

User generated image
I forgot to mention that the new error is on the same line of code as the previous error:  
Set Me.lstResults.Recordset = rs

Open in new window

I was able to get rid of the latest runtime error by removing the IF..THEN..ELSE statement referencing the .CursorLocation in my public function. Now it only read .CursorLocation = adUseClient. Viola, it now works perfectly! Thanks for all your help.
Glad you're all squared away. Have a good weekend!

ab