Opening a Recordset Based on Criteria : Recordset Open « Access « VBA / Excel / Access / Word






Opening a Recordset Based on Criteria

 
Sub OpenRst_WithCriteria()
   Dim conn As ADODB.Connection
   Dim rst As ADODB.Recordset
   Dim strConn As String

   strConn = "Provider=Microsoft.Jet.OLEDB.4.0;" & _
     "Data Source=" & CurrentProject.Path & _
      "\mydb.mdb"

   Set conn = New ADODB.Connection
   conn.Open strConn

   Set rst = New ADODB.Recordset
   rst.Open "SELECT * FROM Employees WHERE ReportsTo is Null", _
       conn, adOpenForwardOnly, adLockReadOnly

   Do While Not rst.EOF
      Debug.Print rst.Fields(1).Value
      rst.MoveNext
   Loop

   rst.Close
   Set rst = Nothing
   conn.Close
   Set conn = Nothing
End Sub

 








Related examples in the same category

1.Opening a DAO Recordset Using a Table
2.Use dbOpenSnapshot when opening an recordset
3.Connection error handler
4.Opening a DAO Recordset Using a SQL SELECT Statement
5.sets the locking type in the call to the Open method
6.Creating a Recordset Using a Connection String
7.Get Recordset content by calling Recordset.GetString
8.Creating a Recordset Using the ActiveConnection Property
9.Creating a Recordset Using a Connection Object
10.Opening a Recordset
11.Opening a Recordset Based on a Table or Query with SQL command
12.Recordset.Open method
13.Opening a Recordset Based on a Table or Query
14.Opening a Recordset Based on an SQL Statement
15.Opening a Recordset Directly
16.The RecordCount Property Is Not Supported with a Forward-Only Recordset
17.Options of Open Method: adCmdText - The provider evaluates the source as a command
18.adCmdTable - A SQL query is generated to return all rows from the table named in the source.
19.adCmdTableDirect - The provider returns all rows in the table named in the source.
20.adCmdStoredProc - The provider evaluates the source as a stored procedure.
21.adCmdUnknown - The type of command in the source is unknown.
22.adCmdFile - The source is evaluated as a persisted recordset.
23.adAsyncExecute - The source is executed asynchronously.
24.adAsyncFetch - The initial quantity specified in the Initial Fetch Size property is fetched.
25.adAsyncFetchNonBlocking - The main thread never blocks when fetching.
26.Opening a Recordset with Inconsistent Updates