Runtime error 339 при переходе на другую форму - VB

Узнай цену своей работы

Формулировка задачи:

Здравствуйте, у меня возникла проблема. Создал я программу на Visual Basic 6.0, откомпилировал, все хорошо пошло. Но у других, при переходе на вторую форму, вылетает ошибка runtime 339 и программа дальше не идет. Сам я программу проверял на своем нетбуке с ОС win7 и на ПК с ОС win8, все прекрасно было. На второй форме подключен компанент Common Dialog, для выбора файла. Подскажите, пожалуйста, как решить эту проблему?

Решение задачи: «Runtime error 339 при переходе на другую форму»

textual
Листинг программы
  1. 'Добавить на форму 6 Button
  2. Option Explicit
  3. Const FW_NORMAL = 400
  4. Const DEFAULT_CHARSET = 1
  5. Const OUT_DEFAULT_PRECIS = 0
  6. Const CLIP_DEFAULT_PRECIS = 0
  7. Const DEFAULT_QUALITY = 0
  8. Const DEFAULT_PITCH = 0
  9. Const FF_ROMAN = 16
  10. Const CF_PRINTERFONTS = &H2
  11. Const CF_SCREENFONTS = &H1
  12. Const CF_BOTH = (CF_SCREENFONTS Or CF_PRINTERFONTS)
  13. Const CF_EFFECTS = &H100&
  14. Const CF_FORCEFONTEXIST = &H10000
  15. Const CF_INITTOLOGFONTSTRUCT = &H40&
  16. Const CF_LIMITSIZE = &H2000&
  17. Const REGULAR_FONTTYPE = &H400
  18. Const LF_FACESIZE = 32
  19. Const CCHDEVICENAME = 32
  20. Const CCHFORMNAME = 32
  21. Const GMEM_MOVEABLE = &H2
  22. Const GMEM_ZEROINIT = &H40
  23. Const DM_DUPLEX = &H1000&
  24. Const DM_ORIENTATION = &H1&
  25. Const PD_PRINTSETUP = &H40
  26. Const PD_DISABLEPRINTTOFILE = &H80000
  27. Private Type POINTAPI
  28.     x As Long
  29.     y As Long
  30. End Type
  31. Private Type RECT
  32.     Left As Long
  33.     Top As Long
  34.     Right As Long
  35.     Bottom As Long
  36. End Type
  37. Private Type OPENFILENAME
  38.     lStructSize As Long
  39.     hwndOwner As Long
  40.     hInstance As Long
  41.     lpstrFilter As String
  42.     lpstrCustomFilter As String
  43.     nMaxCustFilter As Long
  44.     nFilterIndex As Long
  45.     lpstrFile As String
  46.     nMaxFile As Long
  47.     lpstrFileTitle As String
  48.     nMaxFileTitle As Long
  49.     lpstrInitialDir As String
  50.     lpstrTitle As String
  51.     flags As Long
  52.     nFileOffset As Integer
  53.     nFileExtension As Integer
  54.     lpstrDefExt As String
  55.     lCustData As Long
  56.     lpfnHook As Long
  57.     lpTemplateName As String
  58. End Type
  59. Private Type PAGESETUPDLG
  60.     lStructSize As Long
  61.     hwndOwner As Long
  62.     hDevMode As Long
  63.     hDevNames As Long
  64.     flags As Long
  65.     ptPaperSize As POINTAPI
  66.     rtMinMargin As RECT
  67.     rtMargin As RECT
  68.     hInstance As Long
  69.     lCustData As Long
  70.     lpfnPageSetupHook As Long
  71.     lpfnPagePaintHook As Long
  72.     lpPageSetupTemplateName As String
  73.     hPageSetupTemplate As Long
  74. End Type
  75. Private Type CHOOSECOLOR
  76.     lStructSize As Long
  77.     hwndOwner As Long
  78.     hInstance As Long
  79.     rgbResult As Long
  80.     lpCustColors As String
  81.     flags As Long
  82.     lCustData As Long
  83.     lpfnHook As Long
  84.     lpTemplateName As String
  85. End Type
  86. Private Type LOGFONT
  87.         lfHeight As Long
  88.         lfWidth As Long
  89.         lfEscapement As Long
  90.         lfOrientation As Long
  91.         lfWeight As Long
  92.         lfItalic As Byte
  93.         lfUnderline As Byte
  94.         lfStrikeOut As Byte
  95.         lfCharSet As Byte
  96.         lfOutPrecision As Byte
  97.         lfClipPrecision As Byte
  98.         lfQuality As Byte
  99.         lfPitchAndFamily As Byte
  100.         lfFaceName As String * 31
  101. End Type
  102. Private Type CHOOSEFONT
  103.         lStructSize As Long
  104.         hwndOwner As Long          '  caller's window handle
  105.        hDC As Long                '  printer DC/IC or NULL
  106.        lpLogFont As Long          '  ptr. to a LOGFONT struct
  107.        iPointSize As Long         '  10 * size in points of selected font
  108.        flags As Long              '  enum. type flags
  109.        rgbColors As Long          '  returned text color
  110.        lCustData As Long          '  data passed to hook fn.
  111.        lpfnHook As Long           '  ptr. to hook function
  112.        lpTemplateName As String     '  custom template name
  113.        hInstance As Long          '  instance handle of.EXE that
  114.                                       '    contains cust. dlg. template
  115.        lpszStyle As String          '  return the style field here
  116.                                       '  must be LF_FACESIZE or bigger
  117.        nFontType As Integer          '  same value reported to the EnumFonts
  118.                                       '    call back with the extra FONTTYPE_
  119.                                       '    bits added
  120.        MISSING_ALIGNMENT As Integer
  121.         nSizeMin As Long           '  minimum pt size allowed &
  122.        nSizeMax As Long           '  max pt size allowed if
  123.                                       '    CF_LIMITSIZE is used
  124. End Type
  125. Private Type PRINTDLG_TYPE
  126.     lStructSize As Long
  127.     hwndOwner As Long
  128.     hDevMode As Long
  129.     hDevNames As Long
  130.     hDC As Long
  131.     flags As Long
  132.     nFromPage As Integer
  133.     nToPage As Integer
  134.     nMinPage As Integer
  135.     nMaxPage As Integer
  136.     nCopies As Integer
  137.     hInstance As Long
  138.     lCustData As Long
  139.     lpfnPrintHook As Long
  140.     lpfnSetupHook As Long
  141.     lpPrintTemplateName As String
  142.     lpSetupTemplateName As String
  143.     hPrintTemplate As Long
  144.     hSetupTemplate As Long
  145. End Type
  146. Private Type DEVNAMES_TYPE
  147.     wDriverOffset As Integer
  148.     wDeviceOffset As Integer
  149.     wOutputOffset As Integer
  150.     wDefault As Integer
  151.     extra As String * 100
  152. End Type
  153. Private Type DEVMODE_TYPE
  154.     dmDeviceName As String * CCHDEVICENAME
  155.     dmSpecVersion As Integer
  156.     dmDriverVersion As Integer
  157.     dmSize As Integer
  158.     dmDriverExtra As Integer
  159.     dmFields As Long
  160.     dmOrientation As Integer
  161.     dmPaperSize As Integer
  162.     dmPaperLength As Integer
  163.     dmPaperWidth As Integer
  164.     dmScale As Integer
  165.     dmCopies As Integer
  166.     dmDefaultSource As Integer
  167.     dmPrintQuality As Integer
  168.     dmColor As Integer
  169.     dmDuplex As Integer
  170.     dmYResolution As Integer
  171.     dmTTOption As Integer
  172.     dmCollate As Integer
  173.     dmFormName As String * CCHFORMNAME
  174.     dmUnusedPadding As Integer
  175.     dmBitsPerPel As Integer
  176.     dmPelsWidth As Long
  177.     dmPelsHeight As Long
  178.     dmDisplayFlags As Long
  179.     dmDisplayFrequency As Long
  180. End Type
  181. Private Declare Function CHOOSECOLOR Lib "comdlg32.dll" Alias "ChooseColorA" (pChoosecolor As CHOOSECOLOR) As Long
  182. Private Declare Function GetOpenFileName Lib "comdlg32.dll" Alias "GetOpenFileNameA" (pOpenfilename As OPENFILENAME) As Long
  183. Private Declare Function GetSaveFileName Lib "comdlg32.dll" Alias "GetSaveFileNameA" (pOpenfilename As OPENFILENAME) As Long
  184. Private Declare Function PrintDialog Lib "comdlg32.dll" Alias "PrintDlgA" (pPrintdlg As PRINTDLG_TYPE) As Long
  185. Private Declare Function PAGESETUPDLG Lib "comdlg32.dll" Alias "PageSetupDlgA" (pPagesetupdlg As PAGESETUPDLG) As Long
  186. Private Declare Function CHOOSEFONT Lib "comdlg32.dll" Alias "ChooseFontA" (pChoosefont As CHOOSEFONT) As Long
  187. Private Declare Sub CopyMemory Lib "kernel32" Alias "RtlMoveMemory" (hpvDest As Any, hpvSource As Any, ByVal cbCopy As Long)
  188. Private Declare Function GlobalLock Lib "kernel32" (ByVal hMem As Long) As Long
  189. Private Declare Function GlobalUnlock Lib "kernel32" (ByVal hMem As Long) As Long
  190. Private Declare Function GlobalAlloc Lib "kernel32" (ByVal wFlags As Long, ByVal dwBytes As Long) As Long
  191. Private Declare Function GlobalFree Lib "kernel32" (ByVal hMem As Long) As Long
  192. Dim OFName As OPENFILENAME
  193. Dim CustomColors() As Byte
  194. Private Sub Command1_Click()
  195.     Dim sFile As String
  196.     sFile = ShowOpen
  197.     If sFile <> "" Then
  198.         MsgBox "You chose this file: " + sFile
  199.     Else
  200.         MsgBox "You pressed cancel"
  201.     End If
  202. End Sub
  203. Private Sub Command2_Click()
  204.     Dim sFile As String
  205.     sFile = ShowSave
  206.     If sFile <> "" Then
  207.         MsgBox "You chose this file: " + sFile
  208.     Else
  209.         MsgBox "You pressed cancel"
  210.     End If
  211. End Sub
  212. Private Sub Command3_Click()
  213.     Dim NewColor As Long
  214.     NewColor = ShowColor
  215.     If NewColor <> -1 Then
  216.         Me.BackColor = NewColor
  217.     Else
  218.         MsgBox "You chose cancel"
  219.     End If
  220. End Sub
  221. Private Sub Command4_Click()
  222.     MsgBox ShowFont
  223. End Sub
  224. Private Sub Command5_Click()
  225.     ShowPrinter Me
  226. End Sub
  227. Private Sub Command6_Click()
  228.     ShowPageSetupDlg
  229. End Sub
  230. Private Sub Form_Load()
  231.     'Redim the variables to store the cutstom colors
  232.    ReDim CustomColors(0 To 16 * 4 - 1) As Byte
  233.     Dim i As Integer
  234.     For i = LBound(CustomColors) To UBound(CustomColors)
  235.         CustomColors(i) = 0
  236.     Next i
  237.     'Set the captions
  238.    Command1.Caption = "ShowOpen"
  239.     Command2.Caption = "ShowSave"
  240.     Command3.Caption = "ShowColor"
  241.     Command4.Caption = "ShowFont"
  242.     Command5.Caption = "ShowPrinter"
  243.     Command6.Caption = "ShowPageSetupDlg"
  244. End Sub
  245. Private Function ShowColor() As Long
  246.     Dim cc As CHOOSECOLOR
  247.     Dim Custcolor(16) As Long
  248.     Dim lReturn As Long
  249.  
  250.     'set the structure size
  251.    cc.lStructSize = Len(cc)
  252.     'Set the owner
  253.    cc.hwndOwner = Me.hWnd
  254.     'set the application's instance
  255.    cc.hInstance = App.hInstance
  256.     'set the custom colors (converted to Unicode)
  257.    cc.lpCustColors = StrConv(CustomColors, vbUnicode)
  258.     'no extra flags
  259.    cc.flags = 0
  260.  
  261.     'Show the 'Select Color'-dialog
  262.    If CHOOSECOLOR(cc) <> 0 Then
  263.         ShowColor = cc.rgbResult
  264.         CustomColors = StrConv(cc.lpCustColors, vbFromUnicode)
  265.     Else
  266.         ShowColor = -1
  267.     End If
  268. End Function
  269. Private Function ShowOpen() As String
  270.     'Set the structure size
  271.    OFName.lStructSize = Len(OFName)
  272.     'Set the owner window
  273.    OFName.hwndOwner = Me.hWnd
  274.     'Set the application's instance
  275.    OFName.hInstance = App.hInstance
  276.     'Set the filet
  277.    OFName.lpstrFilter = "Text Files (*.txt)" + Chr$(0) + "*.txt;*.rtf;*.doc" + Chr$(0) + "All Files (*.*)" + Chr$(0) + "*.*" + Chr$(0)
  278.     'Create a buffer
  279.    OFName.lpstrFile = Space$(254)
  280.     'Set the maximum number of chars
  281.    OFName.nMaxFile = 255
  282.     'Create a buffer
  283.    OFName.lpstrFileTitle = Space$(254)
  284.     'Set the maximum number of chars
  285.    OFName.nMaxFileTitle = 255
  286.     'Set the initial directory
  287.    OFName.lpstrInitialDir = "C:\"
  288.     'Set the dialog title
  289.    OFName.lpstrTitle = "Open File - KPD-Team 1998"
  290.     'no extra flags
  291.    OFName.flags = 0
  292.  
  293.     'Show the 'Open File'-dialog
  294.    If GetOpenFileName(OFName) Then
  295.         ShowOpen = Trim$(OFName.lpstrFile)
  296.     Else
  297.         ShowOpen = ""
  298.     End If
  299. End Function
  300. Private Function ShowFont() As String
  301.     Dim cf As CHOOSEFONT, lfont As LOGFONT, hMem As Long, pMem As Long
  302.     Dim fontname As String, retval As Long
  303.     lfont.lfHeight = 0  ' determine default height
  304.    lfont.lfWidth = 0  ' determine default width
  305.    lfont.lfEscapement = 0  ' angle between baseline and escapement vector
  306.    lfont.lfOrientation = 0  ' angle between baseline and orientation vector
  307.    lfont.lfWeight = FW_NORMAL  ' normal weight i.e. not bold
  308.    lfont.lfCharSet = DEFAULT_CHARSET  ' use default character set
  309.    lfont.lfOutPrecision = OUT_DEFAULT_PRECIS  ' default precision mapping
  310.    lfont.lfClipPrecision = CLIP_DEFAULT_PRECIS  ' default clipping precision
  311.    lfont.lfQuality = DEFAULT_QUALITY  ' default quality setting
  312.    lfont.lfPitchAndFamily = DEFAULT_PITCH Or FF_ROMAN  ' default pitch, proportional with serifs
  313.    lfont.lfFaceName = "Times New Roman" & vbNullChar  ' string must be null-terminated
  314.    ' Create the memory block which will act as the LOGFONT structure buffer.
  315.    hMem = GlobalAlloc(GMEM_MOVEABLE Or GMEM_ZEROINIT, Len(lfont))
  316.     pMem = GlobalLock(hMem)  ' lock and get pointer
  317.    CopyMemory ByVal pMem, lfont, Len(lfont)  ' copy structure's contents into block
  318.    ' Initialize dialog box: Screen and printer fonts, point size between 10 and 72.
  319.    cf.lStructSize = Len(cf)  ' size of structure
  320.    cf.hwndOwner = Form1.hWnd  ' window Form1 is opening this dialog box
  321.    cf.hDC = Printer.hDC  ' device context of default printer (using VB's mechanism)
  322.    cf.lpLogFont = pMem   ' pointer to LOGFONT memory block buffer
  323.    cf.iPointSize = 120  ' 12 point font (in units of 1/10 point)
  324.    cf.flags = CF_BOTH Or CF_EFFECTS Or CF_FORCEFONTEXIST Or CF_INITTOLOGFONTSTRUCT Or CF_LIMITSIZE
  325.     cf.rgbColors = RGB(0, 0, 0)  ' black
  326.    cf.nFontType = REGULAR_FONTTYPE  ' regular font type i.e. not bold or anything
  327.    cf.nSizeMin = 10  ' minimum point size
  328.    cf.nSizeMax = 72  ' maximum point size
  329.    ' Now, call the function.  If successful, copy the LOGFONT structure back into the structure
  330.    ' and then print out the attributes we mentioned earlier that the user selected.
  331.    retval = CHOOSEFONT(cf)  ' open the dialog box
  332.    If retval <> 0 Then  ' success
  333.        CopyMemory lfont, ByVal pMem, Len(lfont)  ' copy memory back
  334.        ' Now make the fixed-length string holding the font name into a "normal" string.
  335.        ShowFont = Left(lfont.lfFaceName, InStr(lfont.lfFaceName, vbNullChar) - 1)
  336.         Debug.Print  ' end the line
  337.    End If
  338.     ' Deallocate the memory block we created earlier.  Note that this must
  339.    ' be done whether the function succeeded or not.
  340.    retval = GlobalUnlock(hMem)  ' destroy pointer, unlock block
  341.    retval = GlobalFree(hMem)  ' free the allocated memory
  342. End Function
  343. Private Function ShowSave() As String
  344.     'Set the structure size
  345.    OFName.lStructSize = Len(OFName)
  346.     'Set the owner window
  347.    OFName.hwndOwner = Me.hWnd
  348.     'Set the application's instance
  349.    OFName.hInstance = App.hInstance
  350.     'Set the filet
  351.    OFName.lpstrFilter = "Text Files (*.txt)" + Chr$(0) + "*.txt" + Chr$(0) + "All Files (*.*)" + Chr$(0) + "*.*" + Chr$(0)
  352.     'Create a buffer
  353.    OFName.lpstrFile = Space$(254)
  354.     'Set the maximum number of chars
  355.    OFName.nMaxFile = 255
  356.     'Create a buffer
  357.    OFName.lpstrFileTitle = Space$(254)
  358.     'Set the maximum number of chars
  359.    OFName.nMaxFileTitle = 255
  360.     'Set the initial directory
  361.    OFName.lpstrInitialDir = "C:\"
  362.     'Set the dialog title
  363.    OFName.lpstrTitle = "Save File - KPD-Team 1998"
  364.     'no extra flags
  365.    OFName.flags = 0
  366.  
  367.     'Show the 'Save File'-dialog
  368.    If GetSaveFileName(OFName) Then
  369.         ShowSave = Trim$(OFName.lpstrFile)
  370.     Else
  371.         ShowSave = ""
  372.     End If
  373. End Function
  374. Private Function ShowPageSetupDlg() As Long
  375.     Dim m_PSD As PAGESETUPDLG
  376.     'Set the structure size
  377.    m_PSD.lStructSize = Len(m_PSD)
  378.     'Set the owner window
  379.    m_PSD.hwndOwner = Me.hWnd
  380.     'Set the application instance
  381.    m_PSD.hInstance = App.hInstance
  382.     'no extra flags
  383.    m_PSD.flags = 0
  384.  
  385.     'Show the pagesetup dialog
  386.    If PAGESETUPDLG(m_PSD) Then
  387.         ShowPageSetupDlg = 0
  388.     Else
  389.         ShowPageSetupDlg = -1
  390.     End If
  391. End Function
  392. Public Sub ShowPrinter(frmOwner As Form, Optional PrintFlags As Long)
  393.     '-> Code by Donald Grover
  394.    Dim PrintDlg As PRINTDLG_TYPE
  395.     Dim DevMode As DEVMODE_TYPE
  396.     Dim DevName As DEVNAMES_TYPE
  397.  
  398.     Dim lpDevMode As Long, lpDevName As Long
  399.     Dim bReturn As Integer
  400.     Dim objPrinter As Printer, NewPrinterName As String
  401.  
  402.     ' Use PrintDialog to get the handle to a memory
  403.    ' block with a DevMode and DevName structures
  404.  
  405.     PrintDlg.lStructSize = Len(PrintDlg)
  406.     PrintDlg.hwndOwner = frmOwner.hWnd
  407.  
  408.     PrintDlg.flags = PrintFlags
  409.     On Error Resume Next
  410.     'Set the current orientation and duplex setting
  411.    DevMode.dmDeviceName = Printer.DeviceName
  412.     DevMode.dmSize = Len(DevMode)
  413.     DevMode.dmFields = DM_ORIENTATION Or DM_DUPLEX
  414.     DevMode.dmPaperWidth = Printer.Width
  415.     DevMode.dmOrientation = Printer.Orientation
  416.     DevMode.dmPaperSize = Printer.PaperSize
  417.     DevMode.dmDuplex = Printer.Duplex
  418.     On Error GoTo 0
  419.  
  420.     'Allocate memory for the initialization hDevMode structure
  421.    'and copy the settings gathered above into this memory
  422.    PrintDlg.hDevMode = GlobalAlloc(GMEM_MOVEABLE Or GMEM_ZEROINIT, Len(DevMode))
  423.     lpDevMode = GlobalLock(PrintDlg.hDevMode)
  424.     If lpDevMode > 0 Then
  425.         CopyMemory ByVal lpDevMode, DevMode, Len(DevMode)
  426.         bReturn = GlobalUnlock(PrintDlg.hDevMode)
  427.     End If
  428.  
  429.     'Set the current driver, device, and port name strings
  430.    With DevName
  431.         .wDriverOffset = 8
  432.         .wDeviceOffset = .wDriverOffset + 1 + Len(Printer.DriverName)
  433.         .wOutputOffset = .wDeviceOffset + 1 + Len(Printer.Port)
  434.         .wDefault = 0
  435.     End With
  436.  
  437.     With Printer
  438.         DevName.extra = .DriverName & Chr(0) & .DeviceName & Chr(0) & .Port & Chr(0)
  439.     End With
  440.  
  441.     'Allocate memory for the initial hDevName structure
  442.    'and copy the settings gathered above into this memory
  443.    PrintDlg.hDevNames = GlobalAlloc(GMEM_MOVEABLE Or GMEM_ZEROINIT, Len(DevName))
  444.     lpDevName = GlobalLock(PrintDlg.hDevNames)
  445.     If lpDevName > 0 Then
  446.         CopyMemory ByVal lpDevName, DevName, Len(DevName)
  447.         bReturn = GlobalUnlock(lpDevName)
  448.     End If
  449.  
  450.     'Call the print dialog up and let the user make changes
  451.    If PrintDialog(PrintDlg) <> 0 Then
  452.  
  453.         'First get the DevName structure.
  454.        lpDevName = GlobalLock(PrintDlg.hDevNames)
  455.         CopyMemory DevName, ByVal lpDevName, 45
  456.         bReturn = GlobalUnlock(lpDevName)
  457.         GlobalFree PrintDlg.hDevNames
  458.  
  459.         'Next get the DevMode structure and set the printer
  460.        'properties appropriately
  461.        lpDevMode = GlobalLock(PrintDlg.hDevMode)
  462.         CopyMemory DevMode, ByVal lpDevMode, Len(DevMode)
  463.         bReturn = GlobalUnlock(PrintDlg.hDevMode)
  464.         GlobalFree PrintDlg.hDevMode
  465.         NewPrinterName = UCase$(Left(DevMode.dmDeviceName, InStr(DevMode.dmDeviceName, Chr$(0)) - 1))
  466.         If Printer.DeviceName <> NewPrinterName Then
  467.             For Each objPrinter In Printers
  468.                 If UCase$(objPrinter.DeviceName) = NewPrinterName Then
  469.                     Set Printer = objPrinter
  470.                     'set printer toolbar name at this point
  471.                End If
  472.             Next
  473.         End If
  474.  
  475.         On Error Resume Next
  476.         'Set printer object properties according to selections made
  477.        'by user
  478.        Printer.Copies = DevMode.dmCopies
  479.         Printer.Duplex = DevMode.dmDuplex
  480.         Printer.Orientation = DevMode.dmOrientation
  481.         Printer.PaperSize = DevMode.dmPaperSize
  482.         Printer.PrintQuality = DevMode.dmPrintQuality
  483.         Printer.ColorMode = DevMode.dmColor
  484.         Printer.PaperBin = DevMode.dmDefaultSource
  485.         On Error GoTo 0
  486.     End If
  487. End Sub

ИИ поможет Вам:


  • решить любую задачу по программированию
  • объяснить код
  • расставить комментарии в коде
  • и т.д
Попробуйте бесплатно

Оцени полезность:

15   голосов , оценка 4 из 5

Нужна аналогичная работа?

Оформи быстрый заказ и узнай стоимость

Бесплатно
Оформите заказ и авторы начнут откликаться уже через 10 минут
Похожие ответы