Creating a Table (ADOX data types vs. Microsoft Access data types) : Table Create « Access « VBA / Excel / Access / Word






Creating a Table (ADOX data types vs. Microsoft Access data types)

 
 
ADOX Data Type             Corresponding Data Type in Access
adBoolean                  Yes/No
adUnsignedTinyInt          Number (FieldSize = Byte)
adSmalIInt                 Number (FieldSize = Integer)
adSingle                   Number (FieldSize = Single)
adDouble                   Number (FieldSize = Double)
adDecimal                  Number (FieldSize = Decimal)
adInteger                  Number (FieldSize = LongInteger)
AutoNumber
adCurrency                 Currency
adVarWChar                 Text
adDate                     Date/Time
adLongVarBinary            OLE Object
dbMemo                     Memo
adLongVarWChar             Hyperlink 
' make sure to set up a reference to
' the Microsoft ADO Ext. 2.5 for DDL and Security
' Object Library

Sub Create_Table()
   Dim cat As ADOX.Catalog
   Dim myTable As ADOX.Table

   On Error GoTo ErrorHandler

   Set cat = New Catalog
   cat.ActiveConnection = CurrentProject.Connection
   Set myTable = New Table

   With myTable
      .Name = "java2sTable"
      With .Columns
         .Append "Id", adVarWChar, 10
         .Append "Description", adVarWChar, 255
         .Append "Type", adInteger
      End With
   End With
   cat.Tables.Append myTable

   Set cat = Nothing
   MsgBox "The new table 'java2sTable' was created."
   Exit Sub

ErrorHandler:
   If Err.Number = -2147217857 Then
      cat.Tables.Delete "java2sTable"
      Resume
   End If
   MsgBox Err.Number & ": " & Err.Description
End Sub

 








Related examples in the same category

1.Create a table with validation rule
2.Creating a Table in the Current Database with SQL statement
3.Creating a Table in a New Database with AUTOINCREMENT column
4.Creating a Table with a Single-Field Index with SQL command
5.Adding a Single-Field Index to an Existing Table with SQL command
6.Creating an Index Based on Two Fields with SQL command
7.Default Column value
8.Creating Check Constraints:add business rules for a table