VBA To Select User Multiple Selected Ranges

Feb 9, 2010

The User has made multiple selections with the mouse. The spreadsheet is filtered. The user will usually make different multiple selections on the following columns: A and X through to AR (inclusive).

I just need some code to capture these various multiple selected ranges so that I can copy the selected range as shown below:

View 3 Replies


ADVERTISEMENT

Track Changes On Multiple Selected Ranges On Multiple Sheets

Jul 6, 2007

I need to be able to track changes on selected ranges on multiple sheets, but Excel does not appear to be able to do this. It only appears to allow me to select multiple ranges on the same sheet.

is there a way to track changes on multiple selected ranges on multiple sheets

View 9 Replies View Related

VBA Calculating Max / Min Within Multiple Selected Ranges

Dec 25, 2013

I have a problem with using VBA to calculate max/min within multiple selected ranges.

Here is the file: [URL].... I've also attached it below the post.

Column A to D contain the raw data, column G to L contain the trading data. Each trade is marked with "tick" which consists one buy/sell and one close. The entry and close date&time are also included. Then how to match each entry and close date&time from right to left and therefore to look up max/min value within entry and close time from the raw data in the left columns? Respectively, I would like to calculate the min(low) for a buy/close tick and max(high) for a sell/close tick.

The challenges for me:

1.How to match, or reference from the right to left. I knew that "vlookup" could only match one certain value. (correct me if I didn't know enough about "vlookup")
2.The date&time in the left are time intervals while those in the right are time points. How to refer and locate them?
3.In the right side, length of intervals that each tick marked (i.e.from buy to close) are not the same, so should I use a array to contain the length, and then calculate max/min within each? When the data amount get larger, it is not possible to manually use "min" function.

example2.xlsx

View 3 Replies View Related

Programme To Automatically Select A Value From A List Or Range Once A User Has Selected Corresponding Value From A List Within A Combobox

Jan 28, 2007

i'm writing a refrigeration selection user interface, working from values on an excel spreadsheet. how to get the programme to automatically select a value from a list or range once a user has selected corresponding value from a list within a combobox. for example if a user sets the temperature of their refrigerator to -5 celsius i need the programme to automatically select the corresponding value of enthalpy for the air at that temperature.

View 5 Replies View Related

Select Multiple Ranges

Nov 9, 2009

I have 2 ranges which on their own seem to work fine (I have check by just putting ".Select" at the end of both of them). The issue is that I want to apply the same border format to both ranges, however, when I try to put them together in a "With" statement it includes all of the range from the top to the bottom and not just the 2 two ranges. Ranges being used:

View 2 Replies View Related

Excel 2010 :: VBA - Convert Selected Ranges In Multiple Sheets Into One PDF

Feb 10, 2014

I'm using Excel 2010 and would like to know if it's possible to convert selected ranges in multiple sheets into one PDF file? For example, I want to select range("A1:O10) in Sheet1 and range("A1:N25") in Sheet2, then convert both Excel sheets into PDF file with two pages.

View 2 Replies View Related

Pass Multiple Non-contiguous Ranges Into A User Defined Function

Dec 23, 2009

I am trying to call a function that calculates forecast error (wMAPE). This function needs to be able to handle passing in non-contiguous ranges. I can't seem to figure out how to do that.


Function wMAPE(Forecasts As Range, Actuals As Range, Weights As Range) As Variant
Dim Denominator As Double
Dim Numerator As Double
Dim i As Long
Dim Fcst As Variant
Dim Act As Variant
Dim Wt As Variant

If Forecasts.Cells.Count Actuals.Cells.Count Then MsgBox ("Error: Arrays not same size")
If Forecasts.Cells.Count Weights.Cells.Count Then MsgBox ("Error: Arrays not same size")

Denominator = 0............

View 9 Replies View Related

Select Multiple Ranges Stored In Range Array

Nov 19, 2013

I am trying to do something that sounds fairly straightforward but have not been able to achieve the final result.

I have a sheet which has multiple range addresses stored in different cells and so far I have been able to pass the Range address to Range variables by looping through a range array. Now I would like to select these multiple ranges. My code looks as below;

VB:

Dim Cnt As Integer
Cnt = Sheets("Sheet1").(Range("1040").Value ' Cnt holds the the total number of ranges to be specified in Sheet1
Dim RStr(1 To 80) As String ' This will hold the range addresses specified in Sheet1 in cells C1041 to C1120. Upto 80 range addresses could be specified.
[SIZE=2] Dim Rng(1 To 80) As Range ' This will store the ranges based on the range addresses stored in RStr()
Dim i, j As Integer,

[Code]...

I am not sure on how to select multiple ranges using range array hence tried Union() however it is obviously not correct and throws an error.

View 2 Replies View Related

Indentify Selected Items In Multiple Multi Select ListBox Controls

Sep 26, 2006

changing two variables a various amount of times and running the same procedure and copying the resutls into another sheet. Seems like a perfect place for a macro. However, these variables can be chosen from a list that the user wants. So why not build in a listbox for each one. Now I have two listboxes one for variable A and one for variable B.

The procedure in theory goes something like this we change variable A from the base case and then run the procedure for variable B, get the results, then run the scenario again but changing only variable B abnd repeat. Then once, all of the variable B scenarios are done, I want to change the variable A and then repeat and so forth.

That is the background and my main problem at this point, is that have these values in two listboxes, I know how to do the for each loops and such, however, I do not know how to do them for values in the listbox.

How do I identify the values selected in the respective listboxes and then pull them so I only use them for the for each loop?

View 7 Replies View Related

MonthView Control Can Be Set To Allow Users To Select Multiple Ranges And Enter Different Dates

Dec 4, 2013

If MonthView control can be set to allow users to select multiple ranges and enter different dates into those ranges? I know I was able to do with with the previous Datepicker control and I thought it was as easy as setting the Show Modal property to true.

View 1 Replies View Related

VBA To Select Multiple Weeks In Pivot Table Based On User Input

Mar 26, 2014

Have been going round and round on this! I have a set of data that shows sales dollars by weeks. Currently, that data is in a Pivot table. I'd like to have a macro that selects the weeks (1-52) based on my input. For example. If I want to see weeks 5-52, I want to be able to input "5-52" somewhere and have a macro run that will select weeks 5-52 in the pivot table instead of having to go in and manually select each.

View 1 Replies View Related

How To Use For Each Instead Of User Selected List

Mar 31, 2014

I currently have a macro that takes a user selected name and date and creates a time sheet for the selected name. This works just fine, however i have to select each individual person and run the macro for each person, how to automate that part of the macro, so it will automatically create the said sheet for all person at once, rather than me doing it manually.

[Code] .....

The 'CurrentMonth' variable is user selected from a list, and will remain that way.

View 4 Replies View Related

User Selected Range

Dec 3, 2008

I have a form that asks at what row the user wants to start with a selected range then how many rows to select. There will always be 21 columns selected with this range. I am still learning but it has to do with something on how I am setting the Start object. It is not being recognized.

Dim Row As Long
Dim Selection As Long
Dim Start As Range

Row = txtStartRow
Selection = txtHowMany
Set Start = Range("A" & txtStartRow).Select

Range(Start & ActiveCell.Offset(Selection, 20)).Select

View 9 Replies View Related

Copy User Selected Sheets

Jun 5, 2006

how you would write a macro to move a selection of sheets to a workbook called Digi's in the D drive. Also if there isn't a Workbook called Digi's already it needs to add one. I've found some code to loop through sheets but nothing to show what sheets the user has selected

View 4 Replies View Related

Referencing User Selected Workbooks

Aug 5, 2008

I would like the user to select two files, the macro then inputs a formula that includes vlookup to the other sheet. However i am not sure how to reference each workbook.

Sub InsertLocationContents()

Dim rng As Range
Dim LastRow As Long

'OPEN CSV FILE WITH LOCATION CONTENTS

csvFN = Application. GetOpenFilename(Title:="Select Location Contents csv file")
If csvFN = False Then
' They pressed Cancel
MsgBox "Stopping because you did not select a file"
Exit Sub
Else
Workbooks.Open Filename:=csvFN
Workbooks.OpenText Filename:= _
csvFN, Origin:=437 _ .............................

View 9 Replies View Related

Pasting Selected Ranges Into A PowerPoint Slides

Mar 31, 2009

You will find two attachements to this thread. One is a completed example I found pasting charts into PowerPoint Presentation and the other is my example of what I would like done. Difference here is that I am not using charts, instead I am using selected ranges to paste in a PowerPoint Presentation.

Instead of pasting charts to Excel, I would like to make each colored range a slide in the PowerPoint (Please see attachment).

So by click on the command button "Create PowerPoint Presentation", I would like to have PowerPoint open and the two colored ranges should be in the PowerPoint Presentation as Slide 1 and Slide2.

I have done some research on this topic and found information, but I have not clue as how to do it.

View 13 Replies View Related

Macro Or Function That Changes Value Of Selected Ranges Of Cells

Apr 28, 2009

I am looking for a macro or function (VBA) that will modifiy the value of the selected cell or cells. the code should support selection of one cell, a range or multiple ranges.

I envision the user making his range selection(s). Activating a function or clicking a button that would pop open a modal window. The user would have the option to either adjust the values by a % change (i.e. up or down 7%), or incremental change (i.e. up olr down 100 units). The function would overite the value in the cells.

Has anyone ever done something similar? Is it hard to program?

View 14 Replies View Related

Copy Columns From One User Selected Workbook To Another

Apr 27, 2014

I am using this code to copy columns C,D, and P from a user selected workbook into position C,D,E of workbook "Checklist.xlsx" (the one from were I run the VBA code). I don't have a clue about VBA, just have been gathering info, but the code works pretty fine. The only issue is that it opens twice the workbook "wbExt" hence the system prompts me if i want to reopen the already open workbook.

Some questions:

1) Is there a way to copy the 3 columns at once? something like "Columns("C:D, P").Select".
2) Is there a way to select the workbook from were to copy the column without needing it to actually open?
3) is there a way to paste the columns starting from row 3 instead of row 1 (Range("C1").Select)?

View 2 Replies View Related

Recognize Which Radio Button The User Selected?

Jul 21, 2014

Within a worksheet, I have several radio buttons, allowing the user to select only one of them. Using VBA, how do I recognize which radio button the user selected?

View 1 Replies View Related

Insert Range-named Row At User-selected Row

May 3, 2008

On the first row of a spreadsheet template is a <hidden> contiguous series of conditionally formatted cells (range name "stdRow" =production!$1:$1), with formulas, that I want a user to be able to easily insert at whatever row they might be in a worksheet.

If, for example, the user is at D24, then clicks the [InsertRow] button that I have positioned at the top of the worksheet (in a fixed pane), I want the attached macro to insert an instance of "stdRow" directly underneath the user position (at row 25, in this case). The use's position should still be at D24 when the macro finishes. If the user clicks the button multiple times, multiple rows should be inserted (again, without changing the user's position).

This is what I have tried so far:

View 13 Replies View Related

Concatenate Variable (user Selected) Cells

Nov 14, 2007

I want to do a concatenate for multiple fields, but want the user to specify which cells should be concatenated by entering this in a few fields. What does this formula (or VBA) look like?

Let's assume there is the possibility to concatenate a maximum of 4 cells. Call the 3 cells that will be concatenated cell1, cell2, cell3 and cell4.

On the first sheet of the workbook the user enters the following:
cell1 = Sheet2!A4
cell2 = Sheet2!B4
cell3 = Sheet2!C4
cell4 = Sheet2!D4

Here are some cells and their values:
Sheet2!A4 = Hel
Sheet2!B4 = lo
Sheet2!C4 = World
Sheet2!D4 =

Upon enterring the information after the = sign for the cell1, cell2 and cell3, the formula for the concatenate becomes: =CONCATENATE(Sheet2!A4, Sheet2!B4,Sheet2!C4 ).

The result of the formula is: HelloWorld

If I now change the values of cell1, cell2, cell3, and cell4 the following should happen:
cell1 = Sheet2!B4
cell2 = Sheet2!C4
cell3 =
cell4 =

The formula for the concatenate becomes: =CONCATENATE(Sheet2!B4, Sheet2!C4).

The result of the formula is: loWorld

View 9 Replies View Related

Hide/unhide User Selected Rows

May 15, 2007

I'm trying to create a macro that allows users to hide or unhide selected rows, either via toggle or userform. The macro I have looks like this, but for some reason it doesn't hide the rows:

Sub Hide_Range()
Dim UserRange As Range
DefaultRange = Selection.Address
Set UserRange = Application.InputBox _
(Prompt:="Select Range to Hide:", _
Title:="Hide Range", _
Default:=DefaultRange, _
Type:=8)
Rows.Select
Selection.EntireRow.Hidden = True
End Sub

what's wrong with my code and how I can further develop it to let the user decide whether to hide or unhide the selected rows?

View 3 Replies View Related

Display Selected Cells Depends On User Input?

Jul 17, 2013

I am trying to display number of lines which depends on value pass by user. Actually user is passing some value. on which some group of lines has to be display.

eg
for 1 value 9 lines
for 2 value first 9 lines + another 9 lines
for 3 value first 18lines + 9 lines
and so on till 52.(this 9 lines are set of some column and rows)

thus cant use macros..

View 1 Replies View Related

VBA Macro To Use Solver On User Selected Column Of Data?

Jul 24, 2014

I am trying to write this macro so that I can optimize 181 outputs based on 2 inputs (columns A and B are inputs). Each row has a single output at the end of the row that I am trying to minimize. I want to be able to select as many of the rows that I want and have the code optimize each individual row. So far I can't get it to let me use variable cell references for the "ByChange:="$A$3,$B$3"." This is the hang up that is not letting me increment the macro to the next row. The macro works currently for the single selected cell, but until I can vary the ByChange portion, I can't automate it.

View 1 Replies View Related

User Input Returns Selected Form Output

Dec 29, 2013

Have a person Input an Assembly Number and,Have Excel return a list of Part Numbers, their Descriptions, and a Quantity for each Part Number that will need to be packaged with the Assembly Number that was Input.

The output needs to be in the form of a check sheet (I can play with the formatting if I can get the information out) for the one Assembly Number input.The output can either be in a separate spreadsheet or a User Form. The spreadsheet is easier for me to work with but the User Form looks cooler.

I can use a VBA Function to Input the Assembly Number but then I need some way of searching a small table (about 20x20 cells) to find the matching Assembly Number and then return the Part Numbers, etc. to a check sheet so the parts can be packaged. Each Assembly Number can have several Part Numbers associated with it. Either unique to that Assembly Number or common to other Assembly Numbers. The Quantities can also be unique or common. A couple of simple examples might be:

Assembly Number - ANA0134
P/N Description Qty.
ANA0118 Widget thing 2
ANB0554 Thing Widget 4

Assembly Number - ANA0431
P/N Description Qty.
ANA0118 Widget thing 3
ANB0554 Thing Widget 4
ANC0023 Plain Widget 1

View 4 Replies View Related

Select Row Where Only 1 Cell Is Selected

Jan 5, 2010

I need to delete part of the row where one cell is selected. If more than 1 cell is selected, I want a msgbox. Example: I have any cell selected on row 26. I want to select all cells in this row including column C thru column AD. Column A & B are not to be deleted. After the selection is made, I want the row deleted and the below cells moved up.

View 3 Replies View Related

Show User-Defined Date Ranges

Dec 26, 2006

Based on the attached spreadsheet, how can I place a button for users to select a range of dates from Business Date column. I am stumped cos I have never done this before. They want to be able to select the date range...ie only view data of date ranging from Example : 1 July to 31 December OR 30 June to 31 Aug.

View 4 Replies View Related

Pass Ranges To User Defined Function

Dec 28, 2006

I am trying to write a User Defined Function in VBA to perform a simple two-dimensional table lookup. I have the temperature distribution in a solid given in a table in Sheet2. The first column of the table contains the time values, the first row contains the spacial values (radii), and the intersections contain temperature values. These ranges are named times, radii, and temperatures. In Excel, I can perform the lookup using: =index(temperatures, match(time, times, 1), match(radius, radii, 1))

But how do you do this in VBA? More specifically, how do you deal with passing ranges to the WorksheetFunctions?

Function temperature_ref(time_range As Range, radii_range As Range, temperatures_range As Range, time As Double, raduis As Double)

r = WorksheetFunction.Match(time, time_range, 1)
c = WorksheetFunction.Match(radius, radii_range, 1)
temperature = WorksheetFunction.Index(temperatures_range, r, c)
End Function

This function would be called (from any worksheet) as..................

View 4 Replies View Related

Loop To Import Text Files One By One Until Cancel Selected By User

Jan 30, 2014

I have a macro that works perfectly to import a text file and parse it. Now i need it to do multiple ones. I import the txt file to a new workbook as i filter for certain data only and if found i copy that to the current workbook. I want to do the same just for many txt files:

[Code] .......

View 4 Replies View Related

Chart Twelve Months Of Data For Item The User Has Selected

Oct 24, 2011

how can I provide a chart that display as a line chart twelve months of data for the item selected starting or ending on the data that I have selected

View 4 Replies View Related







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