score:1
Add Worksheets With Sequential Names
Compact
Sub GetAvailableSheetName()
On Error GoTo ClearError
Dim ws As Worksheet
Dim n As Long
Dim wsName As String
Do
n = n + 1
wsName = "Combined-" & n
Set ws = ThisWorkbook.Worksheets(wsName)
Loop
WorksheetNaming:
On Error Resume Next
ThisWorkbook.Worksheets .Add(After:=ThisWorkbook _
.Sheets(ThisWorkbook.Sheets.Count)).Name = wsName
On Error GoTo 0
Exit Sub
ClearError:
Resume WorksheetNaming
End Sub
Argumented
Sub AddSequentialSheetNameTEST()
AddSequentialSheetName ThisWorkbook, "Combined-"
MsgBox "Added the worksheet '" & ActiveSheet.Name, vbInformation
End Sub
Sub AddSequentialSheetName( _
ByVal wb As Workbook, _
Optional ByVal Prefix As String = "Sheet", _
Optional ByVal Suffix As String = "")
On Error GoTo ClearError
Dim ws As Worksheet
Dim n As Long
Dim wsName As String
Do
n = n + 1
wsName = Prefix & n & Suffix
Set ws = wb.Worksheets(wsName)
Loop
WorksheetNaming:
On Error Resume Next
wb.Worksheets.Add(After:=wb.Sheets(wb.Sheets.Count)).Name = wsName
On Error GoTo 0
Exit Sub
ClearError:
Resume WorksheetNaming
End Sub
Source: stackoverflow.com
Related Query
- Adding Sheets With Sequential Names Stops Incrementing After the 10th Sheet
- Adding Sheets With Sequential Names
- Macro to copy sheets into workbook stops after one sheet
- List sheet names in excel while skipping the unwanted sheets
- Adding a pivot table to a new sheet with data on the same sheet
- How to Name your Tables after the Sheet Names
- Adding XLS file in a sheet next to the existing sheets in excel
- Excel VBA macro for consolidating data from multiple sheets based on sheet names with specific text
- Create sheets based on a list and populate with data where a column matches the sheet name
- Adding new sheets with date names stored in dynamic array
- After recording a copy and paste in an Excel macro, when the macro runs, it stops at the paste with an error
- Copy multiple sheets with similar sheet names into a new workbook
- Prevent inclusion of sheet names when adding a name for range of cells with vba
- Merge specific sheets by adding the sheet name as the first column
- Excel create an Index on the first sheet with links to subsequent sheets
- VBA: Function that will find the sheet name with the highest number of all the sheet names
- A List From Same Cells Across Multiple Sheets In Excel with sheet names
- How to set the Sheet names with static date?
- Import data from Source sheet to Destination sheet dynamically only by selecting the sheets in form of inputboxes not Mentioning their names in VBA
- Copy and paste values with the same sheet names
- VBA Copy specific rows from multiple sheets with their names containing "Hawk" and paste into new sheet
- Replacing formulas in multiple sheets with the different values based on a different sheet VBA
- Consolidating Workbooks with two sheets into One workbook with the same sheet. Second sheet will not copy correctly
- Adding a column to multiple excel spreadsheets, with column entries being the name of the excel filename. Then combining sheets into one spreadsheet
- List name for sheets being used in the formula of a specific sheet with the same workbook
- How to search for all sheets title starting with Sheet and sum the same cell?
- Trying to delete the first sheet in each excel file and then copying from each tab to the master workbook with the same tab names
- Updating the sheets with other sheet
- Summing columns with same names in the row and show it in new sheet run with date
- Excel-VBA : Can no longer select rows in a sheet after adding a chart in the same sheet
More Query from same tag
- Specifying a [Type] when adding a worksheet
- Check if filter element is expanded or collapsed
- IF Statement with Loop in VBA
- How to make vba function which contain a double select
- SQL SELECT / CASE query with multiple columns returns System Error: &H80040E14 (-2147217900)
- Excel macro - how to break wrapped text into rows for merged columns?
- VBA Application.Printers does not work in Excel 2013
- How can I select a specific PowerPoint slide and duplicate it?
- Characters.FontStyle not working on cells with custom number format
- Set the cell format to text in excel before importing
- If control is not visible, set value to null (access VBA)
- VBA Asynchronous data call with HTTP
- How do I run a libreoffice macro from the command line without GUI?
- VBA code to serial number auto generation based on last cell value
- Can I display something while a macro is running?
- VBA - Counting the number of filled cells in a row
- VBA for Connecting already opned IE window
- How to select elements on a given point in AutoCAD?
- Need to delete cells in a column, if the values in an array and the value in another column exist
- Why can't I specify criteria for a conditional query as a form component?
- Excel VBA Colon
- How to use VBA to input text into Google and click search
- How to choose random cells in VBA?
- Change caption of button to field in a table using Access
- How to add certain records to certain worksheets using VBA
- Algorithm for finding end of a list (SAP GUI)
- Word VBA to add line the length of selection
- Want to copy cell value not formula in n times copy function
- Prevent Cell formula from changing
- Hiding Worksheet while copying and pasting