Finding Records Using the Seek Method (Seek constants) : Recordset Seek « Access « VBA / Excel / Access / Word






Finding Records Using the Seek Method (Seek constants)

 
Constant         Value    Description
adSeekFirstEQ    1        Seeks the first key equal to KeyValues.
adSeekLastEQ     2        Seeks the last key equal to KeyValues.
adSeekAfterEQ    4        Seeks either a key equal to KeyValues or just after where that match would have occurred.
adSeekAfter      8        Seeks a key just after where a match with KeyValues would have occurred.
adSeekBeforeEQ   16       Seeks either a key equal to KeyValues or just before where that match would have occurred.
adSeekBefore     32       Seeks a key just before where a match with KeyValues would have occurred.


Sub Find_WithSeek()
   Dim conn As ADODB.Connection
   Dim rst As ADODB.Recordset

   Set conn = New ADODB.Connection
   conn.Open "Provider=Microsoft.Jet.OLEDB.4.0;Data Source=" & CurrentProject.Path & _
      "\mydb.mdb"

   Set rst = New ADODB.Recordset
   With rst
      .Index = "Region"
      .Open "Customers", conn, adOpenKeyset, adLockOptimistic, _
          adCmdTableDirect
      MsgBox rst.Supports(adSeek)
      .Seek "SP", adSeekFirstEQ
   End With

   If Not rst.EOF Then
      Debug.Print rst.Fields("CompanyName").Value
   End If

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

 








Related examples in the same category

1.Use seek method in Recordset
2.Use Do while to loop through until EOF