Creating a Primary Key : Primary Key « Access « VBA / Excel / Access / Word






Creating a Primary Key

 
Sub Create_PrimaryKey()
   Dim cat As New ADOX.Catalog
   Dim myTable As New ADOX.Table
   Dim pKey As New ADOX.Key

   On Error GoTo ErrorHandler
   cat.ActiveConnection = CurrentProject.Connection
   Set myTable = cat.Tables("java2sTable")

   With pKey
      .Name = "PrimaryKey"
      .Type = adKeyPrimary
   End With

   pKey.Columns.Append "Id"
   myTable.Keys.Append pKey

   Set cat = Nothing
   Exit Sub

ErrorHandler:
   If Err.Number = -2147217856 Then
      MsgBox "The 'java2sTable' is open.", _
          vbCritical, "Please close the table"
   ElseIf Err.Number = -2147217767 Then
      myTable.Keys.Delete pKey.Name
      Resume
   Else
      MsgBox Err.Number & ": " & Err.Description
   End If
End Sub

 








Related examples in the same category

1.Adding a Primary Key to a Table with SQL command
2.Creating a Single-Field Primary Key with SQL command
3.Create a primary key