Inquietud Acerca de Macro que imprime informe

Super D.A.N.T.E

Quisiera saber lo siguiente, esta macro que me hiciste funciona muy bien:

    ruta = ThisWorkbook.Path & "\Formulas\"
    arch = h1.[E6] & " - " & Format(Date, "dd" & """ de """ & "mmmm" & """ de """ & "yyyy")
    '
    h3.PageSetup.PrintArea = "B17:O69"
    '
    ImpresoraActual = Application.ActivePrinter
    Application.Dialogs(xlDialogPrinterSetup).Show
    h3.PrintOut Copies:=1, Collate:=True
    Application.ActivePrinter = ImpresoraActual
    '
    '
    H3. Range("B17:O69").ExportAsFixedFormat xlTypePDF, _
        ruta & arch & ".pdf", xlQualityStandard, True, False,,, False
 h3. Range("B17:O69"). ClearContents
    '
    Set rango = h3.Range("B27:O70")
    For Each img In ActiveSheet.Shapes
        If Not Intersect(img.TopLeftCell, rango) Is Nothing And _
           Not Intersect(img.BottomRightCell, rango) Is Nothing Then
            img.Delete
        End If
    Next
    '
    MsgBox "Pdf generado", vbInformation, "PDF"

El me saca un listado de las impresoras disponibles y yo escojo en cual quiero imprimir y me imprime, OK.

Pero siempre escojo la segunda de la lista por que ese informe siempre debe imprimirse en esa.

Mi pregunta es la siguiente, ¿hay manera que en lugar de sacarme la lista siempre se imprima en la segunda de esa lista sin preguntarme?

Tener en cuenta que no es la predeterminada ni tampoco la puedo poner com0o predeterminada.

1 Respuesta

Respuesta
1

H o l a:

Pon lo siguiente en un módulo:

Option Explicit
'''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''
' modListPrinters
' By Chip Pearson, [email protected]  www.cpearson.com
' Created 22-Sept-2012
' This provides a function named GetPrinterFullNames that
' returns a String array, each element of which is the name
' of a printer installed on the machine.
'''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''
Private Const HKEY_CURRENT_USER As Long = &H80000001
Private Const HKCU = HKEY_CURRENT_USER
Private Const KEY_QUERY_VALUE = &H1&
Private Const ERROR_NO_MORE_ITEMS = 259&
Private Const ERROR_MORE_DATA = 234
Private Declare Function RegOpenKeyEx Lib "advapi32" _
    Alias "RegOpenKeyExA" ( _
    ByVal HKey As Long, _
    ByVal lpSubKey As String, _
    ByVal ulOptions As Long, _
    ByVal samDesired As Long, _
    phkResult As Long) As Long
Private Declare Function RegEnumValue Lib "advapi32.dll" _
    Alias "RegEnumValueA" ( _
    ByVal HKey As Long, _
    ByVal dwIndex As Long, _
    ByVal lpValueName As String, _
    lpcbValueName As Long, _
    ByVal lpReserved As Long, _
    lpType As Long, _
    lpData As Byte, _
    lpcbData As Long) As Long
Private Declare Function RegCloseKey Lib "advapi32.dll" ( _
    ByVal HKey As Long) As Long
Public Function GetPrinterFullNames() As String()
'''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''
' GetPrinterFullNames
' By Chip Pearson, [email protected], www.cpearson.com
' Returns an array of printer names, where each printer name
' is the device name followed by the port name. The value can
' be used to assign a printer to the ActivePrinter property of
' the Application object. Note that setting the ActivePrinter
' changes the default printer for Excel but does not change
' the Windows default printer.
'''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''''
Dim Printers() As String ' array of names to be returned
Dim PNdx As Long    ' index into Printers()
Dim HKey As Long    ' registry key handle
Dim Res As Long     ' result of API calls
Dim Ndx As Long     ' index for RegEnumValue
Dim ValueName As String ' name of each value in the printer key
Dim ValueNameLen As Long    ' length of ValueName
Dim DataType As Long        ' registry value data type
Dim ValueValue() As Byte    ' byte array of registry value value
Dim ValueValueS As String   ' ValueValue converted to String
Dim CommaPos As Long        ' position of comma character in ValueValue
Dim ColonPos As Long        ' position of colon character in ValueValue
Dim M As Long               ' string index
' registry key in HCKU listing printers
Const PRINTER_KEY = "Software\Microsoft\Windows NT\CurrentVersion\Devices"
PNdx = 0
Ndx = 0
' assume printer name is less than 256 characters
ValueName = String$(256, Chr(0))
ValueNameLen = 255
' assume the port name is less than 1000 characters
ReDim ValueValue(0 To 999)
' assume there are less than 1000 printers installed
ReDim Printers(1 To 1000)
' open the key whose values enumerate installed printers
Res = RegOpenKeyEx(HKCU, PRINTER_KEY, 0&, _
    KEY_QUERY_VALUE, HKey)
' start enumeration loop of printers
Res = RegEnumValue(HKey, Ndx, ValueName, _
    ValueNameLen, 0&, DataType, ValueValue(0), 1000)
' loop until all values have been enumerated
Do Until Res = ERROR_NO_MORE_ITEMS
    M = InStr(1, ValueName, Chr(0))
    If M > 1 Then
        ' clean up the ValueName
        ValueName = Left(ValueName, M - 1)
    End If
    ' find position of a comma and colon in the port name
    CommaPos = InStr(1, ValueValue, ",")
    ColonPos = InStr(1, ValueValue, ":")
    ' ValueValue byte array to ValueValueS string
    On Error Resume Next
    ValueValueS = Mid(ValueValue, CommaPos + 1, ColonPos - CommaPos)
    On Error GoTo 0
    ' next slot in Printers
    PNdx = PNdx + 1
    Printers(PNdx) = ValueName & " en " & ValueValueS
    ' reset some variables
    ValueName = String(255, Chr(0))
    ValueNameLen = 255
    ReDim ValueValue(0 To 999)
    ValueValueS = vbNullString
    ' tell RegEnumValue to get the next registry value
    Ndx = Ndx + 1
    ' get the next printer
    Res = RegEnumValue(HKey, Ndx, ValueName, ValueNameLen, _
        0&, DataType, ValueValue(0), 1000)
    ' test for error
    If (Res <> 0) And (Res <> ERROR_MORE_DATA) Then
        Exit Do
    End If
Loop
' shrink Printers down to used size
ReDim Preserve Printers(1 To PNdx)
Res = RegCloseKey(HKey)
' Return the result array
GetPrinterFullNames = Printers
End Function

Esta sería la macro actualizada:

Sub imprimir()
'Por.Dante Amor
    Dim Printers() As String
    ruta = ThisWorkbook.Path & "\Formulas\"
    arch = h1.[E6] & " - " & Format(Date, "dd" & """ de """ & "mmmm" & """ de """ & "yyyy")
    '
    h3.PageSetup.PrintArea = "B17:O69"
    '
    Printers = GetPrinterFullNames()
    Application.ActivePrinter = Printers(2)
    '
    h3.Range("B17:O69").ExportAsFixedFormat xlTypePDF, _
        ruta & arch & ".pdf", xlQualityStandard, True, False, , , False
    h3.Range("B17:O69").ClearContents
    '
    Set rango = h3.Range("B27:O70")
    For Each img In ActiveSheet.Shapes
        If Not Intersect(img.TopLeftCell, rango) Is Nothing And _
           Not Intersect(img.BottomRightCell, rango) Is Nothing Then
            img.Delete
        End If
    Next
    '
    MsgBox "Pdf generado", vbInformation, "PDF"
End Sub

En esta línea de la macro

Application.ActivePrinter = Printers(2)

Le estoy diciendo que active la impresora número 2, según tu comentario debe imprimir en la segunda impresora.


S a l u d o s

Añade tu respuesta

Haz clic para o

Más respuestas relacionadas