Modules & VBA :: Show Hidden Tabs Based On List Box Column Value
			Mar 30, 2015
				I am designing a contact database for a diocese and the contacts record form is divided into several tabs, some of which are hidden by default.  One of the controls on the form is a listbox (lboRoles), where a user can add one or more roles to contacts.  The listbox has a hidden column that defines the TabIndex for the assigned role, and my goal is to make the associated tab on the form that was previously hidden, to now be visible.
For example, if a contact is assigned the role "Committee Member" and the tabindex value for that role is 3, the form should make the hidden tab (where the page index is also 3) now visible.
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Jul 22, 2014
        
        In open Mainform event
Forms!Mainform.Form!SubForm!controlname.columnhidd  en = false doesn't work. Ms Access can't find "subform"
On load and open events in subform doesn't work with columnhidden. (no reaction)
	View 7 Replies
    View Related
  
    
	
    	
    	May 6, 2013
        
        I'm trying to clean up a form a bit and have it only show certain subforms/graphs if the data exists.   I already have columns in a combobox query to show an "X" for if certain data appears:
 
Now, I know I could build another query and have some system go through and identify these things, but the easiest thing would be to reference the "X" in the columns of the combobox.  Is there an easy way to reference values in the other (non-primary) columns? Or can you think of an easy way to make these subforms only be visible when the data exists?  Maybe have an on load event for the subform?
	View 2 Replies
    View Related
  
    
	
    	
    	Feb 26, 2013
        
        The column in my list-box did not show all the text i save in the table field. is there any limited size for list-box's column to show the data  ?
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 19, 2012
        
        How can I sum the amounts in the list box column and show the total on the main form?
	View 2 Replies
    View Related
  
    
	
    	
    	Nov 30, 2014
        
        I need to input a string into a column named "EventType". The code should first check if the column "Agent Name" contains any strings. If there is none, it will input "IBM Director" into the EventType column.
Once it has looped through the agent names, the code will then loop through the Details column and input into EventTypes based on what is displayed within the string.
These are the codes that I am using to achieve this, however nothing is being input into the EventType column.
Code:
Private Sub Command11_Click()
    Dim dbs As DAO.Database
    Dim rst As DAO.Recordset
 
    Set dbs = CurrentDb
    Set rst = dbs.OpenRecordset("Final")
[Code] ....
I think the problem lies with the code that checks the agent name. When I removed it, it managed to populate the EventType column based on the details. But I still need to find out how to check the agent name too.
	View 4 Replies
    View Related
  
    
	
    	
    	Aug 14, 2013
        
        I'm very new to access so I'm not sure about the correct way to go about this. I have a table with a 'category' column, a form which hides the category column, and a combobox to filter the category, let's say R, C, and F. 
What I want accomplish is to have the value of the comobox applied to the hidden 'category' column when a user enters a new record into the form. 
Is there I way I can get an instance to the record as it's being entered and modify the data using VB? Or would I have to write a sort of pop() function and have it run afterInsert and then modify it that way? Can I even alter the table using VB like this? 
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 26, 2013
        
        I have a table with 3 columns (Col1, Col2, Col3).
I have a record like: Col1=A, Col2=B, Col3=C.
I want to be able to do a sort of DLookup but searching all columns for "C" and returning the name of the coloumn "C" is actually in (Col3). 
 
Is that possible at all?
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 22, 2013
        
        I have the listbox named "payment_date", which shows recordset specified by following code:
Code:
Private sub Form_Current()
Dim que As String
que = "SELECT [date] FROM payments WHERE id Like '" & Me!myid & "*' ORDER BY [date] desc;"
Me.payment_date.RowSource = que
End Sub
I need my listbox to show recordset with record count like this:
3.date
2.date
1.date
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 10, 2013
        
        I would like to get a list of all the users in the active directory and put them in a combo box. How to do this? I would like it to show there CN name
	View 9 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
  
    
	
    	
    	Sep 28, 2012
        
        The user wants all the non-basic functionality of the ribbon hiden. To accomplish that by doing the usual stuff:
 
File >> Options >> Current Database >> Allow Full Menus (unchecked)
 
Everything worked as expected, but we came across an issue. The user needs to open a report in "print preview" and they need to be able to export their report to excel. The "print preview" ribbon tab is there, but it is not showing the "Data" area, where all the export options are.
 
How can I do this without a costume ribbon?
 
Maybe there is a way of manipulating which areas of the ribbon/tabs/areas/controls are enabled from VBA? 
	View 11 Replies
    View Related
  
    
	
    	
    	Jun 29, 2015
        
        I'm attempting to build an import module so that my users can take data from different walks of life and import it into my tables.  I'm doing this by setting up a module and allowing the user to specify which column data will come from when importing data.  So lets say I have a field that is CustomerID in my table and user one pulls data from 1 place and in his excel or csv file, customerid is in field 1.  Another user does the same thing and its in field 2.
How can i make some form of a loop that when I'm attempting to update data, i pull the correct column?
strSQL = "SELECT * FROM tblImportTable"
Set rst = db.OpenRecordset(strSQL, dbOpenDynaset, dbSeeChanges)
With rst
Do While .EOF = False
    If IsNull(DLookup("DefaultValue", "dbo_tblImportTemplateDetails", "Template_ID=" & Forms!frmImport!TemplateName & " AND FieldName='CustomerID'")) Then
[code]....
	View 6 Replies
    View Related
  
    
	
    	
    	Jul 8, 2013
        
        I am looking to generate a total number of a given column based on two criteria.I would like a label (or textbox if necessary) to display a given total of "Active" devices based on a given month.The table name is "Blackberry" and the specific columns I would like to check would be "Activated?" and "Registration Date". I'm not sure if I should be using a dsum or dcount and the error i keep getting is a type mismatch.an active device would have the text value of "Yes.
Dim advalue As Integer
advalue = DCount("[Activated?]", "Blackberry", "[Activated?]=yes" And "[Registration Date] > #01/01/2000#")
lblad.Caption = advalue
	View 5 Replies
    View Related
  
    
	
    	
    	Nov 17, 2014
        
        I have a combox with the following query in its RowSource: SELECT [Error Codes].[ID], [Error Codes].[ErrorCode], [Error Codes].[Active] FROM [Error Codes] ORDER BY [Error Codes].[ErrorCode]; 
I now need to change the query's Rowsource via code and so far I have figured out that this works:
Code  :  Forms![frmAcceptReturn].Form.cmbErrorCodes.RowSource = "Select ID, ErrorCode FROM [Error Codes Missing]"
However, the table "Error Codes Missing" also has a field called "Active" which I need to take into account; If the error code is not active then it should not show up in the combobox.
I know how to do that in the original RowSource, but how do I do it with code?
	View 9 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
  
    
	
    	
    	Apr 3, 2013
        
        How do I select the first column of a multi-column list box (called "List1") for a query.
 
A single column list box works fine.
Code:
 
SELECT Tble_Employee.Emp_No, [forms]![attendee_form]![list1] AS SelectedCourse
FROM Tble_Employee;
	View 6 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
  
    
	
    	
    	Sep 21, 2013
        
        I have a form with 3 tab controls. Within each tab, there is a bound list box that lists records based on a combo box selection. All list boxes are bound to the same table and records in each tab will be in the same order.
Tab1, listbox1:Field1, Field2, Field3, Field4
Tab2, listbox2, Field1,Field2, Field5, Field6
Tab3, listbox3:Field1, Field2, Field7, Field8,Field9
I would like the same record be selected in each list box within the tabs, e.g.  when record #2 is selected on tab1, the same record will be selected on tab2 and tab3, or if I click on tab 2 again and change the selection to record #3, record #3 will be selected on tab1 and tab2.
	View 3 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
  
    
	
    	
    	Jan 2, 2014
        
        I have created listbox with one column (contains one column only), now i would like to display all the characters of list item (want scroll bar to listbox).
How do i display all text of list item, I have already fixed  Column Widths to max length (22";0.1"). However when scrolling to right, it is going to next blank column of list box, which is created only to change Column Widths property.
	View 12 Replies
    View Related
  
    
	
    	
    	Mar 5, 2007
        
        Hi all,
In the organisation that I work for employees get paid every 2 weeks on a Saturday.  So for this financial year the pay period end dates have been 08/07/2006, 22/07/2006, 05/08/2006 etc 
I have a column in an Access table listing various dates.  I want the next column to be 
populated with the next pay period end date after that date.
So if  DATE is 05/07/2006 I want PAY PERIOD END to be 08/07/2006
and if DATE is 09/07/2006 I want PAY PERIOD END to be 22/07/2006 etc 
How do I do this?
Kind Regards,
Matthew
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 24, 2014
        
        I have created a cross tab to extract pipeline and sales for Q1 2014, Q2 2014, Q3 2014 & Q4 2014... the user can select the quater from a multivalued text box...
 
Now for the final output, have created another query which pull the above four quarter in each column from the cross tab...now the problem arises when i change the quarter to Q2 2014, Q3 2014, Q4 2014 & Q1 2014..it gives an error "Microsoft office Access database does not recognizes "Query name" as a valid field name or expression". 
 
The error is because the second layer of query does not identifies Q1 2014.
 
How do i make access change the column automatically when the Q1 changes to Q2...
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 1, 2014
        
        I have a question that involves windows permissions as well as access links.  I have a contacts database split into a front end and a back end. For security reasons I want to place the back end in a folder that is hidden from the users. In other words the users can access the front end as normal and run queries and reports but they are not able to navigate in Windows to the folder containing the back end or view its contents.
 
Is it necessary to use VBA to do this? If so what is the script? If not, how is it done.
	View 4 Replies
    View Related
  
    
	
    	
    	Mar 3, 2015
        
        I'm trying to add hidden information to a record and need to know the best way to do it.
I have a visible table that all users enter data into using a form.
I also have a hidden table that contains 2 fields "linked Table ID" and "notes"
I have a box at the top right of my form which is white (I also have a white background so it's impossible to see).
When you click the box it changes a textbox on my form visible property from false to true.
then I plan to use a separate button that the user currently uses to save a record to store ID number and hidden textbox information in the hidden table but I'm sure how to do this.
Finally I will use a hidden query which will display all the fields from both tables using the linked Table ID from the hidden table and ID field from the non hidden table.
So i have 2 questions:
1 how do I save information the user entered into a form created from one table into a different (hidden) table
2. Is this the right approach to this problem?
	View 3 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