Moving Around in a Recordset : Recordset Cursor « Access « VBA / Excel / Access / Word






Moving Around in a Recordset

 
Sub MoveAround()
   Dim conn As ADODB.Connection
   Dim rst As ADODB.Recordset
   Dim fld As ADODB.Field
   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 Customers where ContactTitle = 'Owner'", _
       conn, adOpenForwardOnly, adLockReadOnly
   Do While Not rst.EOF
      For Each fld In rst.Fields
         Debug.Print fld.Name & " = " & fld.Value
      Next
      rst.MoveNext
   Loop

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

 








Related examples in the same category

1.Navigate through a recordset
2.Move the resultset cursor with MoveNext method
3.Move cursor in a Recordset with MoveNext
4.Supplying the CursorType as a Parameter of the Open Method
5.Using the Recordset Movements() Methods on a Recordset Object
6.Moving Through the Records in a Recordset:MoveFirst - To the first record in a recordset
7.Moving Through the Records in a Recordset:MoveLast - To the last record in a recordset
8.Moving Through the Records in a Recordset:MovePrevious - To the previous record in a recordset
9.Moving Through the Records in a Recordset:MoveNext - To the next record in a recordset
10.Set CursorType to adOpenForwardOnly
11.Set CursorType to adOpenStatic
12.Set CursorType to adOpenKeyset
13.Set CursorType to adOpenDynamic
14.Supplying the CursorType as a Property of the Recordset Object
15.Designating the Cursor Location
16.Set CursorLocation to adUseServer
17.Set Cursor Location to adUseClient
18.Check after using the MoveNext method whether the end of the file has been reached
19.moves 5 records backward from the current record in a DAO recordset: