Warning: file_get_contents(/data/phpspider/zhask/data//catemap/0/vba/16.json): failed to open stream: No such file or directory in /data/phpspider/zhask/libs/function.php on line 167

Warning: Invalid argument supplied for foreach() in /data/phpspider/zhask/libs/tag.function.php on line 1116

Notice: Undefined index: in /data/phpspider/zhask/libs/function.php on line 180

Warning: array_chunk() expects parameter 1 to be array, null given in /data/phpspider/zhask/libs/function.php on line 181
Vba 将excel文件选项卡拆分为单个文件_Vba_Excel - Fatal编程技术网

Vba 将excel文件选项卡拆分为单个文件

Vba 将excel文件选项卡拆分为单个文件,vba,excel,Vba,Excel,我想拆分我的工作簿,并将每张工作表另存为自己的文件。我不介意这些工作表是否保存到原始工作簿所在的文件夹中。我还想保留原始工作簿的完整性。这是我一直在使用的代码 Sub Splitbook() Dim xPath As String xPath = Application.ActiveWorkbook.Path Application.ScreenUpdating = False Application.DisplayAlerts = False For Each xWs In ThisWorkb

我想拆分我的工作簿,并将每张工作表另存为自己的文件。我不介意这些工作表是否保存到原始工作簿所在的文件夹中。我还想保留原始工作簿的完整性。这是我一直在使用的代码

Sub Splitbook()
Dim xPath As String
xPath = Application.ActiveWorkbook.Path
Application.ScreenUpdating = False
Application.DisplayAlerts = False
For Each xWs In ThisWorkbook.Sheets
    xWs.Copy
    Application.ActiveWorkbook.SaveAs Filename:=xPath & "\" & xWs.Name & ".xls"
    Application.ActiveWorkbook.Close False
Next
Application.DisplayAlerts = True
Application.ScreenUpdating = True
End Sub

这一直很好用,但当我尝试在我的一些较大的工作簿上使用它时,它就坏了。不知道为什么。谁能帮我改进一下,这样我就不会遇到问题了。谢谢

请这样试试

Sub Copy_To_Workbooks()
'Note: This macro use the function LastRow
    Dim My_Range As Range
    Dim FieldNum As Long
    Dim FileExtStr As String
    Dim FileFormatNum As Long
    Dim CalcMode As Long
    Dim ViewMode As Long
    Dim ws2 As Worksheet
    Dim MyPath As String
    Dim foldername As String
    Dim Lrow As Long
    Dim cell As Range
    Dim CCount As Long
    Dim WSNew As Worksheet
    Dim ErrNum As Long

    'Set filter range on ActiveSheet: A1 is the top left cell of your filter range
    'and the header of the first column, D is the last column in the filter range.
    'You can also add the sheet name to the code like this :
    'Worksheets("Sheet1").Range("A1:D" & LastRow(Worksheets("Sheet1")))
    'No need that the sheet is active then when you run the macro when you use this.
    Set My_Range = Range("A1:D" & LastRow(ActiveSheet))
    My_Range.Parent.Select

    If ActiveWorkbook.ProtectStructure = True Or _
       My_Range.Parent.ProtectContents = True Then
        MsgBox "Sorry, not working when the workbook or worksheet is protected", _
               vbOKOnly, "Copy to new workbook"
        Exit Sub
    End If

    'This example filters on the first column in the range(change the field if needed)
    'In this case the range starts in A so Field:=1 is column A, 2 = column B, ......
    FieldNum = 1

    'Turn off AutoFilter
    My_Range.Parent.AutoFilterMode = False

    'Set the file extension/format
    If Val(Application.Version) < 12 Then
        'You use Excel 97-2003
        FileExtStr = ".xls": FileFormatNum = -4143
    Else
        'You use Excel 2007-2013
        If ActiveWorkbook.FileFormat = 56 Then
            FileExtStr = ".xls": FileFormatNum = 56
        Else
            FileExtStr = ".xlsx": FileFormatNum = 51
        End If
    End If

    'Change ScreenUpdating, Calculation, EnableEvents, ....
    With Application
        CalcMode = .Calculation
        .Calculation = xlCalculationManual
        .ScreenUpdating = False
        .EnableEvents = False
    End With
    ViewMode = ActiveWindow.View
    ActiveWindow.View = xlNormalView
    ActiveSheet.DisplayPageBreaks = False

    'Delete the sheet RDBLogSheet if it exists
    On Error Resume Next
    Application.DisplayAlerts = False
    Sheets("RDBLogSheet").Delete
    Application.DisplayAlerts = True
    On Error GoTo 0

    ' Add worksheet to copy/Paste the unique list
    Set ws2 = Worksheets.Add(After:=Sheets(Sheets.Count))
    ws2.Name = "RDBLogSheet"

    'Fill in the path\folder where you want the new folder with the files
    'you can use also this "C:\Users\Ron\test"
    MyPath = Application.DefaultFilePath

    'Add a slash at the end if the user forget it
    If Right(MyPath, 1) <> "\" Then
        MyPath = MyPath & "\"
    End If

    'Create folder for the new files
    foldername = MyPath & Format(Now, "yyyy-mm-dd hh-mm-ss") & "\"
    MkDir foldername

    With ws2
        'first we copy the Unique data from the filter field to ws2
        My_Range.Columns(FieldNum).AdvancedFilter _
                Action:=xlFilterCopy, _
                CopyToRange:=.Range("A3"), Unique:=True

        'loop through the unique list in ws2 and filter/copy to a new sheet
        Lrow = .Cells(Rows.Count, "A").End(xlUp).Row
        For Each cell In .Range("A4:A" & Lrow)

            'Filter the range
            My_Range.AutoFilter Field:=FieldNum, Criteria1:="=" & _
             Replace(Replace(Replace(cell.Value, "~", "~~"), "*", "~*"), "?", "~?")

            'Check if there are no more then 8192 areas(limit of areas)
            CCount = 0
            On Error Resume Next
            CCount = My_Range.Columns(1).SpecialCells(xlCellTypeVisible) _
                     .Areas(1).Cells.Count
            On Error GoTo 0
            If CCount = 0 Then
                MsgBox "There are more than 8192 areas for the value : " & cell.Value _
                     & vbNewLine & "It is not possible to copy the visible data." _
                     & vbNewLine & "Tip: Sort your data before you use this macro.", _
                       vbOKOnly, "Split in worksheets"
            Else
                'Add new workbook with one sheet
                Set WSNew = Workbooks.Add(xlWBATWorksheet).Worksheets(1)

                'Copy/paste the visible data to the new workbook
                My_Range.SpecialCells(xlCellTypeVisible).Copy
                With WSNew.Range("A1")
                    ' Paste:=8 will copy the columnwidth in Excel 2000 and higher
                    ' Remove this line if you use Excel 97
                    .PasteSpecial Paste:=8
                    .PasteSpecial xlPasteValues
                    .PasteSpecial xlPasteFormats
                    Application.CutCopyMode = False
                    .Select
                End With

                'Save the file in the new folder and close it
                On Error Resume Next
                WSNew.Parent.SaveAs foldername & _
                                    cell.Value & FileExtStr, FileFormatNum
                If Err.Number > 0 Then
                    Err.Clear
                    ErrNum = ErrNum + 1

                    WSNew.Parent.SaveAs foldername & _
                     "Error_" & Format(ErrNum, "0000") & FileExtStr, FileFormatNum

                    .Cells(cell.Row, "B").Formula = "=Hyperlink(""" & foldername & _
                      "Error_" & Format(ErrNum, "0000") & FileExtStr & """)"

                    .Cells(cell.Row, "A").Interior.Color = vbRed
                Else
                    .Cells(cell.Row, "B").Formula = _
                    "=Hyperlink(""" & foldername & cell.Value & FileExtStr & """)"
                End If

                WSNew.Parent.Close False
                On Error GoTo 0
            End If

            'Show all the data in the range
            My_Range.AutoFilter Field:=FieldNum

        Next cell
        .Cells(1, "A").Value = "Red cell: can't use the Unique name as file name"
        .Cells(1, "B").Value = "Created Files (Click on the link to open a file)"
        .Cells(3, "A").Value = "Unique Values"
        .Cells(3, "B").Value = "Full Path and File name"
        .Cells(3, "A").Font.Bold = True
        .Cells(3, "B").Font.Bold = True
        .Columns("A:B").AutoFit

    End With

    'Turn off AutoFilter
    My_Range.Parent.AutoFilterMode = False

    If ErrNum > 0 Then
        MsgBox "Rename every WorkSheet name that start with ""Error_"" manually" _
             & vbNewLine & "There are characters in the name that are not allowed" _
             & vbNewLine & "in a sheet name or the worksheet already exist."
    End If

    'Restore ScreenUpdating, Calculation, EnableEvents, ....
    My_Range.Parent.Select
    ActiveWindow.View = ViewMode
    ws2.Select
    With Application
        .ScreenUpdating = True
        .EnableEvents = True
        .Calculation = CalcMode
    End With

End Sub


Function LastRow(sh As Worksheet)
    On Error Resume Next
    LastRow = sh.Cells.Find(What:="*", _
                            After:=sh.Range("A1"), _
                            Lookat:=xlPart, _
                            LookIn:=xlValues, _
                            SearchOrder:=xlByRows, _
                            SearchDirection:=xlPrevious, _
                            MatchCase:=False).Row
    On Error GoTo 0
End Function
Sub-Copy_To_工作簿()
'注意:此宏使用函数LastRow
将我的_范围变暗为范围
Dim FieldNum尽可能长
Dim FileExtStr作为字符串
Dim FileFormatNum尽可能长
暗淡的CalcMode与长
将视图模式变暗为长
将ws2设置为工作表
将MyPath设置为字符串
Dim foldername作为字符串
暗淡的光线和长的一样
暗淡单元格作为范围
长帐
新建为工作表
Dim ErrNum尽可能长
'在ActiveSheet上设置筛选范围:A1是筛选范围的左上角单元格
'并且第一列的标题D是筛选范围中的最后一列。
'您还可以将图纸名称添加到代码中,如下所示:
'工作表(“表1”)。范围(“A1:D”和最后一行(工作表(“表1”))
'使用此选项时,在运行宏时,无需工作表处于活动状态。
设置My_Range=Range(“A1:D”和LastRow(ActiveSheet))
My_Range.Parent.Select
如果ActiveWorkbook.ProtectStructure=True或_
My_Range.Parent.ProtectContents=则为True
MsgBox“抱歉,工作簿或工作表受保护时不工作”_
vbOKOnly,“复制到新工作簿”
出口接头
如果结束
'此示例筛选范围中的第一列(如果需要,请更改字段)
'在这种情况下,范围从so字段开始:=1为A列,2为B列。。。。。。
FieldNum=1
'关闭自动过滤器
My_Range.Parent.AutoFilterMode=False
'设置文件扩展名/格式
如果Val(Application.Version)<12,则
“您使用的是Excel 97-2003
FileExtStr=“.xls”:FileFormatNum=-4143
其他的
“您使用的是Excel 2007-2013
如果ActiveWorkbook.FileFormat=56,则
FileExtStr=“.xls”:FileFormatNum=56
其他的
FileExtStr=“.xlsx”:FileFormatNum=51
如果结束
如果结束
'更改屏幕更新、计算、启用事件。。。。
应用
CalcMode=.Calculation
.Calculation=xlCalculationManual
.ScreenUpdate=False
.EnableEvents=False
以
ViewMode=ActiveWindow.View
ActiveWindow.View=xlNormalView
ActiveSheet.DisplayPageBreaks=False
'删除工作表RDBLogSheet(如果存在)
出错时继续下一步
Application.DisplayAlerts=False
工作表(“RDBLogSheet”)。删除
Application.DisplayAlerts=True
错误转到0
'添加工作表以复制/粘贴唯一列表
设置ws2=工作表.Add(之后:=工作表(Sheets.Count))
ws2.Name=“RDBLogSheet”
'用文件填充新文件夹所需的路径\文件夹
'您也可以使用此“C:\Users\Ron\test”
MyPath=Application.DefaultFilePath
'如果用户忘记了,请在末尾添加斜杠
如果正确(MyPath,1)“\”则
MyPath=MyPath&“\”
如果结束
'为新文件创建文件夹
foldername=MyPath&Format(现在是“yyyy-mm-dd-hh-mm-ss”)&“\”
MkDir foldername
与ws2
'首先,我们将唯一数据从筛选器字段复制到ws2
My_Range.Columns(FieldNum).AdvancedFilter_
操作:=xlFilterCopy_
CopyToRange:=.Range(“A3”),唯一:=真
'循环浏览ws2中的唯一列表并筛选/复制到新工作表
Lrow=.Cells(Rows.Count,“A”).End(xlUp).Row
对于.Range中的每个单元格(“A4:A”和Lrow)
'过滤范围
My_Range.AutoFilter字段:=FieldNum,准则1:=“=”&_
替换(替换(替换(cell.Value、“~”、“~~”、“*”、“~*”、“?”、“~?”)
'检查是否没有超过8192个区域(区域限制)
帐户=0
出错时继续下一步
CCount=My_Range.Columns(1).SpecialCells(xlCellTypeVisible)_
.面积(1).单元格.计数
错误转到0
如果CCount=0,则
MsgBox“值有8192个以上的区域:”&cell.value_
&vbNewLine&“无法复制可见数据。”_
&vbNewLine&“提示:在使用此宏之前对数据进行排序。”_
VBookOnly,“在工作表中拆分”
其他的
'添加带有一张工作表的新工作簿
设置WSNew=Workbooks.Add(xlWBATWorksheet)。工作表(1)
'将可见数据复制/粘贴到新工作簿
My_Range.SpecialCells(xlCellTypeVisible)。复制
使用WSNew.Range(“A1”)
'粘贴:=8将在Excel 2000及更高版本中复制列宽
'如果使用Excel 97,请删除此行
.Paste特殊粘贴:=8
.Paste特殊XLPaste值
.Paste特殊XLPaste格式
Application.CutCopyMode=False
.选择
以
'将文件保存在新文件夹中并关闭它
出错时继续下一步
WSNew.Parent.SaveAs foldername&_
cell.Value&FileExtStr,FileFormatNum
如果错误编号>0,则
呃,明白了
ErrNum=ErrNum+1
WSNew.Parent.SaveAs foldername&_
“错误”&格式(ErrNum,“0000”)&FileExtStr,FileFormatNum
.Cells(cell.Row,“B”).Formula=“=Hyperlink”(“”&foldername&_
“错误\”&格式(ErrNum,“0000”)&FileExtStr&”“””
.Cells(cell.Row,“A”).Interior.Co