Modules & VBA :: Combo Box Will Display Specific List Of Items - Form Asking For Parameter
			May 5, 2015
				I have the below code behind a form so that a combo box will display a specific list of items based on the data in another combo box on my form.
I have two copies of this same form for two different departments.  One of the forms works like a dream.  However, when I copy that form, change the name, and update the code as pictured below, the form is asking for a parameter FROM MY ORIGINAL FORM and will not requery the combo box.  I can't figure out why...there is no reference to the original form in my VBA as you can see below.  I tried deleting the form and re-creating it, I tried deleting the code and re-typing it to no avail.  
Private Sub cmboType_AfterUpdate()
Me.cmboAction.RowSource = "SELECT tblStatusList.Status FROM tblStatusList WHERE (((tblStatusList.Department)=[forms]![frmInquiryFraud]![cmboType]));"
End Sub
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Nov 3, 2014
        
        I have code attached to a command button to fill a Combo Box with data from a music collection. A letter of the alphabet is entered into a Text Box then records beginning with that letter are copied from a table, either by Artist or Title. They are saved to a temporary table at which time they are in no particular order. Those records are copied to a further table and saved in alphabetical order. This table is then used to fill the Combo Box.
I used two temporary tables because the records were not displayed in the correct order.  I hoped this might cure it, it did not. The records are in order in the table but not in the Combo Box.
Code:
Private Sub Command68_Click()
'SEARCH AND FILL COMBO BOX
On Error GoTo errTrap
DoCmd.SetWarnings False
DoCmd.RunSQL "DELETE * FROM tempList;"
[Code] .....
	View 3 Replies
    View Related
  
    
	
    	
    	Jan 28, 2014
        
        Essentially I have a form_A with several tab's and then one list control box in each of those tabs. At present if you double click on any item within the control boxes your taken to another form_B with info about that item and when you close that from down again if refreshes form_A.
Is it possible to only refresh the specific list control box that is active instead of refreshing the whole form ?
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 29, 2014
        
        I am using the following code in a textbox (CountryID) to show a country name (CoName) from a table (tblCountry).  If the comboBox (cmbCoName) in current form (frmCountry) has no entry then CountryID remains blank, great. If I use the form to add a new entry then CountryID flashes because it does not recognize the entry. Can I use "or" to add another condition in the IIF statement so that it allows the "not in the combobox list" entry? 
  
Code:
  =IIf(IsNull([txtCoName]),"",DLookUp("CoName","tblCountry","Country_ID = " & [Forms]![frmCountry]![txtCoName]))
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 12, 2005
        
        Hi to all,
I developed a database where I keep all the problems that I face and their solutions along with its category.
Now I want to have a form that when I choose each category, I should have all its records. 
I heard that I should implement this by using a subform but I couldn't manage. With a search at the topics I've seen that I should use a macro but I don't know how to implement it.
Possibly after the lookup field I should have an After Update function but how can I connect it with the subform?
ex. at category "hardware: floppy" i have 2 records and i want to see only these, and when i choose category "hardware: hard disk" to have other 5 records of that category
Help plz?
	View 9 Replies
    View Related
  
    
	
    	
    	Jul 8, 2014
        
        In my Access app, I need to be able to retrieve a specific email by date/time, then take the Subject, the Date received and body of that email and save it to a column in a table.how to do this in Access VBA?
	View 1 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
  
    
	
    	
    	Apr 5, 2015
        
        I have managed to amend records based on the user selecting multiple items in a list box by using the following code.
  
 Set db = CurrentDb()
  Set rs1 = db.OpenRecordset("Usage", dbOpenDynaset, dbAppendOnly)    
    Set ctl = [Forms]![frmsearch]![lstSelector]
[Code].....
  
 what I need to do now, is to loop(I think) through and amend all the records in a populate listbox, with no selections, similar to above, but without selection.
	View 3 Replies
    View Related
  
    
	
    	
    	Jul 8, 2014
        
        I have added a list box to a form with Single Selection mode on. Its purpose is to improve the interface. It contains items that represent all records. Clicking on the list box causes the form to jump to another record.
The problem is following: if I click on the List Box, it clears the selection and nothing is highlighted but it jumps to correct record. When I use standard record selection buttons, it highlights the correct items.
I read the index of selected item from .ListIndex property because Selected() does not work in a Single Selection mode. However, this is read-only property and I cannot use this to highlight the item back from VBA. But when I use Selected() it is not working. I mean when I click again on the same item it's selected. It's weird. I attached a simple database file with this problem.
The second problem is, when using standard record selection buttons, access iterates through all records and then jump to empty one. That is not like a new record. I don't know which event to use to control this situation. I would like to deselect all items, let user enter the data and re-query the List Box with a new record.
	View 3 Replies
    View Related
  
    
	
    	
    	Jun 17, 2015
        
        I have a multiselect listbox and two date fields (StartDate & EndDate) in an Access form.I am trying to add records to the Table through the form on a button click.I select multiple items from the list box and the date range between the start date and end date will be equal to the items selected from listbox.For each item selected from the list box I need to add a separate record with a date.So the first record will have List box item selected1 and the start date.Next record will have item 2 from list box and date as dateadd("d",startdate,1)And final record will have last item selected from the listbox and date as enddate.
	View 5 Replies
    View Related
  
    
	
    	
    	Aug 6, 2013
        
        I want to display the text from one combo in a text box in another form based on what's selected in a second combo box. The text box is in a different form from the combo boxes. 
Sub D_ComponentTypeCmb_Change()
    If Me.D_ComponentNameCmb.Value = "Customise" Then
        Forms!CustomComponentF!C_ComponentTxt.Value = Me.D_ComponentTypeCmb
    Else
        Forms!CustomComponentF!C_ComponentTxt.Value = ""
    End If
End Sub
	View 13 Replies
    View Related
  
    
	
    	
    	May 28, 2014
        
        In appendix is .mdb file with this thema.
Inside you can find one form with listbox (with multi selecting ability).
I use this code :
    Dim strSQL      As String
    Dim i           As Variant
With Me.se1
For Each i In .ItemsSelected
    SQL = "DELETE '*' FROM [t1] WHERE [id] = " & .ItemData(i) & " ;"
    CurrentDb.Execute (SQL)
Next
End With
Me.se1.Requery
Result is this one :
1) If I delete only one item in list, it is ok. I can do it again and again and it is working fine.
BUT
2) If I delete more items in list at once, it is ok - but if I will try to do it again then there is an error because .ItemData(i) value is Null.
	View 10 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 19, 2015
        
        I have a list box that allows multiple selections [Inventory].  I also have a combo box that has multiple selections [Shows].
Right now, user selects from list box and from a combo box and clicks a button. On button click, the items from the list box are associated with the PK from the combo and stored in a junction table.  This allows me to quickly associate many inventory items to one show.
I realized that there I currently have no way to prevent duplicate Inventory+show records in the junction table besides having a composite key.  This would be fine except no records get inserted into the junction table if there's a duplicate entry.
Ideally, I think that the user should select from the combo box [Shows].  This should narrow down what shows up in the list box [Inventory] in a way that Inventory items already associated with the show are not displayed.
If I have 10 Inventory items and Inventory items 1-5 are already associated with Show 1; after I select the combo box, the list box only displays Inventory items 6-10.
Here's the associated code
Option Compare Database
Option Explicit
Private Sub cmdAddRecords_Click()
  Dim strSQL        As String
  Dim db            As DAO.Database
  Dim rs            As DAO.Recordset
  Dim ctl           As Control
[Code] ....
	View 13 Replies
    View Related
  
    
	
    	
    	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
  
    
	
    	
    	Oct 16, 2014
        
        I have an access project that I am working on and need to be able to select multiple items from a listbox and have the exact selections appear in a textbox on the same form. I have looked around and have not been able to find any code that works.
I have tried: 
Me.user2 = Me.slct_auditor.Column(0, 1)
Me.user3 = Me.slct_auditor.Column(0, 2)
Me.user4 = Me.slct_auditor.Column(0, 3)
Me.user5 = Me.slct_auditor.Column(0, 4)
Me.user6 = Me.slct_auditor.Column(0, 5)
Me.user7 = Me.slct_auditor.Column(0, 6)
Me.user8 = Me.slct_auditor.Column(0, 7)
but when skipping the first item in the listbox it is still passed as into the textbox.
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 11, 2012
        
        Let's assume we have 3 tables:
Order_Category (Order_Category_ID, Order_Type_Name) with 2 records:
1, Minor
2, Major
Order_Type (Order_Category_ID, Order_Type) with 4 records:
1, Book
1, Pencil
2, Car
2, House
Orders (Order_Category_ID, Order_Type, value) with 2 records:
1, NULL, NULL
1, NULL, NULL
2, NULL, NULL
I want to create a Multiple Items form presenting Orders table with two Combo Boxes:
1. A combo box to select Order_Category_ID.
2. A combo box to select Order_Type. When 1 (Minor) is chosen in the first combo box it should show Book and Pencil, when 2 (Major) is chosen it should show Car and House.
Examples in the Internet show how to do it on a 'single row' forms using the RowSource property. I tried to use a query like:
SELECT Order_Type
  FROM Order_Type
 INNER JOIN Orders ON Order_Type.Order_Category_ID = Orders.Order_Category_ID
 WHERE Order_Category_ID = [comboBoxOrderCategoryID]
But it sets same values for all records in the Multiple Items form and it should return different values in each rows based on value in the first combo box (Order_Category_ID).
	View 5 Replies
    View Related
  
    
	
    	
    	Mar 17, 2015
        
        I want to create a combo box on a form where I can choose between 5 company names, and upon my choice, I want a list box or another combo box to display the departments under the company I chose (each company has different departments), and when I choose the department, I want to another combo box to display the limited job titles under that department.
For example: I choose company A > combo box displays the 5 departments under company A (dept.1,2,3,4) I choose dept. 4 > display job titles under dept. 4
How can I do that? Should I do a table? A query?
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 22, 2014
        
        I have a lengthy CASE statement in my database that displays specific text in a field based on the value of another.  Simple stuff but for some reason it randomly will not work on certain values, and never the same one twice.  Is there a commonly known cause for this?  I have verified that the spelling and spacing etc. are correct in my code so that shouldn't be causing the problem.  
	View 2 Replies
    View Related
  
    
	
    	
    	Feb 20, 2014
        
        I have a list box on an unbound main form, which contains a rowsource consisting of files in a certain folder. The listbox is unbound
when I change an item in a subform, the listbox should update to show different items from the same folder.
Now it is updating correctly, so the rowsource appears to be correct, , but then the listbox behaves strangely - with the first item being sort of permanently selected - or at any rate - strange selection behaviour
out of interest, changed it to a combo box and it works correctly. so there must be some difference between the two?
After investigation, it might be this : [URL] ....
The appearance is similar to what is described in the thread.
although I have played with the strings to get them shorter without getting it work correctly. very strange
if I run the code to update the listbox from the subform, either directly, or by running as sub IN the main form, it produces this strange behaviour. If I run exactly the same code directly IN the main form, it seems to work properly.
	View 14 Replies
    View Related
  
    
	
    	
    	Mar 31, 2005
        
        I have a form that allows the user to "Enter a Parameter Value" that determines the data that will show up
on that form. I'd be pleased to know:
1) How can I display the Parameter Value, choosen by the user, in the form.
2) Consider a form that will display all the students whose name is having Vincent.
   If the user doesn't know the complete name, how can he define the parameter value. I mean in some 
   languages I can use Parameter Value = Vincent* and it will show me all the students whose name includes 
   Vincent. And in Access? How can I do that?
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 31, 2011
        
        i want to do a report that display the data according to a form. for example: in the form i write the name of the company and 2 dates and i click the button and it opens me a report that contains data about this specific company and between those two dates.i thought i could do this with creating queries and when you write in the form it changes the criterias (the criterions) of the queries and the report will be based on the queries.how form can change the criterion of a query. or is there better way to display specific data according to a form.
and i have related question: i did a form that has a sub form (i mean a table in my form) and textbox. i wanted that when you write in the text box, for instance, name of someone the subform display all the rows which contains this name. but i cant connect the textbox to the subform, it only displays the rows that which contains this name but it does it in it own order.
	View 2 Replies
    View Related
  
    
	
    	
    	Feb 4, 2014
        
        I have several comboboxes in my database from which users select values. However, in most cases, I do want to give them the option to add an item that does not appear while simultaneously updating the underlying table which stores those dropdown values. I have made use of the builtin "allow edit list items" feature of Access 2007 but the form always opens on the first record of the form on which they are to add the new item. Is there a way to specify that it should open in Data Entry view apart from using VBA?
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 6, 2015
        
        I have a form with a combo box named 'Venue'. The combo box values comes from a Table with a list of about 200 countries. As of now a user is able to select only one country. However, I want users to be able to select more than one country. 
	View 1 Replies
    View Related
  
    
	
    	
    	Nov 2, 2013
        
        I have a query of "Donations" in a sub form and want to use a combo box to specify all donations having a specific date.is this a job for VBA code? or is there some other way.
	View 3 Replies
    View Related
  
    
	
    	
    	Apr 1, 2013
        
        I have a form and this form shows some values from one table. One of the fields named as Key. I want to open another form and show the record that has the same value as Key.
 
I am able to make this with filter but the form opens and when the user navigates the record, it creates a duplicate value in related table.
 
I want to open form and find specific data to display and then stop at this record.
	View 1 Replies
    View Related