Finding the Record Position : Recordset Find « Access « VBA / Excel / Access / Word






Finding the Record Position

 
Sub FindRecordPosition()
   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
   With rst
      .Open "Select * from Employees", conn, adOpenKeyset, _
          adLockOptimistic, adCmdText
   Debug.Print .AbsolutePosition
      .Move 3 ' move forward 3 records
      Debug.Print .AbsolutePosition
      .MoveLast ' move to the last record
      Debug.Print .AbsolutePosition
      Debug.Print .RecordCount
      .Close
   End With

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

 








Related examples in the same category

1.Change column data case
2.Simple Select statement
3.SQL with where clause
4.Select specific column in select statement
5.Finding Records Using the Find Method
6.Finding a Record Based on Multiple Criteria
7.Finding a Specific Record in a Recordset
8.Find record by using Recordset.FindFirst
9.NoMatch property in Recordset