Creating a Stored Procedure that Accepts Parameters : Stored Procedure « Access « VBA / Excel / Access / Word






Creating a Stored Procedure that Accepts Parameters

 

Sub Create_SpWithParam() 
    Dim conn As ADODB.Connection 

    On Error GoTo ErrorHandler 

    Set conn = CurrentProject.Connection 

    conn.Execute "CREATE PROCEDURE procEnterData(@Company TEXT (40), @Tel TEXT (24)) AS " & _ 
        "INSERT INTO employee (CompanyName, Phone) VALUES (@Company, @Tel);" 
ExitHere: 
    If Not conn Is Nothing Then 
        If conn.State = adStateOpen Then conn.Close 
    End If 
    Set conn = Nothing 
    Exit Sub 
ErrorHandler: 
    If InStr(1, Err.Description, "procEnterData") Then 
        conn.Execute "DROP PROC procEnterData" 
        Resume 
    Else 
        MsgBox Err.Number & ":" & Err.Description 
        Resume ExitHere 
    End If 
End Sub 

 








Related examples in the same category

1.Create a stored procedure
2.Call store procedure
3.Use the EXECUTE statement to execute the stored procedure
4.Executing a Parameterized Stored Procedure
5.Deleting a Stored Procedure
6.Executing a Stored Procedure Containing Parameters