Top 100 Useful Excel MACRO CODES Examples (VBA Library) + PDF
Top 100 Useful Excel MACRO CODES Examples (VBA Library) + PDF
You can automate small as well as heavy tasks with VBA codes.
...you can break all the limitations of Excel which you think Excel has.
And today, I have listed some of the useful codes examples to help you become more
productive in your day to day work.
You can use these codes even if you haven't used VBA before that.
The idea behind using a macro code is to automate an action which you perform manually
in Excel, otherwise.
For example, you can use a code to print only a particular range of cells just with a single
click instead of selecting the range -> File Tab -> Print -> Print Select -> OK Button.
How to use a Macro Code in Excel
Before you use these codes, make sure you have your developer tab on your Excel ribbon to
access VB editor.
...you can use below steps to paste a VBA code into VB editor.
On the left side in "Project Window", right click on the name of your workbook and insert
a new module.
Just paste your code into the module and close it.
Now, go to your developer tab and click on the macro button.
It will show you a window with a list of the macros you have in your file from where you
can run a macro from that list.
...a list of top 100 macro codes for VBA beginners
I’ve added all the codes into specific categories so you can find your favorite codes quickly.
Just read the title and click on it to get the code.
Basic
Formatting
Printing
Worksheet
Workbook
Pivot Table
Charts
Advanced
Formulas
Basic Codes
These VBA codes will help you to perform some basic tasks in a flash which you frequently
do in your spreadsheets.
This macro code will help you to automatically add serial numbers in your Excel sheet
which can be helpful for you if you work with large data.
Sub AddSerialNumbers()
Dim i As Integer
For i = 1 To i
ActiveCell.Value = i
ActiveCell.Offset(1, 0).Activate
Next i
Last:Exit Sub
End Sub
To use this code you need to select the cell from where you want to start the serial numbers
and when you run this it shows you a message box where you need to enter the highest
number for the serial numbers and click OK.
And once you click OK, it simply runs a loop and add a list of serial numbers to the cells
downward.
This code helps you to enter multiple columns in a single click. When you run this code it
asks you the number columns you want to add and when you click OK, it adds entered
number of columns after the selected cell.
Sub InsertMultipleColumns()
Dim i As Integer
Dim j As Integer
ActiveCell.EntireColumn.Select
For j = 1 To i
Next j
End Sub
If you want to add columns before the selected cell, replace the xlToRight to xlToLeft in the
code.
With this code, you can enter multiple rows in the worksheet. When you run this code, you
can enter the number of rows to insert and make sure to select the cell from where you want
to insert the new rows.
Sub InsertMultipleRows()
Dim i As Integer
Dim j As Integer
ActiveCell.EntireRow.Select
For j = 1 To i
Selection.Insert Shift:=xlToDown, CopyOrigin:=xlFormatFromRightorAbove
Next j
End Sub
If you want to add rows before the selected cell, replace the xlToDown to xlToUp in the code.
This code quickly auto fits all the columns in your worksheet. So when you run this code, it
will select all the cells in your worksheet and instantly auto-fit all the columns.
Sub AutoFitColumns()
Cells.Select
Cells.EntireColumn.AutoFit
End Sub
This code quickly auto fits all the columns in your worksheet. So when you run this code, it
will select all the cells in your worksheet and instantly auto-fit all the columns.
You can use this code to auto-fit all the rows in a worksheet. When you run this code it will
select all the cells in your worksheet and instantly auto-fit all the row.
Sub AutoFitRows()
Cells.Select
Cells.EntireRow.AutoFit
End Sub
This code will help you to remove text wrap from the entire worksheet with a single click. It
will first select all the columns and then remove text wrap and auto fit all the rows and
columns.
Sub AutoFitRows()
Cells.Select
Cells.EntireRow.AutoFit
End Sub
There’s also a shortcut that you can use (Alt + H +W) for but if you add this code to QAT it’s
way more than keyboard shortcut.
7. Unmerge Cells
This code simply uses the unmerge options which you have on the HOME tab. The benefit of
using this code is you can add it to the QAT and unmerge all the cell in the selection.
Sub UnmergeCells()
Selection.UnMerge
End Sub
And if you want to un-merge a specific range you can define that range in the code by
replacing the word selection.
8. Open Calculator
In Windows, there is a specific calculator and by using this macro code you can open that
calculator directly from Excel.
Sub OpenCalculator()
Application.ActivateMicrosoftApp Index:=0
End Sub
As I mentioned that it’s for windows and if you run this code in the MAC version of VBA
you’ll get an error.
This macro adds a date to the header when you run it. It simply uses the tag "&D" for adding
the date. You can also change it to the footer or change the side by replacing the "" with the
date tag.
Sub DateInHeader()
With ActiveSheet.PageSetup
.LeftHeader = ""
.CenterHeader = "&D"
.RightHeader = ""
.LeftFooter = ""
.CenterFooter = ""
.RightFooter = ""
End With
End Sub
And if you want to add a specific date instead of the current date you can replace the "&D"
tag with that date from the code.
When you run this code, it shows an input box that asks you to enter the text which you
want to add as a header, and once you enter it click OK.
Sub CustomHeader()
With ActiveSheet.PageSetup
.LeftHeader = ""
.CenterHeader = myText
.RightHeader = ""
.LeftFooter = ""
.CenterFooter = ""
.RightFooter = ""
End With
End Sub
If you see this closely you have six different lines of code to choose the place for the header
or footer. Let’s say if you want to add left-footer instead of center header simply replace the
“myText” to that line of the code by replacing the "" from there.
Formatting Codes
These VBA codes will help you to format cells and ranges using some specific criteria and
conditions.
This macro will check each cell of your selection and highlight the duplicate values.
Sub HighlightDuplicateValues()
myCell.Interior.ColorIndex = 36
End If
Next myCell
End Sub
I really love to use this macro code whenever I have to analyze a data table.
Remember that, by applying this macro you wi ll not able to edit the cell by double click.
Cancel As Boolean)
Dim strRange As String
Target.Cells.EntireRow.Address
Range(strRange).Select
End Sub
Just select a range and run this macro and it will highlight top 10 values with the green color.
Sub TopTen()
Selection.FormatConditions.AddTop10
Selection.FormatConditions(Selection.FormatConditions.Count).S
tFirstPriority
With Selection.FormatConditions(1)
.TopBottom = xlTop10Top
.Rank = 10
.Percent = False
End With
With Selection.FormatConditions(1).Font
.Color = -16752384
.TintAndShade = 0
End With
With Selection.FormatConditions(1).Interior
.PatternColorIndex = xlAutomatic
.Color = 13561798
.TintAndShade = 0
End With
Selection.FormatConditions(1).StopIfTrue = False
End Sub
Sub HighlightRanges()
HighlightRange.Interior.ColorIndex = 36
Next RangeName
End Sub
Once you run this code it will ask you for the value from which you want to highlight all
greater values.
Sub HighlightGreaterThanValues()
Dim i As Integer
Selection.FormatConditions.Delete
Selection.FormatConditions.Add Type:=xlCellValue,
Operator:=xlGreater, Formula1:=i
Selection.FormatConditions(Selection.FormatConditions.Count).S
tFirstPriority
With Selection.FormatConditions(1)
.Font.Color = RGB(0, 0, 0)
End With
End Sub
Sub HighlightLowerThanValues()
Dim i As Integer
Selection.FormatConditions.Delete
Selection.FormatConditions.Add Type:=xlCellValue,
Operator:=xlLower, Formula1:=i
Selection.FormatConditions(Selection.FormatConditions.Count).S
tFirstPriority
With Selection.FormatConditions(1)
.Font.Color = RGB(0, 0, 0)
End With
End Sub
Select a range of cells and run this code. It will check each cell from the range and highlight
all cells the where you have a negative number.
Sub highlightNegativeNumbers()
If WorksheetFunction.IsNumber(Rng) Then
Rng.Font.Color= -16776961
End If
End If
Next
End Sub
Sub highlightValue()
Dim I As Long
Dim J As Long
If ActiveWindow.RangeSelection.Count> 1 Then
myTxt= ActiveWindow.RangeSelection.AddressLocal
Else
myTxt= ActiveSheet.UsedRange.AddressLocal
End If
Exit Sub
End If
GoTo LInput
End If
For I = 0 To myRg.Rows.Count-1
With myRg.Range("A1").Offset(I, 0)
.Font.ColorIndex= 1
For J = 1 To Len(.Text)
Mid(.Text, J, Len(myStr)) = myStrThen
.Characters(J, Len(myStr)).Font.ColorIndex= 3
Next
End With
Next I
End Sub
Sub highlightCommentCells()
Selection.SpecialCells(xlCellTypeComments).Select
Selection.Style= "Note"
End Sub
By highlighting alternate rows you can make your data easily readable. And for this, you can
use below VBA code. It will simply highlight every alternate row in selected range.
Sub highlightAlternateRows()
If rng.RowMod 2 = 1 Then
rng.Value= rng^ (1 / 3)
Else
End If
Next rng
End Sub
Sub HighlightMisspelledCells()
Next rng
End Sub
To highlight and count all the cells in which you have an error, this code will help you. Just
run this code and it will return a message with the number error cells and highlight all the
cells.
Sub highlightErrors()
Dim i As Integer
If WorksheetFunction.IsError(rng) Then
i = i + 1 rng.Style = "bad"
End If
Next rng
MsgBox "There are total " & i & " error(s) in this worksheet."
End Sub
This code will help you to count the cells which have a specific value which you will mention
and after that highlight all those cells.
Sub highlightSpecificValues()
Dim c As Variant
If rng = c Then
rng.Style = "Note"
i = i + 1
End If
Next rng
MsgBox "There are total " & i &" "& c & " in this worksheet."
End Sub
Sometimes there are some cells which are blank but they have a single space and due to this,
it’s really hard to identify them. This code will check all the cell in the worksheet and
highlight all the cells which have a single space.
Sub blankWithSpace()
rng.Style = "Note"
End If
Next rng
End Sub
It will check all the selected cells and highlight the cell with the maximum value.
Sub highlightMaxValue()
End If
Next rng
End Sub
It will check all the selected cells and highlight the cell with the Minimum value.
Sub highlightMinValue()
rng.Style = "Good"
End If
Next rng
End Sub
This codes will highlight all the cells from the selection which has a unique value.
Sub highlightUniqueValues()
rng.FormatConditions.Delete
Dim uv As UniqueValues
Set uv = rng.FormatConditions.AddUniqueValues
uv.DupeUnique = xlUnique
uv.Interior.Color = vbGreen
End Sub
Using this code you can highlight the difference between two columns (corresponding cells).
Sub columnDifference()
Range("H7:H8,I7:I8").Select
Selection.ColumnDifferences(ActiveCell).Select
Selection.Style= "Bad"
End Sub
And by using this code you can highlight difference between two row (corresponding cells).
Sub rowDifference()
Range("H7:H8,I7:I8").Select
Selection.RowDifferences(ActiveCell).Select
Selection.Style= "Bad"
End Sub
Printing Codes
These macro codes will help you to automate some printing tasks which can further save
you a ton of time.
Use this macro to activate settings to print cell comments in the end of the page. Let’s say you
have 10 pages to print, after using this code you will get all the comments on 11th last page.
Sub printComments()
With ActiveSheet.PageSetup
.printComments= xlPrintSheetEnd
End With
End Sub
Use this VBA code to take a print with a narrow margin. When you run this macro it will
automatically change margins to narrow.
Sub printNarrowMargin()
With ActiveSheet.PageSetup
.LeftMargin= Application
.InchesToPoints(0.25)
.RightMargin= Application.InchesToPoints(0.25)
.TopMargin= Application.InchesToPoints(0.75)
.BottomMargin= Application.InchesToPoints(0.75)
.HeaderMargin= Application.InchesToPoints(0.3)
.FooterMargin= Application.InchesToPoints(0.3)
End With
ActiveWindow.SelectedSheets.PrintOutCopies:=1, Collate:=True,
IgnorePrintAreas:=False
End Sub
This code will help you print selected range. You don't need to go to printing options and set
printing range. Just select a range and run this code.
Sub printSelection()
Selection.PrintOutCopies:=1, Collate:=True
End Sub
Instead of using the setting from print options you can use this code to print custom page
range.
Let’s say you want to print pages from 5 to 10. You just need to run this VBA code and enter
start page and end page.
Sub printCustomSelection()
Exit Sub
End If
Exit Sub
End If
Collate:=True
End Sub
Worksheet Codes
These macro codes will help you to control and manage worksheets in an easy way and save
your a lot of time.
Now, let's say if you want to hide all the worksheets in your workbook other than the active
worksheet. This macro code will do this for you.
Sub HideWorksheet()
Dim ws As Worksheet
ws.Visible = xlSheetHidden
End If
Next ws
End Sub
Sub UnhideAllWorksheet()
Dim ws As Worksheet
ws.Visible = xlSheetVisible
Next ws
End Sub
If you want to delete all the worksheets other than the active sheet, this macro is useful for
you.
When you run this macro it will compare the name of the active worksheet with other
worksheets and then delete them.
Sub DeleteWorksheets()
Dim ws As Worksheet
Application.DisplayAlerts = False
ws.Delete
Application.DisplayAlerts = True
End If
Next ws
End Sub
If you want to protect your all worksheets in one go here is a code for you.
When you run this macro, you will get an input box to enter a password. Once you enter
your password, click OK. And make sure to take care about CAPS.
Sub ProtectAllWorskeets()
Dim ws As Worksheet
Dim ps As String
ws.Protect Password:=ps
Next ws
End Sub
Make all chart same in size. This macro code will help you to make all the charts of the same
size. You can change the height and width of charts by changing it in macro code.
Sub Resize_Charts()
Dim i As Integer
For i = 1 To ActiveSheet.ChartObjects.Count
With ActiveSheet.ChartObjects(i)
.Width = 300
.Height = 200
End With
Next i
End Sub
You can use this code if you want to add multiple worksheets in your workbook in a single
shot.
When you run this macro code you will get an input box to enter the total number of sheets
you want to enter.
Sub InsertMultipleSheets()
Dim i As Integer
End Sub
If you want to protect your worksheet you can use this macro code.
Sub ProtectWS()
End Sub
If you want to unprotect your worksheet you can use this macro code.
All you have to do just mention your password which you have used while protecting your
worksheet.
Sub UnprotectWS()
ActiveSheet.Unprotect "mypassword"
End Sub
This code will help you to sort worksheets in your workbook according to their name.
Sub SortWorksheets()
Dim i As Integer
Dim j As Integer
For i = 1 To Sheets.Count
For j = 1 To Sheets.Count - 1
Sheets(j).Move After:=Sheets(j + 1)
End If
+ 1)
End If
End If
Next j
Next i
End Sub
To protect cell with formula with a single click you can use this code.
Sub lockCellsWithFormulas()
With ActiveSheet
.Unprotect
.Cells.Locked = False
.Cells.SpecialCells(xlCellTypeFormulas).Locked = True
.Protect AllowDeletingRows:=True
End With
End Sub
Run this code and it will check all the worksheets in the active workbook and delete if a
worksheet is blank.
Sub deleteBlankWorksheets()
Dim Ws As Worksheet
Application.DisplayAlerts= False
If Application.WorksheetFunction.CountA(Ws.UsedRange) = 0 Then
Ws.Delete
End If
Next
Application.ScreenUpdating= True
Application.DisplayAlerts= True
End Sub
Instead of unhiding rows and columns on by one manually you can use this code to do this
in a single go.
Sub UnhideRowsColumns()
Columns.EntireColumn.Hidden = False
Rows.EntireRow.Hidden = False
End Sub
This code will simply save all the worksheets in a separate PDF file. You just need to change
the folder name from the code.
Sub SaveWorkshetAsPDF()
Dimws As Worksheet
End Sub
Sub DisablePageBreaks()
Application.ScreenUpdating= False
Next Sht
Next wb
Application.ScreenUpdating= True
End Sub
Workbook Codes
These codes will help you to perform workbook level tasks in an easy way and with
minimum efforts.
This is one of the most useful macros which can help you to save a backup file of your
current workbook.
It will save a backup file in the same directory where your current file is saved and it will
also add the current date with the name of the file.
Sub FileBackUp()
ThisWorkbook.name
End Sub
Sub CloseAllWorkbooks()
wbs.Close SaveChanges:=True
Next wb
End Sub
Let's say if you want to copy your active worksheet in a new workbook, just run this macro
code and it will do the same for you.
Sub CopyWorksheetToNewWorkbook()
ThisWorkbook.ActiveSheet.Copy _
Before:=Workbooks.Add.Worksheets(1)
End Sub
Use this macro code to quickly send your active workbook in an e-mail.
You can change the subject, email, and body text in code and if you want to send this mail
directly, use ".Send" instead of ".Display".
Sub Send_Mail()
With OutMail
.to = "Sales@FrontLinePaper.com"
.Subject = "Growth Report"
.Attachments.Add ActiveWorkbook.FullName
.display
End With
End Sub
Once you run this macro it will open your default mail client and attached active workbook
with it as an attachment.
Sub OpenWorkbookAsAttachment()
Application.Dialogs(xlDialogSendMail).Show
End Sub
You can use auto_open to perform a task on opening a file and all you have to do just name
your macro "auto_open".
Sub auto_open()
file."
End Sub
You can use close_open to perform a task on opening a file and all you have to do just name
your macro "close_open".
Sub auto_close()
End Sub
Let’s you have 5-10 open workbooks, you can use this code to get the number of workbooks
which are not saved yet.
Sub VisibleWorkbooks()
Dim i As Integer
i = i + 1
End If
Next book
MsgBox i
End Sub
These codes will help you to manage and make some changes in pivot tables in a flash.
If you want to hide all the subtotals, just run this code.
First of all, make sure to select a cell from your pivot table and then run this macro.
Sub HideSubtotals()
Dim pt As PivotTable
Dim pf As PivotField
Set pt = ActiveSheet.PivotTables(ActiveCell.PivotTable.name)
If pt Is Nothing Then
End If
pf.Subtotals(1) = True
pf.Subtotals(1) = False
Next pf
End Sub
Just run this code and all of your pivot tables in your workbook will be refresh in a single
shot.
Sub CloseAllWorkbooks()
wbs.Close SaveChanges:=True
Next wb
End Sub
Follow this step by step guide to create a pivot table using VBA.
If you are not using Excel tables then you can use this code to update pivot table range.
Sub UpdatePivotTableRange()
PivotName = "PivotTable2"
Data_Sheet.Activate
LastCol = StartPoint.End(xlToRight).Column
DownCell = StartPoint.End(xlDown).Row
Pivot_Sheet.PivotTables(PivotName). _
ChangePivotCache ActiveWorkbook. _
PivotCaches.Create(SourceType:=xlDatabase, SourceData:=NewRange)
Pivot_Sheet.PivotTables(PivotName).RefreshTable
'Complete Message
Pivot_Sheet.Activate
End Sub
Sub activateGetPivotData()
Application.GenerateGetPivotData = True
End Sub
Sub deactivateGetPivotData()
Application.GenerateGetPivotData = False
End Sub
Charts Codes
Use these VBA codes to manage charts in Excel and save your lot of time.
This code will help you to convert chart type without using chart options from the tab.
All you have to do just specify to which type you want to convert.
There are different codes for different types, you can find all those types from here.
Sub ChangeChartType()
ActiveChart.ChartType = xlColumnClustered
End Sub
This code will help you to convert your chart into an image.
You just need to select your chart and run this code.
Sub ConvertChartToPicture()
ActiveChart.ChartArea.Copy
ActiveSheet.Range("A1").Select
ActiveSheet.Pictures.Paste.Select
End Sub
First of all, you need to select your chart and the run this code.
You will get an input box to enter chart title.
Sub AddChartTitle()
Dim i As Variant
ActiveChart.SetElement (msoElementChartTitleAboveChart)
ActiveChart.ChartTitle.Text = i
Last:
Exit Sub
End Sub
Advanced Codes
Some of the codes which you can use to preform advanced task in your spreadsheets.
If you want to hide all the subtotals, just run this code.
First of all, make sure to select a cell from your pivot table and then run this macro.
Sub HideSubtotals()
Dim pt As PivotTable
Dim pf As PivotField
If pt Is Nothing Then
Exit Sub
End If
pf.Subtotals(1) = True
pf.Subtotals(1) = False
Next pf
End Sub
Let's say you have more than 100 worksheets in your workbook and it's hard to navigate
now.
When you run this code it will create a new worksheet and create a index of worksheets
with a hyperlink to them.
Sub TableofContent()
Dim i As Long
Application.DisplayAlerts = False
Worksheets("Table of Content").Delete
Application.DisplayAlerts = True
On Error GoTo 0
ThisWorkbook.Sheets.Add Before:=ThisWorkbook.Worksheets(1)
For i = 1 To Sheets.Count
With ActiveSheet
.Hyperlinks.Add _
Anchor:=ActiveSheet.Cells(i, 1), _
Address:="", _
ScreenTip:=Sheets(i).Name, _
TextToDisplay:=Sheets(i).Name
End With
Next i
End Sub
You just have to select the range and once you run this code it will automatically insert a
picture for that range.
Sub PasteAsPicture()
Application.CutCopyMode = False
Selection.Copy
ActiveSheet.Pictures.Paste.Select
End Sub
This VBA code will convert your selected range into a linked picture and you can use that
image anywhere you want.
Sub LinkedPicture()
Selection.Copy
ActiveSheet.Pictures.Paste(Link:=True).Select
End Sub
Excel will speak all the text what you have in that range, cell by cell.
Sub Speak()
Selection.Speak
End Sub
There is a default data entry form which you can use for data entry.
Sub DataForm()
ActiveSheet.ShowDataForm
End Sub
Goal Seek can be super helpful for you to solve complex problems.
Learn more about goal seek from here before you use this code.
Sub GoalSeekVBA()
Worksheets("Goal_Seek").Activate
.GoalSeek_ Goal:=Target, _
ChangingCell:=Range("C2")
End With
Exit Sub
End Sub
Follow this post to learn how to use this VBA code to search on Google.
Sub SearchWindow32()
search_string = query
'Uncomment the following line for Windows 64 versions and comment out Windows 32 versions'
chromePath = "C:Program
FilesGoogleChromeApplicationchrome.exe"
'Uncomment the following line for Windows 32 versions and comment out Windows 64 versions
(x86)GoogleChromeApplicationchrome.exe"
End Sub
Formula Codes
These codes will help you to calculate or get results which often you do with worksheet
functions and formulas.
When you run this macro it will quickly change the formulas into absolute values.
Sub ConvertToValues()
Select Case MsgBox("You Can't Undo This Action. " & "Save
Case Is = vbYes
ThisWorkbook.Save
Case Is = vbCancel
Exit Sub
End Select
If MyCell.HasFormula Then
MyCell.Formula = MyCell.Value
End If
Next MyCell
End Sub
73. Remove Spaces from Selected Cells
It will check your selection and then remove all the extra spaces from that.
Sub RemoveSpaces()
Select Case MsgBox("You Can't Undo This Action. " & "Save
Workbook First?", _
vbYesNoCancel, "Alert")
Case Is = vbYesThisWorkbook.Save
Case Is = vbCancel
Exit Sub
End Select
myCell = Trim(myCell)
End If
Next myCell
End Sub
All you need is to refer to a cell or insert a text into the function and number of characters to
remove from the text string.
It has two arguments "rng" for the text string and "cnt" for the count of characters to
remove.
For example: If you want to remove first characters from a cell, you need to enter 1 in cnt.
Public Function removeFirstC(rng As String, cnt As Long)
End Function
Let’s say you have a list of numbers in a column and you want to add degree symbol with all
of them.
Sub degreeSymbol( )
rng.Select
If IsNumeric(ActiveCell.Value) Then
End If
End If
Next
End Sub
All you have to do just enter "rvrse" function in a cell and refer to the cell in which you have
text which you want to reverse.
rvrse = VBA.strReverse(cell.Value)
End Function
This macro code will help you to activate R1C1 reference style without using Excel options.
Sub DataForm()
ActiveSheet.ShowDataForm
End Sub
This macro code will help you to activate A1 reference style without using Excel options.
Sub ActivateA1()
Application.ReferenceStyle = xlA1
Else
Application.ReferenceStyle = xlA1
End If
End Sub
With this code, you can insert a time range in sequence from 00:00 to 23:00.
Sub TimeStamp()
Dim i As Integer
For i = 1 To 24
ActiveCell.Offset(RowOffset:=1, ColumnOffset:=0).Select
Next i
End Sub
If you have dates in your worksheet and you want to convert all those dates into days then
this code is for you.
Sub date2day()
With tempCell
.Value = Day(tempCell)
.NumberFormat = "0"
End With
End If
Next tempCell
End Sub
Sub date2year()
Selection.Value = Selection.Value
With tempCell
.Value = Year(tempCell)
.NumberFormat = "0"
End With
End If
Next tempCell
End Sub
If you have time with the date and you want to remove it then you can use this code.
Sub removeTime()
Rng.Value = VBA.Int(Rng.Value)
End If
Next
Selection.NumberFormat = "dd-mmm-yy"
End Sub
Sub removeDate()
End If
End Sub
It will check each and every cell of selected range and then convert it into upper case text.
Sub convertUpperCase()
If Application.WorksheetFunction.IsText(Rng) Then
Rng.Value = UCase(Rng)
End If
Next
End Sub
85. Convert to Lower Case
This code will help you to convert selected text into lower case text.
Just select a range of cells where you have text and run this code.
If a cell has a number or any value other than text that value will remain same.
Sub convertLowerCase()
If Application.WorksheetFunction.IsText(Rng) Then
Rng.Value= LCase(Rng)
End If
Next
End Sub
And this code will convert selected text into the proper case where you have the first letter
in capital and rest in small.
Sub convertProperCase()
If WorksheetFunction.IsText(Rng) Then
Rng.Value= WorksheetFunction.Proper(Rng.Value)
End If
Next
End Sub
In text case, you have the first letter of the first word in capital and rest all in words in small
for a single sentence and this code will help you convert normal text into sentence case.
Sub convertTextCase()
If WorksheetFunction.IsText(Rng) Then
End If
Next rng
End Sub
To remove a particular character from a selected cell you can use this code.
It will show you an input box to enter the character you want to remove.
Sub removeChar()
Dim rc As String
Next
End Sub
Sub Word_Count_Worksheet()
Dim S As String
Dim N As Long
S = Application.WorksheetFunction.Trim(rng.Text)
N = 0
End If
WordCnt = WordCnt + N
Next rng
MsgBox "There are total " & Format(WordCnt, "#,##0") & " words
End Sub
If you have numeric data where you have an apostrophe before each number, you run this
code to remove it.
Sub removeApostrophes()
Selection.Value = Selection.Value
End Sub
This code will simply help you to remove all the decimals from the numbers from the
selected range.
Sub removeDecimals()
rng.Value= Int(rng)
rng.NumberFormat= "0"
Next rng
End Sub
Select that range of cells and run this code. It will first ask you for the number with whom
you want to multiple and then instantly multiply all the numbers with it.
Sub multiplyWithNumber()
"Input Required")
If WorksheetFunction.IsNumber(rng) Then
rng.Value = rng * c
Else
End If
Next rng
End Sub
Just like multiplying you can also add a number into a set of numbers.
Sub addNumber()
DimiAs Integer
If WorksheetFunction.IsNumber(rng) Then
rng.Value= rng+ i
Else
End If
Next rng
End Sub
94. Calculate the Square Root
To calculate square root without applying a formula you can use this code.
It will simply check all the selected cells and convert numbers to their square root.
Sub getSquareRoot()
Dim i As Integer
If WorksheetFunction.IsNumber(rng) Then
rng.Value= Sqr(rng)
Else
End If
Next rng
End Sub
To calculate cube root without applying a formula you can use this code.
It will simply check all the selected cells and convert numbers to their cube root.
Sub getCubeRoot()
Dimi As Integer
If WorksheetFunction.IsNumber(rng) Then
rng.Value = rng ^ (1 / 3)
Else
End If
Nextrng
End Sub
Sub addcAlphabets()
Dim i As Integer
For i= 65 To 90
ActiveCell.Value= Chr(i)
ActiveCell.Offset(1, 0).Select
Next i
End Sub
Sub addsAlphabets()
Dim i As Integer
For i= 97 To 122
ActiveCell.Value= Chr(i)
ActiveCell.Offset(1, 0).Select
Next i
End Sub
Sometimes it’s really hard to understand Roman numbers as serial numbers. This code will
help you to convert roman numbers into Arabic numbers.
Sub convertToNumbers()
Selection.Value= Selection.Value
rng.Value= WorksheetFunction.Arabic(rng)
End If
Next rng
End Sub
Sub removeNegativeSign()
Selection.Value= Selection.Value
If WorksheetFunction.IsNumber(rng)
End If
Next rng
End Sub
For data where you have blank cells, you can use the below code to add zeros in all those
cells. It makes easier to use those cells in further calculations.
Sub replaceBlankWithZero()
Selection.Value= Selection.Value
rng.Value= "0"
Else
End If
Next rng
End Sub
100th
Yes.
I want you to share your favorite macro code with me which you use every day to save your
time. In the end, I just want to say that some of these codes I use every day to increase my
productivity and I’m sure it will also help you in your work.
Share0
Tweet0
Learn More
Puneet is using Excel since his college days. He helped thousands of people to understand
the power of the spreadsheets and learn Microsoft Excel. You can find him online, tweeting
about Excel, on a running track, or sometimes hiking up a mountain.
Learn Excel (Videos)
Connect with Puneet
Leave a Comment
Excel Champs
Back to top