[Solved] Simple VBA code to open cells one after the other

Why would you want to do this? VBA doesn’t have a keyword that represents entering into a cell. You can select the cell like this though: Sub DoNotRun() Dim rng as range For Each rng In ThisWorkbook.Worksheets(“Sheet1”).range(“A:A”) rng.Select Next rng End Sub If you really need to simulate a double click — Worksheets have a … Read more

[Solved] VBA to ignore cell formating when adding a specific number using a userform

Since there is a single piece of code writing in column C:C, adapt it in the next way: Instead of: Sheets(“Sheet3”).Range(“C4”).Select Selection.Borders.Weight = xlThin ActiveCell.Value = “.” & TextBox3 Try this, please: If TextBox3.Text = “6” then Sheets(“Sheet3”).Range(“C4”).NumberFormat = “@” end if With Sheets(“Sheet3”).Range(“C4”) .Borders.Weight = xlThin .Value = “.” & TextBox3.Text End With 2 … Read more

[Solved] Is there a macro I can put on a command button, to move the current sheet to a different closed workbook? [closed]

Insert a button on the workbook and assign this code to the button, make sure to change the filename path to yours: Private Sub CommandButton1_Click() On Error Resume Next Dim sheetIndex As Integer sheetIndex = 1 Application.ScreenUpdating = False Workbooks.Open Filename:=”C:\YourPath\Completed Workorders.xlsm” Windows(“Workorders.xlsm”).Activate ActiveSheet.Select ActiveSheet.Copy Before:=Workbooks(“Completed Workorders.xlsm”).Sheets(sheetIndex) sheetIndex = sheetIndex + 1 ActiveWorkbook.Save Windows(“Completed Workorders.xlsm”).Close … Read more

[Solved] Excel VBA to sum right column to left column

It’s not the most elegant code, but it works out for you. I totally changed the logic that you used to make ColSumTraining3 sub. Assign the macro to a button, select the desired row and click the button. The value of CumWip will be automattically filled based on the Area. You can adapt this code … Read more

[Solved] get value/charts in another workbooks without opening it

I finally used these lines of code Arg = “‘” & Path & “[” & File & “]” & Sheet & “‘!” & “R4C4” ‘Range(Ref.Range(“A1”).Address(, , xlR1C1))C ‘Execute XLM macro GetValue = ExecuteExcel4Macro(Arg) Way more simple with some loops. solved get value/charts in another workbooks without opening it

[Solved] SAP EXCEL TABLE [closed]

My suggestion is as follows: Session.FindById(“wnd[0]/usr/tblZVMGO_SO_RDD_FDF_UPDTETABCON‌​/‌​ctxtVBAK-VBELN[0,‌​” & cstr(Loo‌​pNum) & “]”).Text = Fill(LoopNum) Regards, ScriptMan 2 solved SAP EXCEL TABLE [closed]

[Solved] How to replicate Excel’s TEXTJOIN function in VBA UDF that allows array inputs [duplicate]

Try this user defined function. It is quite versatile. It will take for input hard-coded strings, single cell, cell ranges, arrays, or any mixture of them. Blanks will be ignored. See the photo for outputs. Public Function TJoin(Sep As String, ParamArray TxtRng() As Variant) As String On Error Resume Next ‘Sep is the separator, set … Read more

[Solved] Duplicate number and it value in column EXCEL [closed]

Option Explicit Sub wqewrty() With Worksheets(“sheet1″).Cells(1, 1).CurrentRegion .Cells.Sort Key1:=.Columns(1), Order1:=xlAscending, _ Key2:=.Columns(2), Order2:=xlAscending, _ Orientation:=xlTopToBottom, Header:=xlNo With .Columns(1).Offset(1, 0) .FormatConditions.Delete .FormatConditions.Add Type:=xlExpression, Formula1:=”=$A2=$A1” .FormatConditions(1).NumberFormat = “;;;” End With End With End Sub I’ve assumed that you wanted to use column B as a secondary sort key to the primary sort key on column A. If … Read more