Creating a Group Account : Group Account « Access « VBA / Excel / Access / Word






Creating a Group Account

 
Sub Create_Group() 
    Dim cat As ADOX.Catalog 
    Dim conn As ADODB.Connection 
    Dim strDB As String 
    Dim strSysDb As String 
    Dim strName As String 

    On Error GoTo ErrorHandle 

    strDB = CurrentProject.Path & "\mydb.mdb" 
    strSysDb = CurrentProject.Path & "\mydb.mdw" 
    strName = "Masters" 
 
    Set conn = New ADODB.Connection 
        With conn 
            .Provider = "Microsoft.Jet.OLEDB.4.0" 
            .Properties("Jet OLEDB:System Database") = strSysDb 
            .Properties("User ID") = "Developer" 
            .Properties("Password") = "pass" 
            .Open strDB 
        End With 

    Set cat = New ADOX.Catalog 
    With cat 
        .ActiveConnection = conn 
        .Groups.Append strName 
    End With 
    Debug.Print "Successfully created " & strName & " group account." 

ExitHere: 
    Set cat = Nothing 
    conn.Close 
    Set conn = Nothing 
    Exit Sub 
ErrorHandle: 
    If Err.Number = -2147467259 Then 
        MsgBox strName & " group already exists." 
    Else 
        MsgBox Err.Description 
    End If 
End Sub 

 








Related examples in the same category

1.To create a new group account in the current database
2.Adding a User to a New Group
3.Deleting a Group Account
4.Listing All Group Accounts
5.Listing Users in Groups
6.Creating a Group Account with SQL command
7.Making a User Account a Member of a Group with SQL command
8.Removing a User Account from a Group with SQL command
9.Deleting a User Account with SQL command
10.Granting Permissions for Tables to an Existing Group with SQL command
11.Revoking Security Permissions with SQL command
12.Deleting a Group Account with SQL command
13.Add group
14.Add user to group