Edit Undo When Using VBA Code

Jul 21, 2006

Is it possible to enable the undo command when using VBA code in a spreadsheet? Right now if someone makes a mistake it can’t be undone.

View 5 Replies


ADVERTISEMENT

VBA Code For Undo

Nov 26, 2009

A Worksheet_Change macro in Sheet1 changes the font colour if the target is cell(1,1). So, if I change the value of cell(1,1), it will become red. But then I cannot change it back to the original value because the undo button is not active anymore. And what if I changed cell(1,1) by mistake instead of cell(2,1), and I want to put it back to the original value?

View 5 Replies View Related

Undo Option Lost After Event Macro Code

May 23, 2008

I have a sales spreadsheet, that people on this forum have very kindly helped me with by giving me two macros; one to remind users that they need to update the month cell when an order comes in, and the other to automatically put the date in a cell when any cell in that row is changed.

The final thread is here: Message To Remind That Cell Is Mandatory

and the Macro used is:

Private Sub Worksheet_Change(ByVal Target As Range)
Dim c As Range
Application.EnableEvents = False
For Each c In Target
If c.Column = 11 Then
If c.Value = "100 - Purchase Order In" Then
MsgBox "Is the Month In correct?"
End If
End If
If c.Column > 1 And c.Column < 18 Then
Cells(c.Row, 1) = Now
End If
Next c
Application.EnableEvents = True
End Sub

However...

We've now found that we cannot undo anything in these spreadsheets. If, for example, a cell is incorrectly copied or deleted, the only way of undoing the change is to shut down the spreadsheet without saving!

Is this just a by-product of using the time macro (a search on other threads suggests that it might be), and, if so, is there any way of changing it?

View 9 Replies View Related

Edit VBA Vlookup Code

Jun 3, 2009

Right now i have two worksheets:
"900 - Reel"
"OverRides"

On the "900 - Reel" sheet i have a userform ("userform4") open when double clicking a specific cell. Upon opening it uses the following code to go to sheet "OverRides" to find two specific values and imputs them into "textbox1" and "textbox2" on "userform4"

View 4 Replies View Related

Edit ComboBox Code

Jan 5, 2007

I have a list of worksheet names in a combobox, when selected using the drop down arrow it takes you to that worksheet. The problem is say I select "ABC" from the list and it takes me to the "ABC" worksheet but when I go back to the summary page the "ABC" is already selected in the drop down box and I cannot click it any more. Is there anyway to reset the combo box so that it goes back to the first selection of the list?

Private Sub AFISGBox_Change()
Dim strSheet As String
If AFISGBox.ListIndex > -1 Then
strSheet = AFISGBox
Sheets(strSheet).Select
End If
End Sub

View 9 Replies View Related

Edit Code To Add Extra Criteria

Feb 22, 2008

How do I make this formula include searching for "ann" and "john" (in separate cells)?

View 2 Replies View Related

VBA Code For Saving PDFs To Edit Name

Jun 24, 2014

I'm working on a mac and have a macro that will go through all the sheets in my workbook and save them as PDFs to a specific location.

Sub CreatePDF()
For sh = 19 To Sheets.Count
Sheets(sh).ExportAsFixedFormat Type:=xlTypePDF, Filename:= _
"/Users/mikemahoney/Desktop/Publisher Payables/Statements/June 2014" & Sheets(sh).Name & "June 2014 Revenue Share Statement" & ".pdf", _
Quality:=xlQualityStandard, IncludeDocProperties:=True, _
IgnorePrintAreas:=False, OpenAfterPublish:=False
Next
End Sub

The part in bold is obviously where I am saving the PDFs but it is also being included in the naming of the file. Need replacing the red text in the naming of the file with the contents of cell B9? I would still like to save the PDF to "/Users/mikemahoney/Desktop/Publisher Payables/Statements/June 2014" I just don't want the file-path to be included in the name of the file.

Also, this code seems to run into errors if a sheet is hidden, hence starting at sheet 19. Any way to tweak this code to skip over hidden sheets?

View 1 Replies View Related

Edit Chart Code To Exit If

Oct 13, 2008

I just wonder if we can have the code to exit if G2 returns an even number, as 2, 4, 6 etc?

Sub Listbox3_Change()

If ActiveSheet.Index 1 Then Exit Sub
Application.ScreenUpdating = False

With Sheets(1)
.Unprotect "mypsw"
.Range("G2").Value = ActiveSheet.ListBoxes(Application.Caller).Value
With .ChartObjects("Chart 2").Chart.Axes(xlValue)
If VBA.VarType(Sheets(1).Range("D1").Value) = VBA.vbError Then Exit Sub
If VBA.VarType(Sheets(1).Range("E1").Value) = VBA.vbError Then Exit Sub

.MinimumScale = (Sheets(1).Range("D1") - 0)..............

View 9 Replies View Related

Edit Code From The Macro Recorder

Jul 25, 2006

The way i have been creating macros is by going to the tools menu.....macro....then..... record new macro.

I have a file which I have re-formatted using a macro as described above however because i receives files every month to do updates every time i open a new file and try to perform that same macro it either wont work or it wont format the correct rows.......is VBA the solution to this????

View 9 Replies View Related

Code To Edit Macro Security Settings

Apr 1, 2008

I need a code to change the Macro security settings of the computer where the file is opened to enable macros.

View 9 Replies View Related

Edit VBA Code For Lotus Note To Display Email Instead Of Sending Out?

May 28, 2013

below is the code i use to create a lotus note email.

i would like it to display my email and send it manually instead of sending out automatically.

' Open and locate current LOTUS NOTES User
Set Session = CreateObject("Notes.NotesSession")
UserName = Session.UserName

[Code].....

View 4 Replies View Related

Undo Column Name

Apr 1, 2009

How do undo a column name, say you named column "b" boy how do you get it back to b.

View 2 Replies View Related

Undo Action In VBA

Jul 18, 2006

I have a database in excel which I want only selected users to have edit rights & others should have readonly rights. I have written the following code where a pop up would appear in selected cells warning user for editing the said cell. What I want is when a user clicks yes he should be able to edit it & when he clicks no the cell should get protected.

Private Sub Workbook_SheetSelectionChange(ByVal Sh As Object, ByVal Target As Range)
Dim rTriggerCell As Range
If Not Intersect(Target, Range("D1:D100")) Is Nothing Then
Set rTriggerCell = Target
Application.EnableEvents = True
If MsgBox("Edit Cell?", vbYesNo)
End If
On Error Goto 0
Exit Sub
End If

View 6 Replies View Related

Undo Text To Columns?

Jul 20, 2009

How do I undo text to columns?

I had a list of email addresses that I put into two columns with the @-now I have finished manipulating and I need to have the email addresses whole again.

The email is now in column A and the domain is in column B. I cannot click undo.

View 4 Replies View Related

Undo Last Commad Button

Jan 28, 2009

I need to create an Undo Last command button.

I have created a textbox using the control toolbox and I have created command buttons that populate text when I click them into the text box.

Do you guys know the code for a command button to undo the last entry in the text box.

View 7 Replies View Related

Undo Data Validation

Mar 19, 2012

How can I do the above Title?

View 1 Replies View Related

Unable To Undo / Redo

Apr 16, 2007

I am unable to undo/redo in MsExcel. Have tried to uninstall/reinstall office, all updated are current.

View 9 Replies View Related

Undo Last Action - Userform

Aug 14, 2008

What i have is a userform which contains textboxes a user can enter or change data in.

What i'd like to do is to have a button called something like "undo last" whereby a user can 'swap' back the last change they made.. does anyone have any idea how i might go about it?

View 9 Replies View Related

Increase Undo Limit From 16

Apr 20, 2007

In Dave and Raina Hawley's excellent Excel Hacks book they showed how to increase the undo limit of 16 up to 100. THis only works for EXcel 2002. Any Bright spark know how to do this for Excel 2003?

View 2 Replies View Related

UNDO Feature To Work

Sep 13, 2007

I cannot get the UNDO feature to work.

View 9 Replies View Related

Undo All Users Actions

Sep 20, 2007

Is there a structure inside of Excel which keeps track of all the actions taken by a user (something that would presumably be used to allow for an undo sequence)? If so, is there a way to get access to it?

View 2 Replies View Related

Undo Causes Copy & Paste

Mar 27, 2008

I'm working on a massive Excel sheet which admittedly uses tons of macros, comboboxes and pivot tables. My issue at the moment is that I have no idea why Excel is pasteing values from specific sheets into the current sheet, when I click on 'Undo'. I've only been able to replicate it when i copy, paste and then undo. I've removed code relating to those sheets and it still does it. I also have no macro's using Ctrl+z. The sheet, whose values it's pasting, does use comboboxes. I have changed the linked cell property in Excel to the "SheetName"!"Cell". It still does this. The odd thing is that it doesn't do it to new workbooks or new sheets.

View 9 Replies View Related

Sheet Has Lost The 'UNDO' Facility

Jun 23, 2009

I have created a spreadsheet in the field of marine surveying. In that sheet, I have used a lot of macros (21 modules) and a lot of VBA, most of it provided by kind people on this forum. But what has happened now, is that when I use that particular worksheet, the 'Undo' menu item in the 'Edit' menu has become permanently grayed out and it says 'Can't Undo'.

In other words, I cannot undo, even if I have made the wrong entry in an unprotected cell. If I use any other sheet, or make a new sheet, everything returns to normal. So, is there any way I can re-gain the 'Undo' facility, while using that particular sheet. I am using Excel 2003 on a Windows XP Home (SP3) platform.

View 4 Replies View Related

How To Undo List Hiding Entries

Dec 13, 2012

I keep a client list and excel at random will essentially hide entire rows of entries. For example if I go to search a name from the name column that I know I entered nothing will return but if I specifically enter the cell number that is hidden the information will be show, does excel 2011 have an auto-grouping or hiding feature that I'm not aware of? If so, how do I get rid of it? I'm not sure if this makes a difference but all the numbers to the left most of the sheet are blue where in every other sheet they are gray.

View 2 Replies View Related

Redo / Undo Buttons Are Greyed Out

Aug 9, 2013

In some excel files the redo / undo buttons are grayed out

View 3 Replies View Related

Excel 2003 :: Undo Is Not Working

Nov 12, 2013

why my undo just won't ever work. Excel 2003.

View 1 Replies View Related

Undo Absolute Cell References

Jul 26, 2009

I'm using a lot of "activeCell.offset(row,col).address" type of entries to form formulas for me. All of the references come across as Absolute References - $G$24, for example. Is there a different way for activeCell to give me a "normal" address ('G24' vice '$g$24') or a function that will convert for me?

View 2 Replies View Related

Undo Button Information Box Text

Mar 6, 2013

I'm new to VBA & would like to use the MsgBox() function to display some of the data found in the information pop-up window when a user hovers the mouse over the undo button (e.g. Typing '=ABS(C3)' in C6).

I want to take this text to put it into something like this:

MsgBox("You just " & CODE_FOR_UNDO_TEXT & ".")

This will allow me to remind users of the last action they took.

View 3 Replies View Related

Build Undo In Recorded Macro

Oct 2, 2006

I have recorded certain macros. But after executing macro 'Undo' do not work. How can I do it ?

View 3 Replies View Related

Worksheet_change Event Disables Undo

Jul 4, 2007

I have a user who wanted a spreadsheet to highlight cells containing formulas whenever the formula was changed. (They want the ability to make changes, but want those changes highlighted. They do not want to protect cells with formulas.) I tried to accomplish this with Conditional Formatting but could not figure out a way to do it, so I turned to VBA. I wrote the following routine that is called on the Worksheet_change event:

Sub CheckFormulas(Target As Range, FormulaRange As String)
Dim CurCell As Range
For Each CurCell In Range(FormulaRange)
If Target.Address = CurCell.Address Then
Target.Interior.ColorIndex = 3
End If
Next CurCell
End Sub...................

View 2 Replies View Related







Copyrights 2005-15 www.BigResource.com, All rights reserved