Modules & VBA :: How To Build A Query Using Form Comboboxes

Sep 9, 2013

I'm making an accounts package.

I've made a graph of revenue by customer but due to the number of customers it's a bit hard to see the customer names.

So I would like to be able to select my own custom group of 5 customers to plot on the graph.

To do this I think I need a query that selects the 5 customers which is populated from 5 comboboxes on a new form that the user can select customer names from but I'm not sure of the VBA that links all this together.

View Replies


ADVERTISEMENT

Modules & VBA :: Build A Form That Contains Buttons Of Certain Value So That Student Clicks On Button

Jul 14, 2015

I have an endpoint for students so they can report any faults in the compound.I want to build a form that contains buttons of a certain value so that a student clicks on the button.Is fed directly to the table and pass to the next form to another value table.

View 7 Replies View Related

Modules & VBA :: Reset Rowsource For Comboboxes

Nov 18, 2014

I have a form with many comboboxes. The comboboxes need to have their original rowsource set to a table in my database. However, when the user selects a value in a combobox, it is programatically fed into a SQL string which serves to populate a subform. This part all works great.

However, I'm trying to reset the comboboxes as well so that options will "narrow down" until only a single option is possible. So far, I have:

Code:
Private Sub cmb_Author_Change()
Dim strSQL As String
strSQL = "SELECT tbl_Records.RecordName, tbl_Records.RecordDistinction, tbl_Records.Title, tbl_Records.Author, " & _
"tbl_Records.ProjectManager, tbl_Records.[Site Name], tbl_Records.ChargeCode,

[Code] ....

GetWhere() is the portion that feeds info from the comboboxes to the Finder string.

The red highlighted bit is the part I'm working on. Obviously, once I figure out the proper syntax, all of the other
comboboxes will be set up the same way.

What's funny is that in testing (all of the data currently input is simple and allows me to select options where I know what the response will be in other boxes), when I change Author and go to use cmb_RecordName, it replies that "the record source 'My Data' specified on this form or report does not exist" (where 'My Data' represents real data).

So, clearly, it is finding the data, just not using it as a record source, but rather believing that the name of the recordsource is the value.

View 9 Replies View Related

Modules & VBA :: Data Validation With Comboboxes

Jan 23, 2015

I have 2 combo boxes on a form. The 2nd box is not visible unless the 1st box is set to a specific value (Illness). Once the specific value is set, the 2nd box appears with appropriate data for selection.

Goal #1:
I would like to have the form checked before it is closed to ensure that if the condition in box 1 is "Illness" then the 2nd box must have a value and can not be null.

Goal #2:
I am also having problems with the 2nd combo being visible when form opens or becomes current. The field is set to visible=false normally but needs to be visible when form opens if the conditions mentioned above are meet (true).

Private Sub Form_Unload()
If IsNull(Me.Incident_Classification) Then
MsgBox "Please select a type of Illness"
Me.Incident_Classification.SetFocus

]Code] .....

View 3 Replies View Related

Modules & VBA :: How To Get GotFocus And LostFocus Of All Comboboxes

Feb 20, 2015

how I can get GotFocus and LostFocus of all comboboxes. See below the three codes (code 1, 2 and 3) that I've change from an example from the internet. But the problem is that the function "InitialiseEvents" is not running in these comboboxes. If I try the code 4 as an example, the function "InitialiseEvents" is running perfectly. I don't understand why I can't get GotFocus and LostFocus? You can to see two attachments:

Afbeelding1: The codes 1, 2 and 3 are running.
Afbeelding2: The codes 1, 2 and 4 are running.

Code 1:

Code:
Private Sub Form_Open(Cancel As Integer)
InitialiseEvents Me
End Sub

Code 2:
Code:

Public Function InitialiseEvents(frm As Access.Form)
Dim ctl As Control
For Each ctl In frm.Controls
With ctl
If .ControlType = acComboBox Then
.OnGotFocus = "=HandleFocus('" & frm.Name & "', '" & .Name & "', 'Got')"

[code]...

View 7 Replies View Related

Modules & VBA :: Build Loop Into A Variable

Jul 19, 2014

I am relatively new to VBA and have this loop (see below) was wondering if it was possible to build it into a variable, so I could call upon it within an IF statement.

Set ctl = Me.listSeeAllAssets
For Each varItem In ctl.ItemsSelected
rs1.AddNew
rs1!AssetNo = ctl.ItemData(varItem)
rs1!DateOfService = Me.DateOfService

[Code] .....

View 7 Replies View Related

Modules & VBA :: Nested Loops With Comboboxes Dependent On Each Other

Jul 8, 2015

I am running an export function from a module1 that contains a loop nested within a second loop. Each loop is running through items in a separate combobox on a single form1. The outside loop goes through combo1 items and the inner loop goes through combo2 items.

My issue is that the value of combo1 determines what items are available in combo2 (values are tied to tables). I can get the combo2 values to update when a user changes the values in combo1 (using requery in the afterupdate property of the combo1). However, I do not want a user to change the values, and the code module1 is ignoring the requery. How to force the combobox to requery through code in a module?

View 8 Replies View Related

Modules & VBA :: Build New SQL Statement Incorporating String?

Aug 28, 2013

I am trying to build a new sql statement for a query using a string from items selected in a list box on a form. I have the string in place and keep getting syntax errors for the new sql statement. The code is below.

strSQL = " SELECT JG_tbl_LMEMP.DEPT_CODE" & _
" FROM JG_tbl_LMEMP" & _
" Group by JG_tbl_LMEMP.DEPT_CODE" & _
" Where JG_tbl_LMEMP.DEPT_Code IN(" & strCriteria & ")"
qdf.SQL = strSQL

View 3 Replies View Related

Modules & VBA :: Build Event - Access Crashing

Jul 9, 2014

I am trying to build an event when I double click a field. As soon as I click on Code Builder, access crashes. It does this with every access database I open.

View 14 Replies View Related

Modules & VBA :: How To Build A Custom Record Delete

Sep 24, 2013

I'd like to override the default behaviour for deleting records in a form.Specifically, I want to build my own custom delete procedure so that when the user presses the Del button, my code fires to complete the deletion of the selected record(s). In order to do that, I'd set Allow Deletions = No for that form. I'd also want to code the KeyDown event for the Del key so that if record(s) are selected, my custom delete code fires, else the default behavior for the Del key happens.I'm primarily interested in how I might code the KeyDown event.

View 12 Replies View Related

Comboboxes In A Form Record...

Jul 20, 2005

Hi,

I'm pretty new to this stuff and I'm having this odd problem:

I've created a tabular form that uses a combobox for each record. The problem is that if I had, say 10 records in the form and I select a value for the combo box of one of the records, all of the combo boxes change to the same value...

Any help would be much appreciated.

TIA

View 2 Replies View Related

Question: Using A Form With ComboBoxes

Dec 19, 2005

Hi,

I have read a few threads about comboBoxes and what-not, but I guess I'm just having trouble relating the answers to my particular problem. I've done a semester of Access at Uni so I'm a little versed in SQL and basica database theory, and am really just after a point in the right direction as to how to accomplish this:

I have a friend who is sort of like a maintenance worker for a number of places around my city. He wants a database made up which allows him to quickly and easily make a report on the day's/week's/month's jobs he has completed.

Basically, the information in the report should be Premise (the particular building the job was done in), Location (the room in the building), Item (the 'thing' that maintenance was done on), Job Type (eg. Repair, replace, purchase etc), Date and Time.

Ok, so that's the information he wants, and here's how he wants to enter it:

He wants some kind of form which contains a drop box (or combo box) full of the various Premises, and once he highlights the Premise, a second drop box branches out (I think this is what's called a cascading drop box? Maybe not...) which allows him to highlight the Location, then a 3rd allows him to select the Item, and finally the Job Type. Once he selects these things, he wants to be able to type in the date and time, and save the information in a Latest Jobs table.

So in the end, he wants to bring up the Latest Jobs table at some point, and make a report from it. But, once he's made the report, he wants to have the Latest Jobs table append to an All Jobs table, and then clear itself ready for the next wave of Jobs.


So that's the situation, thanks for reading if you got this far :P

I'm not expecting a giant solution to the entire problem, I'm just looking for some tips and strategies on how to acheive this, and some elements of Access I should research in order to help.

Thanks a lot,
Liam

View 2 Replies View Related

Needs Help To Build Query

Aug 28, 2007

I have some database with columns 'Number', 'Mfr Name' and 'Mfr Part Number'.
Number - internal catalogue item of a company.
Mfr Name - name of a manufacturer where from we purchase the item
Mfr Part Number - part number of a manufacturer where from we purchase the item
Each item may have one or more Mfr Name & Mfr Part Numbers.
----------------------------------------------------------------------
I need to build a following query:
Input gets part of Mfr Part Number and output is all Mfr Name & Mfr Part Number of match item.

View 6 Replies View Related

Comboboxes And SQL UNION QUERY

May 12, 2005

Hello,
I have set up a form which will be used for filtering reports. I would like to be able to generate a single report and in order to do that I will have to filter three fields.

I am using three combo boxes to achieve this. The three fields I am filtering are as follows: Tenant Name, Building Name, and Unit

The Tenant Name and Building Name work perfectly but I can't get the rowsource for Unit to display any values.

Here is what I have so far:

For the tenant name:
rowsource:
SELECT Tenants.[Tenant Name] FROM Tenants ORDER BY [Tenant Name];

The above displays all the tenants that currently have leases.

Once the Tenant Name is selected the Building combobox is populated with all the buildings leased to the selected tenant (Tenants can lease more than one building). This is achieved by the following:
rowsource:
SELECT distinct Leases.LeaseID, Leases.[buildingName] FROM Leases WHERE (((Leases.Tenant)=[forms]![Lease Offer]![tenantCombo])) UNION select distinct null, null FROM Leases ORDER BY Leases.[buildingName];


This also works perfectly. Only the buildings that are occupied by the tenant are displayed.

Now for my problem. Because, not only can the tenant be holding a lease in more than one building, but they can also have more then one lease in the specific building (ie for a specific Unit number). So what I am trying to do is to have the Unit combobox display only the unit numbers that the selected tenant is leasing in the selected building.

I tried to simply modify the rowsource of building name but it is not working (the combo box is always null).
rowsource:
SELECT distinct Leases.LeaseID, Leases.[Unit] FROM Leases WHERE (((Leases.Tenant)=[forms]![Lease Offer]![tenantCombo]) AND ((Leases.buildingName)=[forms]![Lease Offer]![buildingCombo])) UNION select distinct null, null FROM Leases ORDER BY Leases.[Unit];

So this is where I need help. This is very important to my project because, it is the only way I see being able to filter my report to a single specific lease.



Also, not sure if it will be useful, but I had trouble to get just the first two comboboxes working but I eventually succeeded, so if anyone is interested on how to achieve these to update here is the code:

It is only basically three functions:

'this is the "On Current" even of the form
Private Sub Form_Current()
buildingCombo.Requery
unitCombo.Requery
End Sub

'this is "On Change" event in the the tenant combo box. the building part 'works but the unit combo doesn't. However, I'm pretty sure it is a problem 'with the actual query not the code below
Private Sub tenantCombo_Change()
buildingCombo.Value = Null
unitCombo.Value = Null
buildingCombo.Requery
unitCombo.Requery
End Sub

'this is "On Change" event in the building Combobox, however it is not doing 'anything for me now.
Private Sub buildingCombo_Change()
unitCombo.Value = Null
unitCombo.Requery
End Sub


Thanks in advance for any input you might have.

Eric

View 1 Replies View Related

Form To Build Web Address

Feb 9, 2006

Hi all.

I have been given a simple task, but i have no idea how to do it! I need a form to do the following:

User types in a reference, for example TEST1

We have a standard link along the lines of http://www.testtesttest.com/blaablaa/

We need access to append the "TEST/1" (or whatever the user has entered) to the end of the link, so the result would be:

http://www.testtesttest.com/blaablaa/TEST1

I would be extremely greateful of someone could let me know the best way of getting this done.

Kind Regards
Darren

View 1 Replies View Related

Build A Date In A Query

Oct 7, 2005

How can I build a date in a query that is used for filtering purposes? The data is in the records in two fields - Month and Year. In our query we have an expression that builds a date - DateRange: [Month]/1/[Year] in order to qualify the record with the criteria Between FromDate and ThruDate. DateRange as it is shown here returns a date of 12/30/1899 for all records. DateRange: #[Month]/1/[Year]# is invalid syntax. DateRange: [Month] & "/" & 1 & "/" & [Year] is not recognized as a date.

View 4 Replies View Related

Build Expression For Query

Jul 5, 2006

Hi all, I have a field that stores software versions as text. The version numbers can be simple (4.0, 5.0) or unknown or more complicated (4.5.200512, etc). The user wants to be able view data in a pivotChart without seeing interim versions- so 4.5.200512 would not show up but its data would be counted as part of 4.5. Anybody know how I can do this?
thanx

View 1 Replies View Related

Help Needed To Build My Query!!!

Oct 26, 2006

Hi everybody,

Let's say that I've got the following tables:
- tblCustomers(IDCust,NameCust)
- tblEmployees(IDEmpl,NameEmpl)
- tblProjects(IDProj,IDCust,IDEmpl,Duration)

My query:
SELECT tblCustomers.NameCust, tblProjects.IDProj, tblProjects.Duration, tblEmployees.NameEmpl, Sum(tblProjects.Duration) AS SumOfDuration
FROM (tblProjects INNER JOIN tblEmployees ON tblProjects.IDEmpl = tblEmployees.IDEmpl) INNER JOIN tblCustomers ON tblProjects.IDCust = tblCustomers.IDCust
GROUP BY tblCustomers.NameCust, tblProjects.IDProj, tblProjects.Duration, tblEmployees.NameEmpl
ORDER BY tblCustomers.NameCust;

What I'd like get when running my query is:

NameCust ------ IDProj - Duration ----- NameEmpl ------- ?????????
CUST1 ---------- 1 ------ 3 ------------ EMPL3 ---------- 7
CUST1 ---------- 2 ----- 10 ------------ EMPL4 --------- 10
CUST1 ---------- 9 ------ 2 ------------ EMPL3 ---------- 7
CUST1 --------- 11 ------ 2 ------------ EMPL3 ---------- 7
CUST1 --------- 13 ------ 8 ------------ EMPL1 ---------- 9
CUST1 --------- 18 ------ 1 ------------ EMPL1 ---------- 9
CUST2 ---------- 3 ----- 20 ------------ EMPL1 --------- 20
CUST2 ---------- 4 ----- 12 ------------ EMPL3 --------- 17
CUST2 ---------- 5 ------ 3 ------------ EMPL2 ---------- 4
CUST2 --------- 10 ------ 5 ------------ EMPL3 --------- 17
CUST2 --------- 17 ------ 1 ------------ EMPL2 ---------- 4
CUST3 ---------- 6 ----- 25 ------------ EMPL4 --------- 27
CUST3 --------- 14 ------ 2 ------------ EMPL1 --------- 14
CUST3 --------- 15 ------ 2 ------------ EMPL4 --------- 27
CUST3 --------- 16 ----- 12 ------------ EMPL1 --------- 14
CUST3 --------- 19 ------ 2 ------------ EMPL2 ---------- 2

where ???????? (manually done) = the sum of the Employee duration for ONE Customer !!!

But what I get instead:

NameCust ------ IDProj - Duration ----- NameEmpl ------- SumOfDuration
CUST1 ---------- 1 ------ 3 ------------ EMPL3 ---------- 3
CUST1 ---------- 2 ----- 10 ------------ EMPL4 --------- 10
CUST1 ---------- 9 ------ 2 ------------ EMPL3 ---------- 2
CUST1 --------- 11 ------ 2 ------------ EMPL3 ---------- 2
CUST1 --------- 13 ------ 8 ------------ EMPL1 ---------- 8
CUST1 --------- 18 ------ 1 ------------ EMPL1 ---------- 1
CUST2 ---------- 3 ----- 20 ------------ EMPL1 --------- 20
CUST2 ---------- 4 ----- 12 ------------ EMPL3 --------- 12
CUST2 ---------- 5 ------ 3 ------------ EMPL2 ---------- 3
CUST2 --------- 10 ------ 5 ------------ EMPL3 ---------- 5
CUST2 --------- 17 ------ 1 ------------ EMPL2 ---------- 1
CUST3 ---------- 6 ----- 25 ------------ EMPL4 --------- 25
CUST3 --------- 14 ------ 2 ------------ EMPL1 ---------- 2
CUST3 --------- 15 ------ 2 ------------ EMPL4 ---------- 2
CUST3 --------- 16 ----- 12 ------------ EMPL1 --------- 12
CUST3 --------- 19 ------ 2 ------------ EMPL2 ---------- 2

Any suggestion to build this Query ??
Thanks in advance

View 3 Replies View Related

Help Me Build Simple SQL Query!

Feb 11, 2006

(Dear Admin, don't be mad I posted this post elsewhere but had no luck with answers)

Please guys, I just forgot how to do this:

I have a table with primary key (id) and sort of secondary key (id1). Several rows can have same id1.

id id1
1 1
2 1
3 1
4 1
5 3
6 3
7 4
8 4
9 4
...


I need to count the id1 - how many different id1 values are there.

This doesn't work:
SELECT COUNT(id1) FROM table GROUP BY id1
this also doesn't work:
SELECT COUNT(id1) FROM table

As I recall, it was something about DISTINCT function or something like that...?

Please help, I'm sure it's totally simple, but I'm stuck.

View 4 Replies View Related

How Would I Build This Query? Where/MAX Dates

Mar 21, 2006

select student from tbl_TableName where max(date_borrowed) <= dateadd("d",-730,Date())
group by student



??? How do I set this up? and do the max date_borrowed?

Thanks.

View 2 Replies View Related

Dummy- How To Build A Fast Form

Mar 17, 2006

Hi, I'm new to Access.
I'm trying to do a very simple thing but I can't.
Let's say I sell a lot of cars, every day so I need a database only to collect info about selling. I need a table (SoldCars) which need refers (read: field) to 2 other tables: 1.Constructor and 2.Model, or only to Model (because Construvctor could be redundant). Anyway, when I register a new sold car, I want a menu in which I can find a Model but not after having chosne the Constructor, so when I choose "Ferrari" then I can only find "Testarossa" and "GTO" and choose one of them. Stored field can be Model, because Constructor is implicit. But I need this tip because let's say I sell thousands of cars per day and I want it to be very quick. Please help or I'll die under piles of cars!
Thanks!!!!

View 2 Replies View Related

Forms :: Creating Advanced Form With Comboboxes

Aug 4, 2013

So, I have a form with 4 combo boxes and 1 field for a date.

I'd like to be able to choose an option from one or more comboboxes and create a report of all of the records matching those criteria.

Will this require VBA Coding or can I do this without it? I don't know VBA

I know I will probably have to use Queries and the Like criteria but I'm not sure where to begin and how to do it.

View 1 Replies View Related

Build A Dimensional Fieldname In A Query

Feb 20, 2008

As example, I have a table with an Item number, introduction year and a number of historical and future Sales periods set per year, these sales columns are listed Y1990, Y1991, Y1992....... Y2015.

Based on each items introduction year, I want to list the first 5 years of sales.

I wanted to create a dimensional fieldname eg: FirstYear: "Y"&[introduction year] to get the value of that respective year. (I currently just get a text saying "Y1995", and not the content )

Any help is appreciated!:)


(Note: I can't transpose the data in the tables for other reason)

View 3 Replies View Related

General :: Query To Build Labels For Nametags

Jan 14, 2013

Currently, I use ACCESS to track reservations for various types of events. When I want to make nametags, I download the "attendee" query that I've already set up to EXCEL and then merge into a WORD document. Is there a way to set up in ACCESS so the labels can be printed straight from the database? I've tried, but I can't get the labels to space out properly (EX: 2 across and 6 down) even though I put the correct label # in there.

View 4 Replies View Related

Build A Query In Order To Exclude Some Records

Jul 1, 2014

I have a difficult problem (because of my own capabilities). I have a table (tblFoods) which includes a number of food with their analyzes. I have a second table (tblExclusiveFoods) which is connected with a third table (tblCustomers) with one-to-many relation. Namely, o tblCustomers is the "One" and tblExclusiveFoods is the "Many".

Into table tblExclusiveFoods there is a field that acts like a ComboBox and gets data from the tblFoods such as drop-down-menu. So, using the combo box i can select the foodID from tblFoods and then showing into exFood field which is a part of the tblExclusiveFoods fields. When i collect the foodID's from the tblFoods, i would like to to build a query which will exclude these foods from the tblFoods.

View 10 Replies View Related

Forms :: Multiple Checkboxes In A Form To Build A String?

Mar 18, 2015

From a dropdown field in the form it's currently possible to choose a geographical region for which to generate a report. The data populating this dropdown is pulled in from a Value List as follows:

" ";"*";1;2;3;4;5;6;7;8;9;10;11;12;13;EU;WD

I now need the ability to choose various different regions simultaneously which is not possible with the current method. I've looked into a nested continuous form and a multi-select combo box or list box, but none of these are as user friendly as my preferred method.

What I would like is 15 checkboxes plus a 16th to select/unselect all. When any of these checkboxes is checked, I need to create something like a dynamic value string or temporary table to hold the list of chosen regions until the generate button is clicked at which point the data is used to generate the report and cleared. I also need a piece of code to check/uncheck all the boxes.

View 3 Replies View Related







Copyrights 2005-15 www.BigResource.com, All rights reserved