Changing the Start (Seed) Value of the AutoNumber Field with SQL command : Table Column Field « Access « VBA / Excel / Access / Word






Changing the Start (Seed) Value of the AutoNumber Field with SQL command

 
Sub ChangeAutoNumber() 
    Dim conn As ADODB.Connection 
    Dim strDb As String 
    Dim strConnect As String 
    Dim strTable As String 
    Dim strCol As String 
    Dim intSeed As Integer 

    On Error GoTo ErrorHandler 

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

    strTable = "myTable" 
    strCol = "Id" 
    intSeed = 1000 

    Set conn = New ADODB.Connection 
    conn.Open strConnect 
    conn.Execute "ALTER TABLE " & strTable & " ALTER COLUMN " & strCol & " COUNTER (" & intSeed & ");" 
ExitHere: 
    conn.Close 
    Set conn = Nothing 
    Exit Sub 
ErrorHandler: 
    If Err.Number = -2147467259 Then 
        Debug.Print "The database file cannot be located.", _ 
            vbCritical, strDb 
        Exit Sub 
    Else 
        Debug.Print Err.Number & ":" & Err.Description 
        Resume ExitHere 
    End If 
End Sub 

 








Related examples in the same category

1.Append new columns to new table
2.Delete a column
3.Adding a New Field to a Table
4.Removing a Field from a Table
5.Set column properties by using ADOX.Table
6.Listing Field Properties
7.Get field properties
8.Listing Tables and Their Fields Using the OpenSchema Method
9.Adding a New Money type Field to an Existing Table
10.Adding a Field with SQL command
11.Changing the Field Data Type with SQL command
12.Changing the Size of a Field with SQL command
13.Deleting a Field from a Table with SQL command
14.Setting a Default Value for a Field with SQL command
15.Read record in recordset by referening the field name with '!'
16.Open a table and read data by column
17.Show field name, type and value data type
18.Read specific columns from Recordset
19.Checking for Existence of a Field