Modules & VBA :: ListBox Identify Selected Item Without Looping In Whole List
			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 Replies
  
    
		
ADVERTISEMENT
    	
    	Jun 12, 2014
        
        I am having trouble with a If statement. I am trying to save a record into a table when an item is Selected (highlighted blue) in a list box. Keep in mind that my listbox is set to multiple selections. I have the following code but sometimes it works and sometimes it doest.
 
The reason why I am trying to get this to work is because when a item is selected I will add it to the table and when an item is deselected I will delete it from a table. See my code and pictures I have attached :
  
Private Sub list_audits_Click()
Dim strsql As String
Dim list As String
Dim id As String
id = Me.User_ID.Value
[Code] ....
	View 2 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
  
    
	
    	
    	Jul 23, 2007
        
        Hi all,
Does anyone know how to get the columns of a listbox selected item and store it to a string? There is no multi-selection so it should be easier. I tried 
s$ = Me.list1.selected but it keeps giving me an error
Thanks alot
	View 3 Replies
    View Related
  
    
	
    	
    	Nov 22, 2013
        
        From a search form example I got from this forum I made the following:
A listBox which shows results as you type, using a query.
This listBox has 1 column, I need it that way.
 
What I need is to show the information from the selected item of the listBox on a textBox, getting this info from the results of the query.
 
I found 2 answers which I don't like:
 1- =DLookUp("[Column]","[Query]") as source of textBox
This shows only information from the first row. So if you select the second result from the listBox, it still shows the first row.
2- =SearchResults.column(int) as source of textbox
It does not work, because listBox has only 1 column. 
	View 4 Replies
    View Related
  
    
	
    	
    	Feb 10, 2014
        
        I've designed access form with one listbox and added 'up' and 'down' buttons to move up and down the selected item in the listbox. i.e from its selected position to one item up when 'up' button clicked and same as one item down when down button is clicked. Any VBA code will do this functionality?
	View 7 Replies
    View Related
  
    
	
    	
    	Sep 2, 2013
        
        I've got a form with a multiselect listbox (extended) that holds a very long list of items (~90,000):
1 | Apple
2 | Orange
3 | Banana
 ...............
35313| Corn cob
...............
The  user can select multiple items (non-sequential) on the listbox, say items 1 and 35313.   I'd like the listbox to  scroll (meaning display) to the currrently selected item, so that the user can see it while being processed. 
I've  seen stuff about property ListIndex, which does exactly that, but it's only useful when you have just ONE item selected (in a multiselect listbox apparently it deselects the rest of the items, so no point in using it, I guess, unless there's more to it!!).
So the key here is how to do the scrolling/display.
The code to loop through the listbox and process each selected item is attached:
Code:
Dim vItem As Variant
Dim Content as String
For Each vItem In Me.lst.ItemsSelected
'scroll to selected item ???
'processing of the selected item
Content = Me.lst.Column(1, vItem)  'copy the content to do sth with it
Me.lst.Selected(vItem) = False       'unselect the current item
Next vItem      'go to next selected item
how to scroll to the currently selected item? Mind that I need to go through the list of selected items to process them for further use (i.e, I need them selected).
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 28, 2003
        
        I have a MS Access database, which contains three main tables. With these I have a completed table, which holds either Yes/No within it.
One of the tables, I have linked to the Completed table as a list box, which when a job has been completed, either yes or no can be selected.
But, what I want to happen, is, when the Yes is selected, I want Access to insert the date the 'Yes' was selected, so that the employee cannot lie about the date the job was completed.
Hope I have explained this in a good enough fashion.
I don't have a clue how to go about it, could anyone help.
	View 6 Replies
    View Related
  
    
	
    	
    	Jun 3, 2013
        
        My list box will be used to populate a form, is it possible that once the item is dble-clicked, it reverts to a different color to let the user know it has already been selected once or can the row be locked once it has been selected?
	View 2 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
  
    
	
    	
    	Jan 30, 2015
        
        In a form, I have a listview control bound to a TreeView control.
By default LV considers "selected" the first item on the list even if it is not highlighted.
In Form is a command button that performs an operation on the item selected, but to prevent accidental activation requires two tests:
1) the list is not empty 
Code:
If LV.ListItems.Count = 0 Then Exit Sub
2) an item is actually highlighted.
How can I make the second test?
	View 3 Replies
    View Related
  
    
	
    	
    	Jul 29, 2013
        
        At the moment I have a query that returns a result based on what's selected in a combobox. 
SELECT ComponentT.ComponentType AS ComponentType
FROM ComponentT
WHERE (((ComponentT.TotalComponent) Like [Forms]![DeviceF]![D_ComponentNameCmb] & "*"));
Instead of this I want to rewrite the query to return a result based on what the user has selected in a list box of items. How would this query look. Would I need to increment it in a loop checking all entries into the list box as it can vary in size and if so how?
I tried changing the last line to WHERE (((ComponentT.TotalComponent) Like [Forms]![DeviceF]![D_OutputLsb].[ItemsSelected] & "*")); which returned a result just not the right one. Is there something wrong with the syntax?
	View 4 Replies
    View Related
  
    
	
    	
    	Jul 8, 2014
        
        code to save data in listbox to a table in vba access
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 26, 2014
        
        I want to double click on one of listbox item and change it without opening any other form. 
	View 6 Replies
    View Related
  
    
	
    	
    	Aug 20, 2013
        
        I have a database where part of it consists of an Item table and a Formula table. There is a many-to-many relationship between them so I created a junction table for this purpose. 
 
Tables
tblItem
tblFormula
tblFormula_Item_JNT
 
There is a column in tblFormula called [Priority] that is a lookup field. It has the values of "High", "Medium", "Low". 
 
So here's what I'm trying to do: I have a query that searches against tblItem for all Items that have a value of No/False for a field called Item_Status. That's simple enough. But I also want to show the Priority of the Formula that the Item belongs to. When I add that to my initial query I get multiple results of the same Item if it belongs to more than one Formula, which I understand. But I really want an Item to show up only once. 
I want the query to go through each Item (based on its Item_ID), look through all the Formulas it's in, and if at least one of those Formulas has a Priority of "High" then it will display "High" in a field (could be a calculated field) in the query results. If there are no "High" Priority Formulas, then look for if there are any "Medium" Priority Formulas, etc. 
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 28, 2014
        
        I have button on my form that uses a selected record in a listbox (non multi-select) to run code that updates a table. The code itself works great so long as there is a record selected in the listbox. If no record is selected an error is thrown. I'd prefer the end user not to ever see that error. If the end user clicks the button and no records are selected, I'd like for nothing to happen at all. I've tried several variations of checking the listbox with an if / then statement to see if records are selected and if so to exit sub, but they all throw errors when no record is selected in the listbox. 
 
Code:
 
If IsNull(Me!lstHeatTreatments) Then
Exit Sub
End If
[Code].....
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 23, 2014
        
        I'm using the following code to clear selected records from a listbox after a button is pressed: 
 
Code:
For i = 0 To lstProducts.ListCount - 1
lstProducts.Selected(i) = False
Next
The code works great except that it leaves the listbox scrolled all the way to the bottom.  What is the best way to scroll back up to the top of the listbox without selecting another record?
	View 3 Replies
    View Related
  
    
	
    	
    	Jul 11, 2014
        
        Save Item in  listbox (Row source type : Value list) to a table in a database .
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 1, 2013
        
        how I can have a shortcut option when right click on each item on the list box.   So I got my answer with below code that opens another form "frmshortcut" with a listbox inside that shows list of options like "new task" , "edit item" .  Now my problem is (like attached picture) the shortcut list (frmshortcut) will be open in another place when I right click the mouse, it is far from location of click.  Also it shows some default in access when I right click in the listbox ("subform", "cut", "copy"), actually I do not like it shows these, just I like it shows shortcut list I have defined by the list box.      
Private Sub ItemList_MouseDown(Button As Integer, Shift As Integer, X As Single, Y As Single)  Const RIGHTBUTTON = 2        If Button = RIGHTBUTTON Then         DoCmd.OpenForm "frmshortcut"         
' DoCmd.OpenForm "frmshortcut", acNormal, , , , acDialog          
Forms!frmshortcut!txtparameter = Me.ItemList.Value      
End If  
End Sub
	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
  
    
	
    	
    	Jan 14, 2014
        
        Access 2007-10
Listbox created: List62 (I know I need to rename it, but for now)
Multi-select: Extended
Row Source Type: Field List
Row Source: qryFieldList
Open Query: qrySelectedFields  (I added primary key to first column, just to have at least one destination field).
 
Goal: to select multiple fields within listbox, click on command button to open query "qrySelectedFields" with selected fields from list box.This is the code I have on the command_click:
 
Dim varItem As Variant
Dim strSQL As String
If Me.List62.ItemsSelected.Count = 0 Then
MsgBox "Please select one or more fields.", vbExclamation, "Healthcare REIT"
Me.List62.SetFocus
End If
[code]....
 
It does absolutely nothing - doesn't add the fields to "qrySelectedFields", doesn't open the query, notta. 
	View 8 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
  
    
	
    	
    	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
  
    
	
    	
    	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
  
    
	
    	
    	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
  
    
	
    	
    	Jun 24, 2015
        
        How can I list the printers installed on the computer in a listbox? The following code list them in a message box, but I need the user to be able to select one to save it in a table. The listbox is called lstListPrinters and the table tblPrinterSelection
Code:
    If Printers.Count > 0 Then
        ' Get count of installed printers.
        strMsg = "Printers installed: " & Printers.Count & vbCrLf & vbCrLf
        ' Enumerate printer system properties.
        For Each prtLoop In Application.Printers
            
[Code] .....
	View 1 Replies
    View Related