Format fonts : Form « Forms « VBA / Excel / Access / Word






Format fonts

 

Sub PermanentFormFonts (strFont As String)
    On Error GoTo PermanentFormFonts_Err
    Dim objAO        As AccessObject 
    Dim objCP        As Object       
    Dim ctlControl    As Control     
    Set objCP = Application.CurrentProject
    For Each objAO In objCP.AllForms
        DoCmd.OpenForm objAO.Name, acDesign, , , , acHidden
        For Each ctlControl In objAO.Controls
            ctlControl.FontName = strFont
        Next
        DoCmd.Close acForm, objAO.Name, acSaveYes
    Next
PermanentFormFonts_Exit:
    Exit Sub
PermanentFormFonts_Err:
    If Err.Number = 438 Then
        Resume Next
    Else
        MsgBox Err.Description
        Resume PermanentFormFonts_Exit
    End If

End Sub

 








Related examples in the same category

1.Change caption
2.Display form in Modal mode
3.Close a form
4.To remove the Userform from the computer's memory, you must use the Unload statement; otherwise, the Userform is only hidden.
5.Creating UserForms Programmatically
6.Adding Controls to a UserForm at Design Time
7.Output form to html file
8.Using the Show Method to Display a Form
9.Loading a Form into Memory Prior to Displaying It
10.Cancels a cancelable event (an event that has a Cancel parameter).
11.Open a form, format the fonts and close it
12.Form count