VBA Macro To Find Text, Offset Column/Row & Copy

May 13, 2009

I am in the process of writing a VBA code(I should I am fairly new to this code writing!!!).What I need to be able to do is below.(enclosed please find a output in an xls file) What I should be able to do is below:

1.Find the text "Cash(No Listing)(Monthly)"

2. Offset to the 13th Column after that

3.Select the value in this column ,copy the value

4.Go to a row above and move one column to the left i.e.offset (-1,-1) and move 12 column backwards i.e.offset(0,-12)

5.Copy the value in 3 above to this entire range

6.Repeat this process for the entire file

My code is as below.Let me know where am I making a mistake. Just to let you know that this code performs the job well for the first entry i.e in the yellow makde area and doesn't do the job for any further entries .Llooks like I have some problem with the loop but not sure as to whats happening!

View 3 Replies


ADVERTISEMENT

Find, Offset & Copy To Another Column Via Macro

May 21, 2009

I am attempting to do is have a macro (Via Command button) go through column A to find the word "TOTAL". Once that is found I want it to offset by 3 rows (from the word "TOTAL") to grab the number and place it into column B.

View 2 Replies View Related

Find Text & Offset By Found Value Row And Column

Apr 16, 2008

I'm writing some code where I need to know the column in which a specifc text string occurs. Because of the nature of the sheet, the string will only appear in one column, but that could be in almost any column on the worksheet.

For example say the text string is "Year 1", I need to find the column with this string, and then offset down to a predetermined row, or offset over to the appropriate column (something like below).

With Selection
.Offset(0, x).Select
If List.Selected(0) = True Then
y = i - 1
With Selection
.Value = Salary * Inflation1 ^ y
End With
Else

View 9 Replies View Related

Find All Occurences Of Text In Column & Offset To Add Data

Aug 22, 2006

I have been unable to get this code quite right.

I want to be able to search all of column A for the string "UNAUTH O/D FEE £20.00" and when it is found, add £20 to column B, and 01/01/00 into column D of the same row.

Sub feedate()

Set rd = Sheets("fees")

z = 20
x = 1 / 1 / 6

For i = 1 To rd. Range("A65536").End(xlUp).Row
If UCase(Cells(i, 1)) = "UNAUTH O/D FEE £20.00" Then
Cells(i, 2).Value = z
Cells(i, 3).Value = x
End If
Next i
End Sub

View 9 Replies View Related

Macro To Find Specific Text In Column And Copy Certain Cells In Same Row To Different Sheet

Dec 30, 2011

how to work macros or VBA

I have a workbook with multiple sheets named by month and year that I use to keep track of loans I work with at a bank. In these sheets I have info such as:

Column B = due date
Column D = loan# A
Column E = loan# B
Column F = status
Column H = followup needed
(Columns A,C, and G aren't important for the current need)

What I am trying to do is create a main sheet (TRACKER) that all I will have to do is press a macro button and it will pull info for each loan that is in a pending status.

I need a macro that will search column F (Status) on all sheets and find each instance of "Pending" and once that is done, copy rows B,D,E, and H in each "Pending" instance and copy them to their designated area on my TRACKER sheet. After that is done I need it to continue to the next "pending" instance and do the same on the next available line on my TRACKER sheet.

The overall goal would be that everyday I can press the macro and it will repopulate the sheet with the current pending items (as each day I will change pending status' to complete and no longer need to track it the next day).

I already have the tracker sheet set up and ready to go with the spaces as follows:
Column G&H = Merged cells where due date will need to go
Column I&J = Merged cells where loan# A will need to go
Column K&L = Merged cells where loan# B will need to go
Column M thru S = Merged cells where followup needed will need to go

View 9 Replies View Related

VBA Copy Offset Cells To Another Worksheet If Cell In Column B Contains (text)

Feb 13, 2014

I want to do the following:

If cells in column B from Sheet 1 contains ''text'',

Copy Cells from column D and F from Sheet 1 - TO - Sheet 2 in columns C and E -

View 1 Replies View Related

Macro To Find A Cell Containing Text /select Range Offset / Cut And Paste To Lower Rows?

Feb 4, 2014

I am trying to find a macro that can search a sheet for any cell that contains the text "Not on AOI" selects a range that contains that cell, 81 rows below, and 2000 columns to the right, then cuts the selection and pastes it 162 rows below the original cell where the text was found. What's hard is that the number of columns between the "Not on AOI" cells is variable.

I'm very new to excel macros and the parts I think I've put together are:

Cells.Find("Not on AOI", After:=ActiveCell, LookIn:= _
xlFormulas, LookAt:=xlPart, SearchOrder:=xlByRows, SearchDirection:= _
xlNext, MatchCase:=True).Activate

[Code].....

View 1 Replies View Related

Find Specified Values. Offset & Cut/Copy

Aug 2, 2006

I am trying to locate specific values in column a of a spreadsheet and I want to be able to move (cut and paste, offset, ???) only those values to column c of the same row. The values I am looking for are text and they all begin <@29>, <@33>, etc. (pagemaker codes). I want to move the cells with the pagemaker codes to column c. and leave the other ones in column a. Does anybody know how to do this using vba? Below is a sample of my column a.

16D
16D
16D
16D
16D
16D
16D
16D
16D
16D.........

View 3 Replies View Related

Find Dates, Offset & Copy

Jul 7, 2007

My source data generates a sheet full of individual dates and condo rates. We'll call it the "Rates Tab". The dates are not sorted or organized into a single column and to complicate it further the data has blank rows periodically. The only recognizable pattern is: (example) the date is in cell b12, then the condo rate will be 2 columns to the right in d12. On a separate sheet, the user will input a check in date(date A) and check out date(date b). I need to find the rates for all dates from Date A to Date B located on the Rates Tab. how to find a Date across various columns and then return a value 2 columns to the right from the "target"?

View 6 Replies View Related

Find Text In Column, Copy Next Row And Paste In New Sheet

Oct 9, 2009

Essentially, I have 2 Sheets:
"SheetWSS" = data to be copied
"SheetWSD" = destination of copied data.

Below is a sample of the data in "SheetWSS"
----------A------------------------B-------------------------C
1------Trade ID -------Description---------System no.
2--------579----------------Loan ---------------------- 7
3--------580----------------Deposit---------------------22
4--------702----------------Deposit--------------------- 11
5--------703----------------Loan ----------------------- 58
6--------732 ---------------Loan------------------------66
7--------733----------------Deposit-------------------- 99
etc...(no more than 10000)

Now, an explanation of the data:

1) I work for a small bank (CORP) that takes deposits and gives loan.

2) CORP books these trades using only system no. 7 and 11; other system nos. belong to customers.

3) When a single trade is booked, the 2 sides of the transaction is recorded (by Trade IDs) . E.g rows 2 and 3 relates to one trade. So if CORP loans money with system no.7 to CUSTB, who uses system no.22, it shows for CORP a loan and for CUSTB, a deposit.

4) Everyday, the data in "SheetWSS" is updated with a different number of rows from previous, but the number of columns remain the same.

So, here's what i'ld like the macro to do:
1) Go into Column C, find system no.7 and 11.
2) For each 7 and 11 found, Copy the next row . So if for e.g, system no.11 was found in C4, i want the ENTIRE ROW 5 to be copied.
3) Paste the entire next row in "SheetWSD" until we have a list of all opposing sides of the same transactions initiated by CORP.

View 3 Replies View Related

Macro To Find Text And Copy Row Values

Jul 11, 2014

See attached spreadsheet for reference : MacroHelp.xlsx‎

I would like the macro to look in column I, and when it finds "TRUE", I'd like it to copy and paste values in all the cells to the left of it.

Reason being is that I want to rid the row of its formula, so the next time someone changes the info (the date the vlookup is searching for) in the tabs those cells are referring to, I will not lose the data it returned previously.

Really all I want is to copy and paste the values in the lowermost row of new information for each plant, but this is the best way I can currently think of.

I've removed the tabs the cells in columns B-G are referring to for sensitivity's sake.

View 2 Replies View Related

VBA - Find Select Offset Copy And Paste

Aug 23, 2012

I am trying to achieve something like this :

Find a specific text in my column B (example : "Proposal ID"), when "Proposal ID" is found, select this cell and offset to the column C (Offset(0, 1)). Then copy this cell value in another sheet.

This will be repeated with different texts (always in the column B), so if the text is not found, I need the macro to continue running.

View 5 Replies View Related

Find Min Value & Offset By 1 Column

Nov 20, 2009

I have a list of names in col A and a list of numbers in col B

How can I write a formula that finds the minimum value and returns the name next to it?

I was trying something like Offset(min(b2:b20),-1), but it doesn't work.

View 9 Replies View Related

Macro Find Text, Copy, Paste Special

Mar 4, 2009

I have a workbook with many sheets in it. Within each sheet there is a cell with the Text "March 09" there are then 3 cells to the right of this cell with relevant information. Is there a Macro that can search for this text March 09, then copy this and the 3 cells to the right of it and paste special this information 1 cell below for all 4 cells.

View 2 Replies View Related

Loop To Find A Cell, Then Copy Offset Paste

Feb 1, 2009

I have a data sheet with employee information. Only one column. It prefixes information with codes, but keeps it in the same cell. I want to move data of certain types into their own columns, but the amount of data is variable, so I cannot simply move every Nth cell, etc.

i.e.

Employee#1
200 Firstname Lastname
204 99999999 (Employee ID)
G38 00005000 (i.e. Pension Deduction)
H38 00007580 (i.e. Benefits Deduction)
X96 00012099 (i.e. Staff Club Deduction)
Employee#2
200 Firstname Lastname
204 99999998
G38 00000775
X96 00001000

So you see some employees may have different codes altogether. But I know that I want all the cells that start with 200 to be offset (-1,1), and all the cells that start with 204 to be offset (-1,2), and so on so that basically I end up with columns of info instead of a one column list.

I have been reading and studying other peoples' macros, and am just starting to grasp the basic. When I wrote my own to accomplish this, I put this together, which doesn't work. But I don't know enough to know what I don't know.

View 7 Replies View Related

Find All Occurrence Of Word & Copy Offset Values

Oct 31, 2009

I am writing a program which would look for look for the word " TOTAL" in sheet1 and then assign several values in sheet 2 based on cells offset of address of "TOTAL". This is repeated and down rows of sheet 2. Everything works except that it is giving repeating the first "TOTAL" address; i.e. it doesn't seem to go to the next met criterion.

Sheets("Summary").Range("A1").FormulaR1C1 = "=COUNTIF(Sheet1!C,""TOTAL"")" ....

View 7 Replies View Related

Macro Run Copy Text From Active Cell And Find That Value In Another Sheet

Dec 16, 2008

I would like to create macro, where it would on macro run copy text from active cell and find that value in another sheet (in column H) and select that cell.

What I did is this:

View 5 Replies View Related

Macro - Find Text And Copy / Paste Cell Below - Loop In Row

Nov 5, 2013

Let's say sheet - "delivery" - has a row1 that includes all possible delivery days. So A1 is 1.9.2013, B1 is 15.9.2013, C1 is 1.10.2013 and so on.

I want to make a macro, that will gradually go through whole row 3 in sheet "delivery" and look for "A1" date in sheet "Orders". Sheet "orders" have for example in column B the date of delivery, and in column C product of the delivery.

I want the macro to find all deliveries with "A1" date, and paste all products that will be delivered on this day under cell A1 (sheet delivery). then move on to the cell B1 (sheet delivery) - find all orders in sheet orders, that will be delivered on B1 date, and list all products with this delivery date under cell B1 (sheet delivery).

Example:

Sheet order
A
B
C

Date of delivery
Product

1.9.2013
orange

[Code] ........

Unfortunately simple Pivot table is not able to do this simple list.

View 3 Replies View Related

Macro To Find Last Row In Column B And Text To Next Column

Sep 3, 2013

I have a macro that copies data from one sheet to another. I would like getting the macro to figure last row used in column B from B3 on and put the word Sum below it. For example, if last row used is B64, on B65 would like the word sum on it.

I cannot just input in as the number of rows could change when macro is run. Data is dynamic.

Here is simple code I have:

Sub Weight()
Sheets("Final Month").Select
Range("A2:B1055").Select
Selection.Copy
Sheets("Final Weight").Select

[Code] ...........

View 2 Replies View Related

Find Match In Column & Offset For Return Value

Sep 2, 2007

i tried using the lookup but it gave a different result. i want to search a value from sheet1 A to sheet2 A and copy the remarks from sheet2 B and paste it to sheet 1 B and if not found leave it blank.

here's the attach file i just trim it down.

View 5 Replies View Related

Setup A Macro To Copy Text From A Column Of Cells To Another Column

May 22, 2008

I have been working with a few people on here to setup a macro to copy text from a column of cells to another column and then print this in to a text document but it seams to have got stuck in a loop ....

View 9 Replies View Related

Find Rows W/same Value In Column A And B And Offset Column C To Next Available Column

Aug 3, 2006

I need to combine rows that have the same value in column a and column b to the same row by offsetting column c to the next available column. For example, I would like the first 6 rows of the provided sample to appear like this.

0014B22<@44>Soil Properties and Qualities<@44>Soil Properties and Qualities<@44>Soil Properties and Qualities
0014B23<@28>Coursey<@28>Ogles<@28>Shelocta

Sometimes the values are the same in column c, sometimes they are different. I do not want to delete duplicate rows where they are the same. Sometimes there are 2 rows that have the same values in column a and column b, other times there may be 3 or even 4 rows with the same values in column a and column b. Regardless, I would like the values in column c combined on the same row in the next available column. It would be nice if the duplicate column a and column b rows (with a null column c cell) were then removed, but I could do that in the next step.

0014B22<@44>Soil Properties and Qualities
0014B22<@44>Soil Properties and Qualities
0014B22<@44>Soil Properties and Qualities
0014B23<@28>Coursey
0014B23<@28>Ogles
0014B23<@28>Shelocta
0014B24<@33><i>Available water capacity:<p> High (about 11.5 inches)
0014B24<@33><i>Available water capacity:<p> Very low (about 2.9 inches)
0014B24<@33><i>Available water capacity:<p> High (about 9.0 inches)
0014B25<@33><i>Slowest saturated hydraulic conductivity:<p> Moderately high (about 0.57 in/hr)
0014B25<@33><i>Slowest saturated hydraulic conductivity:<p> High (about 1.98 in/hr)
0014B25<@33><i>Slowest saturated hydraulic conductivity:<p> Moderately high (about 0.57 in/hr)
0014B26<@33><i>Depth class:<p> Very deep (more than 60 inches)
0014B26<@33><i>Depth class:<p> Very deep (more than 60 inches)
0014B26<@33><i>Depth class:<p> Very deep (more than 60 inches)
0014B27<@33><i>Depth to root-restrictive feature:<p> More than 60 inches
0014B27<@33><i>Depth to root-restrictive feature:<p> More than 60 inches..............

View 9 Replies View Related

Find Text/Value & Use Found Cell, Row, Column In Macro Code

May 10, 2008

I am trying to clean up and simplify my macros by compartmentalizing frequently repeated commands. I like to search for text in column headings and define the cell containing it as a range that I can later use .column or .row commands on, so my macros are a bit more flexible. The code I currently use for this is

Dim XColumn As Range ‘the cell containing the text “X”
Cells.Select
Selection.Find(What:="X", After:=ActiveCell, LookIn:=xlFormulas, _
LookAt:=xlPart, SearchOrder:=xlByRows, SearchDirection:=xlNext, _
MatchCase:=False, SearchFormat:=False).Activate
Set XColumn = ActiveCell

I would like to be able to create a Macro (possibly name FindSetCell()) that will accept arguments and achieve the results of the above code in other macros
I think the command might look something like FindSetCell(“text to be searched for”,”name of newly Defined Range”) But I have not figured out how to code it

View 2 Replies View Related

Find Value, Offset & Return Offset To TextBox

Nov 1, 2006

- Find a value on a sheet “ORM” in Column G5:G33

-Get the corresponding value of B5:B33 of that cell

-Place that corresponding value in a canned remark: “You have the number 2 in Block, 12, 14, 25 22.

-Place this canned remark in TextBox31

View 9 Replies View Related

Conditional Copy Routine: Macro To Search A Column For A Specific Text String

Oct 5, 2009

I am trying to write a macro to search a column for a specific text string which when found, will copy the whole row the string is in. Once this row has been copied, I then want the macro to activate a new sheet and search for the next available empty row to paste the data. Once this has been done, go back to the original sheet and find the next cell in the original column with the specified text string and repeat until the range has been satisfied. Below is the script I have that sort of works.

View 5 Replies View Related

Macro: Search Down Column & Match Then Offset

Nov 19, 2006

I have created some code to look in a cell to see if the name matches that which has been input in a drop down list on a combo box on an input form and then copy the value of column 10 in the same row. I created a public variable for that name as txtTenant.

What I wanted to do was to then write the code that if the first cell did not match the name selected (txtTenant) that it would then drop down one cell and compare it and keep going down until it finds a match, right down to the end of the column of data if necessary.

My coding is not working - it stays at the first person it finds in the first cell. I am not sure if I should be using For...next loops or loop.....

This is the
Sub FillData()

Application. ScreenUpdating = False

RentRow = 2 'sets the first row as row 2 in the data sheet to copy from
NewRentRow = 7 'seta the row to copy to in txtTenant

View 9 Replies View Related

Find Last Cell In Range, And Changing Another Cell Based On Offset Text

May 4, 2009

If i have a range say E12:O12 and want to find the last cell before blank, lets say it finds m12 as the cell with the value before blank. then with m12 it needs to determine weather row 11 in the same column has Text either "S" or "F" if "S" then m12 = t if "F" then m12 offset(1,-1) = t. And just to make things more difficult i need the range E12:O12 to step 2 as well until it gets to E208:O208 .Noting that row 11 never changes and will always have either an "S" Or an "F"

and also t = time()

View 7 Replies View Related

Using OFFSET Function To Return The Value From Another Cell With Row And Column Offset

May 31, 2014

I am having some difficulties using a combination of IF and the OFFSET function to display a range of cell values from another column based on a simple condition. The values I need to display at the destination cells should be offset by 8 columns to the right and "X" rows down from the reference column. The value "X" is to be determined via the IF function to check for the row index number.

For example, if Index value "X" = 8, then display the value of B2 in cell I9. IF X = "9", display B2 in cell I10 etc.

I have attached a sample worksheet that provides some examples.

View 3 Replies View Related

VBA Search / Replace With Offset 1 Column And Offset 2 Column

Mar 22, 2013

I am trying to work out how to nest offset in a code using search replace. The goal is to find a value from cell A1 (example) and replace the values in the cells next to the cell containing samuel and the cell containing samuel.

A sort of search and remove data tool if you like So for example:

[QUOTE]A1: "samuel" (the search criteria)
Search range is: B1:D400
(for example)
Cell B40 = samuel
C40 = Driver
D40 = year

So, the macro is activated and finds "samuel" in B40 and I would like C40 & D40 replaced with "" The code I'm using is below: (this is just replacing the cell containing the search criteria with "test". I would like to nest offset(0,2) & offset(0,3).Value = ""

Sub Macro1()
Range("B1:D400").Select
Selection.Replace What:=Sheets("Sheet1").Range("A1").Value, Replacement:="test", LookAt:=xlPart, _
SearchOrder:=xlByRows, MatchCase:=False, SearchFormat:=False, _
ReplaceFormat:=False
End Sub

View 2 Replies View Related

VBA - Find Cell Containing Text And Use An Offset Cell Value In Formula

Feb 13, 2014

I'm trying to do a column of individual discount calculations using a discount percentage found in a cell two to the right of a cell containing the text "Total SP:" that is always upwards and to the left of the cell where the formula goes (but could be two rows or could be 20). There are multiple "Total SP:" cells in the sheet - I always want the first one upwards. I have created the following but I get #NAME? where I hope to see the discounted value.

VB:

Dim Discount1 As Double
Discount = Cells.Find(What:="Total SP:", After:=ActiveCell, LookAt:=xlWhole, SearchOrder:=xlByRows, SearchDirection:=xlPrevious, MatchCase:=True).Offset(0, 2)
Range("R9:R" & LastRow).Formula = "=IF(J9>0,$E9*(1-Discount1),0)"

I've just thought, the Cells.Find needs to be redone for each cell where the formula is inserted to ensure it always catches the correct discount and this isn't going to do that - it's going to find it once and always use that single value.

I think this needs a Loop or something and to move the ActiveCell down one after the formula to get it to redo the Cells.Find.

View 1 Replies View Related







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