Creating Compound Documents Programmatically Using OleObjects : OLEObject « Data Type « VBA / Excel / Access / Word

Home
VBA / Excel / Access / Word
1.Access
2.Application
3.Data Type
4.Data Type Functions
5.Date Functions
6.Excel
7.File Path
8.Forms
9.Language Basics
10.Math Functions
11.Outlook
12.PowerPoint
13.String Functions
14.Windows API
15.Word
16.XML
VBA / Excel / Access / Word » Data Type » OLEObject 
Creating Compound Documents Programmatically Using OleObjects
 
Sub CreateCompoundDocument()
    Dim rg As range
    Dim obj As OLEObject
    Set rg = ThisWorkbook.Worksheets(1).Cells(22)
    Set obj = InsertObject(rg, "C:\testdoc.doc", False)
    If Not obj Is Nothing Then
        Debug.Print "Object inserted."
    Else
        Debug.Print "Sorry - the object could not be inserted."
    End If
    Set obj = Nothing
    Set rg = Nothing
End Sub
Function InsertObject(rgTopLeft As range, sFile As String, bLink As BooleanAs OLEObject
    Dim obj As OLEObject
    On Error GoTo ErrHandler
    Set obj = rgTopLeft.Parent.OLEObjects.add(FileName:=sFile, Link:=bLink)
    obj.Top = rgTopLeft.Top
    obj.Left = rgTopLeft.Left
    Set InsertObject = obj
    Exit Function
ErrHandler:
    Debug.Print Err.Description
    Set InsertObject = Nothing
End Function

 
Related examples in the same category
www.java2java.com | Contact Us
Copyright 2009 - 12 Demo Source and Support. All rights reserved.
All other trademarks are property of their respective owners.