Modules & VBA :: Update Table Based On List Box Multi Selected Records
			Nov 24, 2014
				I have database with an userform called AssignWP, combobox called WPDevBy, listbox called List352 (Multi select) and table called Justified.I am trying to update one field WPDevelopedBy of the table as combobox value based on list box multi selected records.
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Oct 13, 2014
        
        I have the code below and am trying to have a form allow Text Box to become visible based on selected items from a List box. Why I am getting the error listed?
Compile Error: Invalid Qualifier
Code:
Private Sub specific_opt_Click()
Dim users As Control
Dim ctrler As String
Dim xx As Long
If Me.specific_opt = True Then GoTo 169
[Code] ....
	View 8 Replies
    View Related
  
    
	
    	
    	Mar 5, 2015
        
        I have a datasheet subform where i need to select some records by clicking a check box and update a certain field/s of only those selected records.
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 19, 2014
        
        Im trying to delete values from a table based on the selected values of a listbox. The listbox values have a hidden column which related to the ID on the table to which I am trying to delete from (if that makes sense).
 
If I use the following code:
 
Code:
    Set ctl = Me.Results_listbox
    For Each varItem In ctl.ItemSelected
    CurrentDb.Execute "Delete * FROM Table1 WHERE Table1.ID = " & ctl.ItemData(varItem)
    Next varItem
I get an error stating Object doesn't support this property or method.
	View 7 Replies
    View Related
  
    
	
    	
    	Nov 20, 2006
        
        Hi, 
I have a form with 1 List Box.  This list box contains the names(SSN, Department, Status) of the columns in TableA.  
The question is, can I create just ONE query statement, and base the GROUP BY on whichever field the user selects?
For example, if a user choose Department, then the query will group by Department.  I know how do this by the long way; meaning I create 3 separate for each,(qrySSN, qryDepartment, qryStatus) and if say the user select SSN, it will open the qrySSN query. This is way too much maintenance.  I have a feeling there is a much easier way.  Please advice. 
Thank you. 
Joe
	View 3 Replies
    View Related
  
    
	
    	
    	Dec 8, 2014
        
        I have a table with a primary key as date, and various other fields with numerical values. I also have a query that calculates running totals for each of these fields, as well as including the fields from the table.
  
I need to create a report or form in which I can select a date(primary key) from a drop down list.
 
I need the selected date to determine a row/value from a field (a running total from the query)
 
I then need to use that value in a formula;
 
result = sum([field]) - value
 
What I am trying to do is calculate the difference between the sum of a field, and a specific row/value in a calculated field containing a running total of the original field.
	View 10 Replies
    View Related
  
    
	
    	
    	Dec 4, 2014
        
        I have 2 tables, one is like a main table, containing all of the main data, such as a Job Number, Customer, Quantity, etc. I have a second, related, table that acts a breakdown of information. There may be several related records to one main record, it entirely depends on the nature of the job.
 
What I'd like to do is run a function that looks at a main record, checks if all the related records COMPLETED field is ticked and then tick a field in the main record. I only want it to do this for records where all of the related records are COMPLETED.
	View 3 Replies
    View Related
  
    
	
    	
    	Apr 10, 2008
        
        Hi everyone.  Apologies if this has come up before, but the search terms I've tried here and on google keep turning up the wrong information.
At work I manage a large database with many tables.  It stores data for participants in a research study.  Each table stores the data for a different test, so one participant may have multiple records.  Primary keys for these tables are defined by a combination of the participant and date of test fields.  (Everything is dependent upon a table that stores the static info for participants, so the database is normalized.)
I want to be able to make a table that lists target participants and dates, and then create a query that looks at this table and pulls all the available data from various tables for those individuals that was recorded within one year of the target dates.
I've successfully made queries that meet these criteria while pulling data from only one table.  The problem I'm having is that when I try to pull from multiple tables, each with it's own date field that needs to be used as a criterion, I end up excluding almost all the data, because most of the target participants do not have all the requested data within the target dates.
I've tried being inclusive with my criteria (using ORs), but then I end up with tons of data that I don't want and I need to filter through it, which defeats the purpose of the query.
Any advice on handling this issue, or do I basically just need to create a separate query for each table?
I'm sorry if this is too vague, but it's illegal for me to upload any of my own dataset.  I could probably come up with an example if it's helpful, though.
Thanks!
	View 7 Replies
    View Related
  
    
	
    	
    	Nov 21, 2013
        
        Upon the results which populate my list box what I am trying to do is allow the user to select various values from the list box and then hit a button which deletes the values from the table. My code is currently:
 
Code:
Private Sub Del_TsCorrection_tbox_Click()
Dim lngID As Long
Dim strSQL As String
[code]...
But it doesn't delete, infact it doesn't do anything. The list box values are still in the list box and if I look in the table they are still there also.
	View 10 Replies
    View Related
  
    
	
    	
    	Mar 31, 2008
        
        I have a combobox that selects the customer and shows related information on that customer such as phone number, cc#, etc..
now the trick is i need to allow the selected member to be added to the order information. 
For instance, the user selects the customer "Bob" and bobs information is displayed to check for accuracy. After the info is approved the user will continue to process his order. In order to do this I need the customer ID to be the same as the selected customer in the combobox.
Then the user will proceed to fill out the order information, location, date, time, etc. 
How can I go about doing this?
Thanks in advance 
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 24, 2015
        
         I'm trying to use VBA to update a new column in a table with info I already have in another table.The table I want to update is an inventory details table, it has around 25,000 records. I added a column called "UnitCost", of course the column is empty for all 25,000 records so I would like to fill it easily using DoCmd.RunSQL "UPDATE" feature.
I use that through-out the program however I'm unable to connect the dots for this one.What it needs to do is update "UnitCost" in "InventoryDetails" from "Products" where "InventoryDetails.ProductNumber" = "Products.ProductNumber"
The "Products" table has all the different unit cost, it just need to be placed in the "InventoryDetails" table for every record. Of course product1 needs products1 unit cost and product2 needs products2 unit cost, etc.
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 12, 2006
        
        I have a form that our operators use to do their hourly quality audits on.  This is getting to be a huge burden on them because right now, they enter the date, the week ending date, the month every time they have to do an entry, and for me it is a nightmare because they can still enter the wrong information.  So, what I was wondering is if there is a way that I can have them select the date from a combo box (easy enough), but from that, have the week ending date and the month fields automatically update as well.  Any advice?  I would really appreciate it!  Thanks so much!!!!
	View 3 Replies
    View Related
  
    
	
    	
    	Nov 16, 2013
        
        I have a table 'table1' which has various field including an ID field and a yes/no field. I then have a form based on a query originally derived from data in the original table. The form provides a list with some ID's with a yes and some with a no.
 
I'm trying to write a button code to convert all the no's into yes' for those ID's picked out by the query.
 
I've searched lots of sites and get that I need to set recordsets for both table1 and the forms' query but all my efforts crash or give an error. 
 
I am looking for the right way to say .." for each ID in form set the yes/no field corresponding to the same ID in table1 to yes"
 
I'd attach my version ....
	View 2 Replies
    View Related
  
    
	
    	
    	Feb 7, 2014
        
        I have a table InvPrice and Updated Pricing
Need to delete all records from InvPrice that Match UpdatedPricing
InvPrice.StockCode = UpdatedPricing.StockCode
InvPrice.PriceCode = UpdatedPricing.StockCode
I have tried something like this...
 Dim dbs As DAO.Database, sql As String, rCount As Integer
 Set dbs = CurrentDb
sql = "DELETE * dbo_InvPrice Inner Join (dbo_InvPrice Inner Join UpdatedPricing on dbo_InvPrice.StockCode = UpdatedPricing.StockCode ) ON on dbo_INvPrice.PriceCode = UpdatedPricing.PriceCode "
dbs.Execute sql, dbFailOnError
	View 14 Replies
    View Related
  
    
	
    	
    	Dec 11, 2014
        
        I'm selecting multiple records from a list, now I would like to export these selected records to excel.How do I do this?
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 30, 2014
        
        I am new to VBA and I'm trying to write a query that will update a table with dates based on user input. For example a user will run data each Monday and that date will be day01. The date table has 28 days total and I need each day row to update with the next date i.e. day01 is 12/30, day02 is 12/31, day03 is 1/01 etc..I am having issues just running the update the query. I get a too few parameters error message on the strsql statement. There are only two columns in the table, order_day(date column) and date_value(text). I want to update order_day. I also need creating a loop so it knows to go back and add days to the other values. 
Here is what I have:
Code:
Sub Update_Dates()
Dim rs As Recordset
Dim db As Database
Dim lmsg As String
Dim transactiondate As Date
Dim strsql As String
[Code] ....
	View 6 Replies
    View Related
  
    
	
    	
    	Jun 7, 2013
        
        I am trying to update a recordset using VBA based on the max "process instance" from another table.  After the code executes, the field I am updating is still blank.
Code:
Set rs = db.OpenRecordset("myTable", dbOpenDynaset)
  If Not (rs.BOF And rs.EOF) Then
 rs.MoveFirst
 Do Until rs.EOF = True
  emplid = rs![Employee Number]
 
[Code] ....
	View 5 Replies
    View Related
  
    
	
    	
    	Sep 10, 2013
        
        how to get the sum of column 2 of a list box  total bags is in the second column, i only want the total of bags of the ones selected  
I can get the sum of all the boxes  but only want highlighted ones
Public Function SumListBox(sForm As String, _
sCtrl As String, iColumn As Integer) As Variant
Dim frm As Form
[Code]....
	View 1 Replies
    View Related
  
    
	
    	
    	Dec 22, 2014
        
        I would like to export selected records (from list box) to .xls file, also populate the same value to all selected records. The value will be entered on the form once.
I'm attaching a small sample DB, so you can see what I have so far.
The Export function, or the update record functions.
	View 8 Replies
    View Related
  
    
	
    	
    	May 5, 2015
        
        MS Access 2013: I have two database tables as below:
tbl1_MainDB --- It has a field named as "City" where I get huge data for some city names. Sometimes This field may have some unknown/new names which are not listed in our 2nd table ("tbl2_RefrDB")
tbl2_RefrDB --- It's a reference table which has raw names for cities, and then standard names of their city and state in another fields.
Target --- I want to create a VBA prorgram (Sql query) which can look from tbl1_MainDB.[City] to tbl2_RefrDB.[Raw_City] field, and if found then pick the "Standard_State" and "Standard_City" record values from there, and update into the 1st table "tbl1_MainDB".
...if not found in "tbl2_RefrDB" table, then user can be informed & ask for updating the new/unmatched city record as a new record in this table.
Attached sample database for more details.
	View 4 Replies
    View Related
  
    
	
    	
    	Apr 10, 2015
        
        I want to use an array to store data from a list box into a variable. I want it to be able to store one value, or multiple values, depending on what is selected.
Main problem: this list box feeds off a table which has employee names and their e-mails. The list box itself only shows the names, and when I select what I want the array to store is their e-mails, not their names. 
Code:
Dim strNames As String
Dim varItem As Variant
Dim intCount As Integer
For Each varItem In Me.lstNames.ItemsSelected
intCount = intCount + 1
Select Case Len(strNames)
[Code] ....
That code successfully displays the item I selected, but only displays the name. I need to make it look in the table and get me column #2. I also want it to be able to select more than one item at a time.
	View 5 Replies
    View Related
  
    
	
    	
    	Jun 3, 2013
        
        I would like to create a multi-select list box for all the records in an access 2010 form.  
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 11, 2006
        
        Hey all, 
I have a problem with my update query (SQL), 
The situation where it is used: 
The SQL code is as a command on a button on a form. It is used to take the value in the text box(Name: Restock) and update it to the Quantity field in the table. (tblStock)
The problem is that the Update, updates all the records changing all the values in the Column (Quantity) to the value that is in the text box.
I need it to update the record which is displayed in the form not all the records. 
Here is the SQL at the minute. 
DoCmd.RunSQL ("UPDATE tblStock SET Quantity = (Restock) WHERE ItemID = [ItemID]")
Any help would be great. Thanks in advance
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 6, 2006
        
        I have a master table with several pick list columns. One field in particuliar has 3 options(fed from a separate table):
a
b
c
But, the user will have a need to select more than just 'a' for example. they will need to select 'a' and 'b', or 'b' and 'c'....etc
Can this be done in a table within Access?
Thank You,
RRA23
	View 1 Replies
    View Related
  
    
	
    	
    	May 9, 2014
        
        Show me the selected item in a Listbox without looping in the whole list, because my Listbox is multiselect and I want only the item that selected recently.
	View 8 Replies
    View Related
  
    
	
    	
    	Oct 14, 2014
        
        I have a simple listbox (single column, no multi-selection).I want to enable a command button when the user selects an item in the listbox / disable it if no items are selected.I'm using the AfterUpdate event of the listbox, as follows :
 
Code:
Private Sub lstOptions_AfterUpdate()
    Select Case Me.lstOptions.ItemsSelected.Count
        Case 0
            Me.comConfirm.Enabled = False
        Case Else
            Me.comConfirm.Enabled = True
    End Select
End Sub
But when I select an item from the listbox, and debug the code, the Count is always zero? Even though I can see the item selected??
	View 2 Replies
    View Related