Modules & VBA :: Checking Whether Checkboxes Have Been Checked?

Dec 17, 2013

I'm trying to write some simple code to see whether two check boxes (named cbM001 and cbM011) have been checked and if so, then send out an error message. So far I have tried:

If cbM001 Is False And cbM011 Is True Then
MsgBox "M011 cannot be selected unless M001has also been chosen."
Exit Sub

[Code].....

With this I get "Run-time error 424: object require"

View Replies


ADVERTISEMENT

Modules & VBA :: Checking Checkbox (from Multiple Checkboxes) Based On Field Value

Nov 29, 2013

I have a field 'Payment Types' with values (Cash, Cheque, Debit/Credit Card) and a field 'Payment Received' which is Yes/No.

When putting the order through the user selects the payment type and ticks a box if payment has been received.

On a report for delivery drivers, the owner wants it simple for the driver... he wants all the payment types listed with a checkbox next to each one, then wants the appropriate box ticked if payment has been received.

So I need something on the report (or underlying query) which ticks the appropriate box, i.e.

If payment received = true then payment type checkbox = true.

Or should I put the payments into a separate table with both fields so multiple payment types can be marked as paid?

View 6 Replies View Related

Counting Checked Checkboxes In A Report

Nov 1, 2004

I have a report, where some features are listed as checkboxes. I'd like to have all checked checkboxes counted at the end of report. I've created text field. What shuold be the command in it ? (to count only checked boxes).

Thanx for any help

View 1 Replies View Related

Queries :: 2 Checkboxes In A Form - Criteria To Be 00 Or 01 When Cost Checked

Nov 10, 2014

So I have 2 checkboxs in a form. Future cost and LRM cost.

When future cost is checked, I want the criteria in my make table query to be 00, when LRM cost checked, I want the criteria to be 01.

But the problem is when they are both checked I can't get 00 or 01 at the same time.

I have tried different ways but none of them seem to work because with IFF, can only return one value.

I have tried to put the 2 iff in criteria and the or criteria below it exceeds the max time.

The criteria I have right now is:

IIf([Forms]![TPTC Analyzer]![P Future cost]=True And [forms]![TPTC Analyzer]![P LRM cost]=False,"00",
IIf([Forms]![TPTC Analyzer]![P Future cost]=False And [forms]![TPTC Analyzer]![P LRM cost]=True,"01"))

View 14 Replies View Related

Modules & VBA :: Using Check Box On A Form To Filter Out Results From A Table That Is Checked

May 23, 2014

I have kept the names as simple as I can for the example sake to which I can substitute my names in after.

I have a split form - form1, I have a check box on this form - checkbox1 - That I would like to use to make only the checked results from the table - table1 - show and if it is not checked to show all the results. How would I go about doing this? The table field is called field1.

View 6 Replies View Related

Deleting Records That Have Been Checked Or Adding A Record After A Checked Record

Jul 20, 2005

Hi,

I was wondering how to delete records that have been checked (through a checkbox) in a form...

Also, I want to add a record after the record that has been checked. I only want this ability to add records available if only one record is checked. Otherwise, if more than one record is checked, the "Add Record" button would be disabled.

Any help would be much appreciated.

TIA.

View 10 Replies View Related

Modules & VBA :: Checking For Duplicate Records

Jun 29, 2013

What would be the Access 2007 VBA code for checking for duplicate records?

View 14 Replies View Related

Modules & VBA :: Checking Whether Records Are Locked Or Not

Jan 30, 2014

I have a code which cut the data from tables and insert to others. The problem is I don't know when I can do this process (when I will cut data and the same time some users lock editing records then I will get an an error). So my question is, there is some procedure which can check that some records in table are locked or not?

View 6 Replies View Related

Modules & VBA :: Filtering Using Multiple Checkboxes?

May 2, 2014

I'm having a rough time finding information regarding filtering using multiple check boxes that are not part of an option group. I have 4 "sets" of check boxes that can each have multiple selections made.

For example I have:

12 check boxes for each month
6 check boxes for a selection of years
6 check boxes for order types
5 check boxes for order company

I have written code that successfully creates a string depending on what boxes are checked that looks like this.

[Ship month] = "1" OR [Ship month] = "2" OR [Ship month] = "5" AND [Ship Year] = "2013" OR [Ship Year] = "2014" AND [OrderType] = "SO" OR [OrderType] = "SM" AND [Order Company] = "10430" OR [Order Company] = "10440"

The problem is that it does not filter correctly. After playing around with it I found that as long as the entire is using all AND operators or all OR operaters it works fine, but as soon as I mix them it doesn't work.

View 4 Replies View Related

Modules & VBA :: Data Selection And Checkboxes

Sep 13, 2013

We have a small lab database where we insert the results of a water plant test. The results can be either Before treatment or After treatment.

And it can be treated numerous times a year.

I have created form with a drop-down box to select the customer and a button to show reports for the selected customer.

But I also want to add 2 check boxes: a Before treatment and After treatment box. And also add a date range.

So when selecting to view reports our users can select a date range example:

01/01/2013 to 01/10/2013 and a check box so users can select if the results to be displayed are Before or After treatment.

View 1 Replies View Related

Modules & VBA :: Private Sub - Some Checkboxes Are Locked

May 12, 2015

Okay I have a Private Sub on form PlotF:

Code:
Private Sub SetCheck212()
If Me.[Check161] And Me.[Check169] And _
Me.[Check167] And Me.[Check181] And _
Me.[Check261] And Me.[Check189] And _
Me.[Check187] And Me.[Check195] And _
Me.[Check203] And Me.[Check201] Then
Me.Check212 = True

[Code] .....

Some of the checkboxes are locked as I want to force the user to check them on another form (InvoicedF) but I want them to be displayed PlotF as well.

So I want to call the Private Sub from another form. So that the Check212 still automatically checks to true with out PlotF open on the screen.

Is this possible, Do I have to make this private sub a public sub? If so how do I do this?

View 8 Replies View Related

Modules & VBA :: Checking Fields In Multiple Tabs?

Aug 16, 2013

I have a form with mandatory fields highlighted a different colour (yellow or blue). On the form are 3 tab pages with subforms which also have these fields.

I have added a checkbox named incomplete to each tab page and to the form. My intention is to try to write some code to look at each field on the page and if the non-white (ie mandatory) fields all have a value, then the incomplete on that page is changed to no. The code then checks the incomplete value for all 3 pages - if these are all no and the form's mandatory fields are also filled in, then this also becomes no.

When creating reports, I can then find out which records have not been completed and notify the relevant staff. Also if the data is incomplete, they don't want those records appearing in reports - so I can use the incomplete value from the form.

View 4 Replies View Related

Modules & VBA :: Duplicate Checking - Multiple Criteria

Jun 15, 2013

I'm using Access 2013. I want to check duplicate data. I have a form where from insert data into table but before insertion I want check multiple criteria with form. How can I do this

Field are:
BatchID
BillNum
CIH
IH

back end form code is:

Private Sub cmdCheck_Click()
Dim criteria As String
criteria = "[BatchID]=" & Me.cboBatchID & " AND [BillNum]=" & Me.txtBillNum & " AND [CIH]=" & Me.txtCIH & " AND [IH]=" & Me.txtIH & ""

[Code] ....

Finally I'm getting this error: Run Time Error 3075 Syntax Error Missing Operator in qry Expr.

View 3 Replies View Related

Modules & VBA :: DCount - Checking If A Record Exists

Jul 17, 2014

I am trying to check if a record exists, but I keep getting a error!!!

Private Sub Command10_Click()
If DCount("*", "tbl", "[ID] = "") <> 0 Then
MsgBox "This record already exists.
Else
stDocName1 = "McrAddNewRecord"
DoCmd.RunMacro stDocName1
End If
End Sub

View 5 Replies View Related

Modules & VBA :: Checking For Blank Textboxes (Variables)

Mar 2, 2015

I want to check to see if ALL textboxes are blank, then issue a message. My "Select Case" statement and "If" statement does not work. How can I accomplish this ? Below is what I have.

Blank = Null
Select Case Blank
Case strChartOfAccts1,
strChartOfAccts2, strChartOfAccts3, strChartOfAccts4, strChartOfAccts5 & _

[Code] .....

View 5 Replies View Related

Modules & VBA :: Checking For Key Presses In On Click Event

Jul 25, 2014

I have a button on a form and I want the On Click event behind it to check whether Shift is also being pressed when the user clicks the button (or Ctrl, or Alt, in fact any damn key will do).

I can't believe that there isn't a function in VBA like the old 1980s BASIC 'inkey' function (etc) that just simply returns the code of any key being held down at the time of the scan. I shouldn't have to mess around programming other events like KeyDown and KeyUp when I don't particularly need the key-press to trigger an event per se.

View 7 Replies View Related

Modules & VBA :: Spell Checking A Text Box On A Form

Jul 1, 2015

I'm trying to get a spell check to work on a text box on a form. i've got it popping the spell check window after the box has been updated but i'd prefer it to just highlight the errors in red, rather than pop the spell check box. another problem i'm having is when it's finished spell checking the box it moves the form back to the first record. this is the code i'm using.

Code:

Private Sub txt_notes_AfterUpdate()
If Len(Me!txt_notes & "") > 0 Then
DoCmd.SetWarnings False
DoCmd.RunCommand acCmdSpelling
DoCmd.SetWarnings True
Else
Exit Sub
End If
End Sub

View 6 Replies View Related

Modules & VBA :: Checking Null Values In A Field

Jul 10, 2014

The following code doesn't check null condition in Scannedby field. The scannedby has text data type. The code gives me all the data where scandate=20130722 but doesn't check that scanned by can't be blank.

Code:
rs.Open "select count(*) from BatchTBL2 where scandate=20130722 and scannedby <> null", cn, adOpenKeyset, adLockOptimistic
j = rs.fields(0).Value

View 5 Replies View Related

Modules & VBA :: Multi Criteria - Checking For A Value To Be Null

Oct 16, 2014

Me.Text11 = Nz(DAvg("[final whse-in diff]", "dbo_inventory", "[CAFETYPE]=" & Me.Text7 And "isnull(me.[DATE FIXED])=" & True And "isnull(me.DATE_IN)=" & True), 0)

I am getting a type mismatch error with this.

My question is:
1. is the syntax correct....
2. Is my way of checking for a value to be null correct....

View 4 Replies View Related

Modules & VBA :: Concatenating Data From Multiple Checkboxes

Apr 15, 2015

I have 8 checkboxes. Each checkbox has several e-mail addresses as string. Therefore, each checkbox has a string variable declared. I was wondering what should I do when selecting multiple check boxes. This is my code:

Code:
If Me!chkAGDLLA = True Then
Forms!email.lstName = Null
Forms!email.chkComercial = False
Forms!email.chkOperacional = False
strAGDLLA = "email1, email2, email3, email4"
strMail = strAGDLLA & ", " & strISA & ", " & strMAYA & ", " & strSANGER & "," & strSANSE & ", " & strSede & ", " & strGC & ", " & strCSR
MsgBox strMail
End If

Problem is that if I only select chkAGDLLA, then strMail will be "email1, email2, email3, email4, , , , , , ,"

I do not want all those commas, but how to make this work. I was thinking maybe a SELECT CASE so that strMail will accumulate data based on what's checked, but then there will be a problem of there being no comma between cases.

View 6 Replies View Related

Modules & VBA :: Checking Array - Subscript Is Out Of Range If Value Is Equal To D

Aug 6, 2013

I am having trouble checking if the last array value is equal to 'D'.

This is what i have so far but it keeps saying that 'subscript is out of range'... 'g' by the way is equal to 1. It just really means that there's only one value in ArrAC.

Code : If Not ArrAC(g) = "D" Then

View 2 Replies View Related

Modules & VBA :: Checking Multiple Subform For Values Before Closing

Jan 29, 2014

I am looking to check 3 sub forms for values and if they contain any then delete them. After a bit of googling I discovered that you should use recordset.recordcount - to which I tried but I get method or data not found - is this a valid method?

My code to which Im using is:

If Me.NoneChargeable_Admin_subform.Recordset.RecordCount >= 1 And Me.NoneChargeable_Manufact_subform.Recordset.RecordCount >= 1 And Me.NoneChargeable_Research_subform.Recordset.RecordCount >= 1 Then
DoCmd.RunSQL "DELETE NoneChargeable_Admin.*, NoneChargeable_Manufact.*, NoneChargeable_Research.* " & vbCrLf & _
"FROM NoneChargeable_Admin, NoneChargeable_Manufact, NoneChargeable_Research;"
End If
DoCmd.Close acForm, "NoneChargeableHrs_frm", acSaveNo
End Sub

View 1 Replies View Related

Modules & VBA :: Change Row Source Of Combobox By Clicking On Checkboxes

Jun 28, 2014

I have a Form with a combobox and 3 checkboxes now i want to change the Rowsource of the Combobox by clicking on the checkboxes. When i click the Checkbox the Rowsource gets Changed as i want it but i can not use the new Values cause its giving me the error "The value you entered is not valid for this field"

The Funny thing is its always bound to the type of data i choose first. When i first select the Week i can select only Weeks (17,18,19 etc)
When i choose Day first it only accepts Dates (01.01.2014 etc)There is no Control Source set . And the Bound Column for all Sources is 1

Here the Code

DD_Zeitraum is the Combobox
CB_Day CB_Week CB_Month are the Checkboxes

Code:
Private Sub CB_Day_Click()
If Me.CB_Day.Value = -1 Then
Me.CB_Month = 0
Me.CB_Week = 0
Me.DD_Zeitraum = ""
Me.DD_Zeitraum.RowSource = ""
Me.DD_Zeitraum.RowSource = Dist_Datum
Else
Me.CB_Day.Value = -1
End If
End Sub

[code]...

View 10 Replies View Related

Modules & VBA :: Checking Multiple Criteria Search Code Is Correct?

Feb 25, 2015

Staff are monitored to make sure they are keeping up to date with our customers. A customer can have multiple projects going through the factory at any one time. Each customer has a record per project and a 'general' record. Ideally we would like our staff to be able to move the 'general' record when they update a project record as opposed to either having to find and then update the general record after, or forgetting and calling the customer again 2 days later!

Including a msgbox for the EnqNum seems to show the general record correctly, however being new to access I am unsure if I have the update part correct.

Code:
If Me.chkMoveGen.Value = "-1" Then
Dim EnqNum As Integer
EnqNum = DLookup("[e_id]", "tblEnquiries", "[c_id]=" & Me.txtc_id & " and [e_status] = " & "13")
DoCmd.RunSQL "UPDATE tblEnquiries " & _
" SET e_date_due=#" & Format(Me.txte_date_due, "MM/DD/YYYY") & "#" & _
" WHERE e_id= EnqNum"

View 3 Replies View Related

Modules & VBA :: Checking If Data Entered In Form Field Exist

Jan 17, 2015

I want to check if data entered in a form field is existed

The form is bounded to a table

I used this code

If DLookup("Telegram_Number", "tbl_Violation_Of_Building", "Telegram_Number Like " & Forms!frm_Add_Violation_Building!Telegram_Number) Then
MsgBox ("number existed")
Me.Telegram_Number = ""
Else
End If

everything is ok but if the data is existed the database show the message and clear the field but i'm getting a Run-time error

'-2147352567(80020009)': the macro or function set to the beforeupdate or validationRule property for this field is preventing [ISF] from saving the data in the field

I guess the problem because the form is bounded to a table so he will save automatically

My solution is to unbound the fields and save the data via vba but is there any solution with a bounded form???

View 3 Replies View Related

Modules & VBA :: Checking In Two Tables And Display Result In Excel Sheet

Sep 2, 2014

I want VBA code that will perform the following steps. The Table1 has following fields:

ScanDate,NewBatchNo,BatchNo,PolicyNo

1. First of all look into Table1 the scandate<=29082014 and then check if there is No NewBatchNo of the corresponding record then capture its corresponding BatchNo of each record whose scandate<=29082014

2.Then check for the batchno that we have captured in another table Table2 and if its present then return corresponding PolicyNo. Now keep on searching that policy no in Table2 as it could be present 50 times in the table and then return corresponding batch numbers in excel sheet of that Policy No as below:

BatchNo - Policy No - Batch No1 - Batch No2 - Batch No3 ---------------

View 1 Replies View Related







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