I have two macros and I would like to assign them both to one button. How to make a connection between these two codes in VBA?
the macro should first sort the columns: A and B and then compare them. Here are two codes that need to be connected:
I have 2 macros ready and i need to merge it to one to make it run.
First macros will do the calculation and the other is adopted from a website as an sample to display % of process. Now the issue is i don't know how to merge it. Can any one help me to setup this file please. Copy of sample file is attached for your reference.
Calculation Macros:
VB: Sub Premium() Dim ws As Worksheet, ws1 As Worksheet, ws2 As Worksheet Dim cel As Range, cel2 As Range, cel3 As Range, cel4 As Range, found As Range, rng As Range, age As Variant
In Sheet1 --> Emp id, Emp Name and Emp dob having some 'p' rows In Sheet2 --> Emp id, Emp address, Emp Designation and Emp blood group of some 'q' rows
Now, i want in Sheet3 --> Combination of both Sheet1 and Sheet2 data. Note: Emp id in Sheet1 and Sheet2 are same which indicates an unique identifier. I attached a file for your reference..
The company I work for have several templates in the map xlstart. They want that all the macros that are present in these templates can be merged into one template. Is it possible to do that without using VBA?
Because they want a solution that everyone can use without knowing a thing about VBA.
I have 3 different sets of macros and i want to Join them together so i only have to run 1 macro to do all 3. I am not sure how the best way is to do this.
Code 1:
Code: Public Function UserName() UserName = Environ$("UserName") End Function Private Sub RefreshTeamQueryOnWorksheet(worksheetName As String)
I have 4 different workbooks that I want to merge into one workbook. I tried moving the sheets from these workbooks into one workbook but to my surprise all the vba / macros didn't transfer over to the other workbook.
I searched here but all I can find were people that wanted to make a summary workbook or merge workbooks into a worksheet which isn't what i want to do.
I just want to simply merge these workbooks into one workbook without losing all the marco and vba stuff that are in each workbook.
I need to use to prepare for analysis a large set of individual participants' Excel data files collected using a psychological reaction-time experiment (a modified Stroop task). This experiment was created using a program called Superlab by Cedrus, so I posted an inquiry at the Superlab forum [url]. Their tech support suggested I might need to use macros in Excel but couldn't offer further assistance. I'll try to briefly describe (a) our Stroop task, (b) the operations I'm trying to carry out, and (c) the format of the individual Excel files,
Our Stroop task: The participant gets some instructions and practice trials, then a series of stimulus words are presented one word at a time in the center of a computer monitor in one of several colors. Word presentation order is randomized for each participant. The participant must press a key corresponding to the color of each word as quickly as possible. For each keypress (including the spacebar, pressed on instructions screens), the reaction time (in msec) is recorded in their Excel spreadsheet under the 'Reaction Time' variable. The 'Error Code' variable indicates whether the participant pressed the correct (C) or incorrect (E) color key in each trial. There are 8 types of words for a total of 48 trials. (Actually, 4 sets of emotion words and 4 sets of control-animal words, each set composed of 6 words each. The task basically measures how much peoples’ attention is captured by emotionally relevant cues in the environment.)
For each participant's data, I need an efficient way (macros?) to: (1) clean it [i.e. discard or ignore the instruction & practice trials as well as trials where the participant was too impulsive (reaction time < 100 msec), too distracted (rt > 3000 msec), or gave the wrong color response (Error Code= E)] (2) determine whether enough valid trials remain for further analysis (>39 trials), and if so: (3) calculate a mean reaction time score for each of the 8 word types [where denominator for each word type is based on # remaining (non-discarded) trials for that word type] (4) merge each participant's summarized data as single rows in a common spreadsheet (for importation and further analyses in SPSS), like this: --------------------------- ID#...... MeanRTW1.......MeanRTW2...... (etc. for word types 3-8) 101.......1056................2013............... 102.......2148................2594............... 103... ---------------------------
Excel File Format: I've attached a sample file, and here's a simplified overview of a spreadsheet (irrelevant columns and some rows removed). First the ID number is recorded (e.g., 393E), then some unnecessary junk (exp name & date, intro, practice, instructions), then data for the 48 actual trials of interest: ------------------------------------------- ........A...............B..................C.................D............ 1 393E 2 stroop.xpt 3 Wed Jan 1, 12:33:00 2008 4 5 6 Trial Name.....Trial No..... Error Code.....ReactionTime 7 introduction..... 1................C............561243 8 practice.......... 2................C............... 2062 9 red-worried........14.............C................1001 (*the first practice trial) 10 (9 more practice trial rows, deleted here) 19 instructions........3..............C................5000 20 red-chicken......19..............E............... 1205 21 blue-tense.......32...............C.................782 * (46 more actual trial rows, deleted here) --------------------------------------------------
To clarify: -The variable 'Trial Name' indicates nominally what stimulus was presented for each trial. -The variable 'Trial No.', indicates the unique numerical marker for each stimulus word. (It probably should have been labeled 'Word Type'. It doesn't reflect the order of stimulus presentation. E.g., the word "tense" is always 'Trial No.' 32 for all participants, regardless of when it presents.) -A subset of actual trial words (e.g., worried) were also used for the 10 practice trials. Thus, the 10 practice trials must first somehow be discarded or flagged to be ignored before calculating average reaction times for the remaining 48 actual trials.
I have an Excel 2003 program that contains macros. One of the macros hides certain command bars and disables the worksheet menu bar. On close the opposite is true. The problem is, if a user uses the disable macros when opening then the worksheet menu bar and other command bars are still available. I would like to hide all of the data sheets and display another sheet that would normally be hidden displaying a message that the macros have to be enabled for the program to work correctly if disable macros is chosen. When the enable macros are used I would like the Error page to be hidden.
I have a user that keeps a maintenance log in an Excel worksheet and sends an updated copy once a week to a board member. Two weeks ago, the board member started complaining that he was prompted to enable/disable macros on opening and became worried when my user stated that no macros were used in the book. He is now concerned that we have sent him a virus.
I know the file is clean because I've scanned it, and when I look at the file in VB, there are no modules or classes present just the Sheets 1-3 and the ThisWorkbook file. None of these objects have any code in them. My user does have some macros in PERSONAL.XLS but they are not used in the workbook in question.
No one else gets the prompt for enabling/disabling macros. Even if I set my security to prompt for any macros, I get no message. I'm convinced that there must be some setting in his Excel that is causing this individual to get this message. Is there anything else other than a macro that would cause this?
Is there a way to hide a macro from the list where you choose which to run, but not in the VBA editor? The userbox I just created calls upon 2 different macros, and has a macro to bring up the userbox. I need a way to hide the macros in Module3 from selection, but keep the macros in Module4 available to choose to run.
I have two macros. Macros 1 opens another excel file, counts the number of rows it has, inserts that number of rows into the master file and then copies the data over. Key code as follows (x3 for 3 worksheets)... For k = 1 To numrows Selection.EntireRow.Insert Next k
Macros 2 'cleans' the appended data by systematically going through each row, checking if certain cells have data, and if not deletes the rows. Key code as follows (x3 for 3 worksheets)...
For l = lastrow To 12 Step -1 If WorksheetFunction.CountA(Range("B" & l & ":C" & l)) = 0 Then Rows(l & ":" & l).Select Selection.Delete Shift:=xlUp edelrows = edelrows + 1 End If Next l
Here's the weirdness. macros 1 runs fairly quick the first time out (few seconds). Macros 2 takes about 2 minutes to run (which I'm fine with). However, when I run macros 1 AFTER running Macros 2, Macros 1 goes from taking a few seconds to a few minutes.
how to use excel 4 macros. I do not even know where to put them. I have inherited some spreadsheets that have both Xcel 4 Macros and vba macros in them. (Well, I get a warning that I cannot switch them off when I disable macros on opening a workbook). I cannot even find the offending version 4 macros so that I can re-code them in VBA.
I have two columns, which have different length and in which there can be three types of data:
The data also in the first and the second column, so it is an old data.Second is, that the data is in the first column, but not in the second, so it is old, but it was solved.The third type is, when the data is in the second column, but not iin the first, so it is new data.
My task is to regularly update the list (so I have to merge the new and old columns), to see in which conditions the data is, but not to delete any of them (only the recurring, so if it is old, then it must not be listed two times).
I am trying to merge two different databases in the next week. The problem I am running into is the name from 1 database isn't always the same on the other database.
I want to merge Database 1 with Database 2 and create a relationship with them both by using the database 2 internal #. As you can see in my table database 1 has similar names to database 2 but they are not exact. I want to match these names and have the formula on match tell me what the database 2 internal # is. I have also uploaded a sample excel doc with a note in B2.
database1 Herb Chambers Ford of Braintree Herb Chambers Honda of Seekonk Dimmitt St. Petersburg Database 2 matched internal # Database 2 Herb Chambers Ford of Braintree (Dave Dinger Ford) Herb Chambers Honda Of Seekonk (7-FI) Dew Cadillac (Dimmitt of St. Petersburg) Database 2 internal # 15360 15301 25413
How can I merge cells in the same row so when I sort a column (A>Z for example) the contents of the row near the selected one change position as well. I paste a picture for example.
I have a need to merge cells in a row and there to be more than one line of data in the merged cell. I also format it to wrap text. But I found that when doing this with merged cells it won't automatically resize the height of the row to accomodate the wraped text. It can be done manually, but this is a pain.
I have a need to get the data from columns A and B and transfer to C but one line from A and second line from B and this successively until the end of A and B. They will have the same number of lines.
Is there any way that you can combine two worksheets or Excel files, for example: WORKSHEET_1 has columns and values as: firstname lastname city state
WORKSHEET_2 has coulms with NO values as: firstname lastname address city state phone
I want to take the info from WORKSHEET_1 and insert it into WORKSHEET_2 without specifying any columns since WORKSHEET_1 might sometimes have only 1 column and sometimes might have all 5 columns.
The purpose of this is to create a standardized Excel file that I need to import into a Database, however the users might have Excel files without all the columns required therefore I need to "standardize" the worksheet before being imported and have any black values import as NULL into the Database
I have these two formulas in my excel that are being used to "prepare the data from a web query. Basically what I want to do is strip a number such as x.xxxxx to only x.xx and change to dot to a comma so that the end result it will be x,xx. So far i have two formulas: =MID(A1,10,4) and =SUBSTITUTE(A5,CHAR(46),CHAR(44)) and I want merge these (or find a better solution).
I want to do....is...a macro or something....to be like "Hey...were going to match up column information based on the first column, there exists both the same data in both sheets....as you can see in A3 and A2, now, I want to be able to add the information that is in book1, into the "DBL approved", so like...the 2nd row, I want columns B-G to be filled via book 2 because its saying,
"okay, A3 in DBL has the data 00-120-01, but there exists no data next columns over...but oh look, A2 in Book1 does, let's fill in that missing information!" so now it'll fill in the bullet points, brand, segment, etc."
I am a teacher and my department uses Excel for grades. We need to be able to print grade reports for students. We currently use a mail merge to do this, but some teachers are having a hard time with this process. They don't seem to understand using the two programs together.
I've got a workbook with a ton of worksheets in it. Every worksheet has 4 columns a, b, c & d that I want to merge so that column a will be the contents of the 4 cells above seperated by _ so it will become a_b_c_d. not sure if im explaining this right but i think you'll get what i mean. i need to do that for every worksheet in the workbook
For example: I want to sort through a a bunch of textboxes and refer them to certain cells. I know I can have a string "TextBox" and then the looping number "nbr" and merge them into for instance TextBox1. But I can't figure out how to use this as a command. Like
I say reluctantly because it seemed easy enough that I should have been able to locate it in the help file of VBA. Which leads me to believe I do not know how to search effectively in VBA, yet/still.
I have two CSV's which are updated on a regular basis.
CSV Master - contains about 23,000 rows at the moment and will continue to grow.
CSV Master - does have a header row
CSV Master has unique (8 digit) numerical ID's in column A so all unique ID's start at "A2"
CSV Master - contains 31 columns ("A through to and including AE") this is a fixed figure.
---- Then I have ---
CSV Extras - generally contains about 200 rows and its unlikely it will ever be more but is contents are different every time it is used.
CSV Extras - does have a header row
CSV Extras has unique (8 digit) numerical ID's in column "A" so all unique ID's start at "A2" and these ID's are a common denominator with both sheets.
CSV Extras - contains 44 columns (last column is AR) which is a fixed figure,
CSV Extras - columns "B up to and including AE" are all intentionally all blank fields.
--- Hope that explains where I am, this is what I need to do ----
I need to be able to look up the ID's (that are in column A in both CSV's) and create a single CSV. In my mind that is a Vlookup of some sort but I can't get it to work
I want to open CSV Master and then, If the ID exists in CSV Extras then fetch all the data in columns "AF to AR" and add it to the CSV Master.