Modules & VBA :: Text Box To Become Visible Based On Selected Items From List Box 
			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 Replies
  
    
		
ADVERTISEMENT
    	
    	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 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
  
    
	
    	
    	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
  
    
	
    	
    	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 2 Replies
    View Related
  
    
	
    	
    	Aug 8, 2014
        
        We have a navigation page with 5 tabs and several navigation buttons underneath their respective tabs linking to reports.
In the main part of the navigation page we have 17 search parameters (text boxes and combo boxes)that the user can use to sort through all the reports we have in the different tabs.
What we would like to do is to have the label text to change to "red" if one of the 17 fields are "required", remain "black" if it is included in the report but not a mandatory search parameter, or turn "light grey" if that parameter is not included in that report.
For example:
My search parameters are: people, phone, and cars
If I were looking at a report of people that included addresses, phones, etc...name and phone would be required search parameters. However, even though I can search by car, it is not in this particular report and the label text should be greyed out. (If the actual text box could go inactive that would be even better).
I have read about buttons being turned colors based on a drop down box choice, but I have not been able to find anything about using a navigation tab subform button to make the colors change in the main navigation form.
	View 14 Replies
    View Related
  
    
	
    	
    	Nov 23, 2006
        
        Can some one tell me why, on the attached database example, I can select multiple items from list boxes
"TipoCliente" and "FaixaEt" through "frmClientes" form but they are not passed forward to table "tblClientes" ?
Try to onpen attached database example and use form "fmrClientes" and select multiple items at
"TipoCliente" and "FaixaEt" list boxes by entering them with mouse click and Ctrl key pressed .
Select also single item from
"NivEns" Combobox and write anything on "Nome" and "Apelido" fields .
Go to the table "tblClientes" and you can see text fields "Nome" and "Apelido" and also the item "NivEns" from Combobox "NivEns" are all there but not the items you selected from "TipoCliente" and "FaixaEt" list boxes .
What is happenig ?
Lots of thanlks
Miguel
	View 2 Replies
    View Related
  
    
	
    	
    	Nov 27, 2013
        
        I want to limit the results in a query to the selected items on a list box - how do I do this? 
	View 4 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, 2006
        
        I have two forms - Notes and JobLookup
Notes contains a number of text boxes for entering data, one of them being for Job No. Beside it is a link to the form JobLookup. This form contains a simple listbox that lists all the job no. Is it possible to pass the selected job no from this list to the text box on the Notes form? 
Hope this makes sense :)
Michael
	View 3 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
  
    
	
    	
    	Oct 31, 2014
        
        I'm quite new to Acces (2010) . Currently, I'm working on a form in which certain fields are set to invisible. I'd like to toggle fields to visible based on the button clicked.
Example:
Field 1: O No O Yes --> When No is clicked Field 2 (containing a date) becomes visible 
                           --> When Yes is clicked Field 3 and 4 (both yes/no fields) become visible
	View 5 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
  
    
	
    	
    	Sep 10, 2014
        
        Is it possible to have a query that will requery value of a check box based on which check box is selected?  I have a form that has 5 check boxes and a text field for populating a unit price.  When someone clicks a specific check box, the text field should display the unit price.  I know how to accomplish this using a combo box and don't want to change the form to setup for a combo box, but rather use what everyone is currently used to.  I want to add the check box is from 1 table linked to a form and the unit price is from another table not linked to a form.  Both tables have 2 fields in each that will relate.
	View 6 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
  
    
	
    	
    	Aug 12, 2013
        
        I would like passing values from first form until third form.
In the first form I have a list box after selecting items (For each selected item in first form I have 4 values) and pressing button (or right click of mouse) the second form will be open, then in the second form I have 2 option (inserting, deleting), when I select inserting or deleting in the second form, third form will be open, in the third form there is a "OK" button, when I press that, passed values from first form  will be used for inserting or deleting records to the table.
	View 4 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
  
    
	
    	
    	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 4 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
  
    
	
    	
    	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
  
    
	
    	
    	Sep 21, 2004
        
        i want the user to make a selection from one of two option boxes, with the choice that they make i want a list box to appear straight away, depending on there selection, can anyone help please.
Cheers
Andy
	View 6 Replies
    View Related
  
    
	
    	
    	Jul 11, 2013
        
        I am still trying to get a hang of development in access 2010.  
 
I would like to design a form with a listbox or a combobox which holds all 8 of my reports (a table has all the reports), with a Print and a Preview view buttons. In addition, the user must be able to select if they want to view the report by month, quarter and the year in question.
 
How do i have a specific report print or previewed based on the value selected in the listbox or combobox and the date criteria.
	View 4 Replies
    View Related