Forms :: Controls Not Repainting After VBA Routine

Jul 23, 2014

Access 2007

I have a subroutine which cycles through all controls on a form, and for controls with applicable tags, either enables or disables the control.

The routine accepts a form as the parameter (frm), and is called from a button on the form itself.

Despite trying frm.repaint in the generic routine, and, me.repaint from the calling form, the controls do not seem to repaint until the mouse moves over them. A command button, for example, will be grey-ed out, despite being enabled, but will un-grey when the mouse goes over it.

View Replies


ADVERTISEMENT

Forms :: Reference Table Being Updated When Launch Edit Routine

May 18, 2015

Currently running Access 2010.

I have a small database where we enter audit log data. In my add add screen from the switchboard, one of the fields is the user the audit is assigned to. So that our group wouldn't be typing their names a bunch of different ways I created a reference table called "Ref Data 005 - Contact Name". So i pre-populate the Contact Names such that they will be more consistent.

The add works perfectly. I built all my screens using the forms wizards.

Now for the modify routine. If the user wants to go in an modify one of the other data elements, I force them in the wizard to do this modify by choosing thier name. Therefore, when i built this screen using the wizard I reference the "ref table" mentioned above. I then throw open another form displaying all of the fields based on the records that it finds for that user when they choose the name from the Ref data 005 table. Hope that makes sense. Ie.. they choose the records they want to possibly modify by first choosing their name from the ref table.

It correctly pulls the records for whatever user you choose. However, when you make the update and save, it is changing the Ref table name as well.

So for example if three users were in my ref as :
bill
joe
john

And you launch the form, lets say joe shows up in the list, when i change it to bill to retrieve bill's records , it will do that but when i make the change, then Joe is changed to bill in the reference table.

View 4 Replies View Related

Routine Name

Jun 2, 2006

Is there a set variable or property that can tell you which Sub you are in?

I want to use this to log errors. i.e pass the module and sub routine name to the error handler log file.

The only way I can do this at the moment is to physically hard code the sub routine name into each error handler.

View 2 Replies View Related

Need Help With Export Routine

Nov 17, 2006

Ok I am exporting some data to a plain text file and one of the fields I am outputing can vary in the number of characters and I need they to have the same number of characters all the time.

Ex: 123.00 => 000012300
456789.00 => 045678900

I had heard of a command, but I can't remember what it was...I could do a loop till LEN() = 9 but that would cause undue clock cycles (aka performance hit) on the machine when running through the export routine.

This is a huge export of data.....

Thanks,
Richard

View 4 Replies View Related

Unique Username Routine

Jun 8, 2006

Hello,
I was wondering if you have one or have seen a routine to generate unique
username from first, middle and last names. Here is my requirement -
by default first initial and last name of a user is their username.
But if the expected or default username is already taken then if the
user have middle initial, then the username for this user would be
first initial, middle initial and lastname. If the user does not have
middle name then the username for the user would be first two letters
of first name and lastname and if that's already taken then first
three letters of first name and last name and so on.

Any help or pointer is greatly appriciated.

View 2 Replies View Related

Scheduling Access To Open And Run A Routine

Mar 6, 2006

Hi,

I was wondering is it possible to schedule in windows somewhere to open up my syncfrontend.mdb and then run a routine that i have written inside of that mdb.

The routine is a huge database syncronisation task that needs running every hour, it's all there ready to be run but just need a way to get to it and run it automatically on the hour every hour.

Any ideas or help would be greatly appreciated!

Thanks in advance

View 2 Replies View Related

Need Help With Rich's Error Trapping Routine

Apr 9, 2007

Hi guys, I was looking for a way to trap err.number 3314 (when required field is null) before Jet generates its warning. I came across an old post from Rich (below), but I couldn't make it work as yet. In the calling form, under the Form_Error event I wrote the following:

Dim f As Form
Set f = Me
Call fnValidateForm(f)

Could anyone please tell me where my error lays here? I have several forms which have several text and/or combo boxes bound to required fields and I would want to have a generic code, like the one here to trap errors before Jet shows it's Error Message.

Thanks in advance
Regards
Jaime Premy - Belém-Brasil

******************Rich's Function********************
Public Function fnValidateForm(frmA As Form) As Boolean
Dim ctl As Control
Dim Msg, Style, Title, Response, MyString
fnValidateForm = True
For Each ctl In frmA.Controls
'value in the control is required
If InStr(1, ctl.Tag, "Required") > 0 Then
' no value entered or value is null
' or zero for numeric fields
If (IsNull(ctl.Value)) Or (Len(ctl.Value) = 0) Then
ctl.SetFocus
MsgBox "You have not entered all the required fields return to the record and correct this! The record will not be saved if you do not! "
fnValidateForm = False

Exit For
End If

If InStr(1, ctl.Tag, "NumberRequired") > 0 Then
If ctl.Value = 0 Then
ctl.SetFocus
MsgBox "You have not entered all the required fields return to the record and correct this! The record will not be saved if you do not! "
fnValidateForm = False

Exit For
End If
End If
End If

Next
End Function

View 5 Replies View Related

Modules & VBA :: Passing Variables To A Sub Routine

Jan 13, 2014

I have a public sub routine which requires parameters to be passed to it when I call it from an access form. When I try to enter the code to call the sub I get a compile error. I've also tried calling it from another sub in the same module but get the same compile error - see below.

Code:
Sub EmailData(Datafile As String, To_mail As String, CC_mail As String, Subject_mail As String)
'code to use variables passed in
End Sub

[Code]....

View 4 Replies View Related

Modules & VBA :: Calling Function From Sub Routine

Aug 10, 2013

I have 28 combo boxes on a form, which I want to insert data into the table as they are changed. Each one will pass the same sets of data just with different parameters which come from the form.

Rather than putting the same code to insert on each of the 28 combo boxes I thought it would be easier to create a function to do it and pass the parameters to it through a sub on the AfterUPdate event of the combo box.

I need to pass 4 parameters, if I only put 1 in there it works fine, but when I start putting more in it doesnt work and I get compile errors or syntax errors.

Sub routine:

Code:
Private Sub cboMonday1_AfterUpdate()
If Me.cboMonday1 = 1 Then
Me.cboMonday1.BackColor = vbGreen
Me.cboMonday1.ForeColor = vbBlack

[Code] .....

View 9 Replies View Related

Tab Controls - Two Forms

Jun 2, 2005

Hello,

I want to use a tab form where the user can click add, search, and edit records all from 3 tabs. The problem is I only want to be able to add data on one form, edit data on another, and just read only on the search. This seems to cause a dilemma, how can I specifiy them to add, edit, and read only on one form using tabs?

Mateo

View 1 Replies View Related

Forms :: Dynamically Resizing Forms And Controls

Oct 31, 2013

I am making a database that will be used by multiple people on a network, and they have different resoloutions on their own computers. when the database is loaded on their respective computers, the form controls are all off.

On the computer i designed them on, the forms fit perfectly on screen, as do the controls, i would like to know if there is some vba code i could incorporate into the form open event, or module code that i can use in order to dynamically re-seize the forms and all of the controls to suit different resoloutions?

View 6 Replies View Related

Change Output File Name During Send Object Routine

Apr 3, 2007

I have a query that runs based on a parameter a user selects on a form.

I want to dynamically create the sendobject file name based on the parameter the user selects.

Example:

My form has a parameter named medicine. When the user checks the checkbox next to medicine it runs a query for records labeled as medicine but sends the e-mail output as the query name. I want something like medicine.txt etcc...

thanks

:confused:

View 1 Replies View Related

Modules & VBA :: Routine To Output Access Report To PDF Using Fields

Jul 3, 2013

I have a routine that outputs an MS Access report as a pdf file which works OK. It does not open the file which is what I want.

DoCmd.OutputTo acReport, "rptTransactionInvoiceExcVAT", acFormatPDF, "C:UsersJEFF1Documents
ptTransactionInvoiceExc VAT.pdf", False

What I would like to do is output the pdf file with a Customer name and number from the field Me.txtAmazonBuyer. I have tried:

DoCmd.OutputTo acReport, "rptTransactionInvoiceExcVAT", acFormatPDF, "C:UsersJEFF1Documents" + ([Me.txtAmazonBuyer]) + ".pdf", False

But no joy.

View 7 Replies View Related

Tables :: Calling Subroutine From VBA Routine To Append Record

Jun 21, 2013

I am trying to call a subroutine from a VBA routine to append a record to an existing table. Below is the code for opening my recordsets for reading followed by the code creating my table to append to:

Public Sub UpdateLotsizes()
Dim curDatabase As DAO.Database
Dim ProdPlanDB As DAO.Database
Dim rstQryLot As DAO.Recordset
Dim rstInvLoc As DAO.Recordset
Set curDatabase = CurrentDb

[Code] ....

To call my subroutine, I simply put in the code:

ExceptionReportAddRecord

And this is the code of the subroutine:

Public Sub ExceptionReportAddRecord()
Dim rstExcRpt As Recordset
Set rstExcRpt = curDatabase.OpenRecordset("tblExceptionReport")
With rstExcRpt
.AddNew
.Fields("item_no").Value = txtItemNumber

[Code] .....

I am receiving "Run-time error 434: Object required" at the line I marked with ...

View 4 Replies View Related

Modules & VBA :: Delete And Insert Data From A Table In One Routine

Oct 10, 2013

Access 2010. Can vba code be written to delete and insert data from a table in one routine.

Something like Delete * Insert into select from where order by....

I tried it with a query but have to write two.

View 1 Replies View Related

Queries :: Return Date Of Next Monday - Routine Not Working

May 13, 2014

Today is 13 May and this code is supposed to return the date of next Monday (19 May)

IIf(Weekday(Date())=1,Date()+1,Date()-(Weekday(Date())+9))

but it returns 1/5/2014 (Thursday May 1), when "Date" = 13/5/2014 (Tuesday May 13)

My begin week is Sunday (1) ,

View 8 Replies View Related

Referencing Controls On Forms

Mar 30, 2012

I have a main form, 2 sub forms, and 2 text-boxes on the main form. I have a search box now for the first subform. Works perfectly. Once the users filtered based on name, I want them to be able to select that filtered record which would filter another subform.

Right? ok.

My first attempt was to assign the ID that was selected to a textbox on the main form, then automatically requery the second subform based on that value. I used this way on my search box. I'm sure there is a way to go directly from clicking the value to requerying the second subform, but i don't know it.

That being said even the indirect first attempt isn't working. It all has to do with the ".", "!", and ordering of this stuff. It has to do something with Parent child, but beyond that I'm at a loss.

Code:
Me.[Collateral] = Acct_Reference_id
Me.[Navigation]![textbox] = Acct_Reference_id
...
'Me!Subform1.Form!ControlName
'Me!Subform2.Form!ControlName
'Me.Parent!ControlName

I did find this very useful site [URL] ...... It shows what code you can use depending on where you are and what you're doing. Even with that as a resource, i'm still at a loss.

View 7 Replies View Related

Modules & VBA :: Running Multiple Queries In A Routine - Error Handling

Oct 9, 2013

I am using access 2010. I use basic error handling in my routines:

Code:
On Error GoTo errHandler ... exitHere: ... errHandler: MsgBox "Error " & Err.Number & ": " & Err.Description

The problem is lately; while testing I am running multiple queries in a routine. When it fails; its hard to identify which query has the problem. So I hit control break; debug and try to find it. After I fix it; I debug and reset; i get this continuing hourglass thing in the form of a spinning circle until I close and reopen the database. I think I need better error handling but not something really complicated because I need to put it in quite a few routines throughout the database.

View 2 Replies View Related

Remove Controls On A Forms' Opening

Sep 29, 2006

Hi there,

I've been puzzling over this one for a few days. I've done a few searches on here to borrow some code - but the fact is I don't understand how to implement the suggestions. I'm hoping somone can help.

Basically, I have a form for editing the database, however, there are a number of reasons for opening this form - so at the moment I have several copies of the same form all with very minor changes. In order to streamline the way I've done this, I'd rather have controls always call up the same Form - but state in their code whether or not certain controls on the editing form are visible or not...

:mad: :eek: :mad: :eek: :confused:

It's all gone rather Pete Tong here. And I must admit I'm button bashing the code a bit now. Basically, when a button is pressed, I want it to load the form "frmEditJob". Depending on what I want visible, the Tags "N, M and V" will activate and deactivate certain controls on "frmEditJob".

With me? :confused:

Any help is appreciated!

Cheers.

Private Sub EditJob_Click()
On Error GoTo Err_EditJob_Click

Dim stDocName As String
Dim stLinkCriteria As String


If IsNull(Me![IDEntry]) Then
strMsg = "You need to enter a Valid ID number in the box provided."
strTitle = "ID Number Error"
intStyle = vbOKOnly
MsgBox strMsg, intStyle, strTitle
Exit Sub
End If

stDocName = "frmEditJob"
Dim ctl As Control

stLinkCriteria = "[WorkorderID]=" & Me![IDEntry]
DoCmd.Close
DoCmd.OpenForm stDocName, , , stLinkCriteria


If ctl.Properties("Tag") = "N" Then
ctl.Properties("Visible") = False
Else
ctl.Properties("Visible") = True
End If

Exit_EditJob_Click:
Exit Sub

Err_EditJob_Click:
MsgBox Err.Description
Resume Exit_EditJob_Click


End Sub

View 5 Replies View Related

Forms- Subtable Filtering Controls

Apr 28, 2008

Hi,

I'm new to Access and am having trouble designing a database that houses application details.

All applications have a list of unique wrap id's but have different tables housing different details for these wraps.

I have a main table which is for data entry and lets me input whether or not a piece of software is Vista compatible (yes/no) etc.

I also have a field in this table showing which analyst is responsible for researching compatiblity of an application.

I have another table with different regions i.e. london, manchester etc that has the region/city listed as the field heading and then contains a list of wraps used in that city under the relevant field.

My main entry form is linked to the main data entry table that holds specifics for an app, name, vista compatible etc. This form is used for data entry. I want to add a subform on this form which shows a list of all applications, in table format, but I want a drop down list so I can select an analyst name / region so that analysts can update details for a specific area assigned to them. In the table I want all of the records based on this criteria to be displayed.


I guess I need to make a filter button on my subform but do not know how to do this. I put in a button control for apply filter by form but then dont know what to do.

I'm new to access and don't know much VB - e.g. the only thing I can do in VB is a make a message box that says hello world on the screen.

Any help is sincerely appreciated. Apologies for the Essay.

Kind Regards
Bal

View 7 Replies View Related

Forms :: Looping Through Subform Controls?

Aug 16, 2013

I have a main form, lets call it FrmMain. In addition, I have a subform on FrmMain that has a tab control on it (frmSubform). What I would like to do is on form load, reference the tab control that is on the subform, loop through the controls/textboxes, lock them and change their backcolor. The code I am attempting is listed below, however, I am getting a "type mismatch error" highlighting this line:

PHP Code:

Set Frm = Forms!frmConsultingMain!FrmConsultingFeeData 

Below is my code:

PHP Code:

Dim ctl As ControlDim Frm As FormSet Frm = Forms!frmmain!FrmSubformFor Each ctl In Frm.Controls    
If (TypeName(ctl) = "Textbox" Or (TypeName(ctl) = "combobox") Or (TypeName(ctl) = "listbox")) Then        
ctl.Value = Null        ctl.BackColor = vbYellow        ctl.Locked = True    End IfNext ctl 

View 10 Replies View Related

Forms :: How To Ungroup Controls On Form

Apr 29, 2014

I had never seen this before as I have recently moved from 2003 to 2010. When I create a from using the wizard sometimes the controls are grouped (inside a dashed square) which does not allow me to modify its size and/or position independently.

How can I "ungroup" these control?

View 2 Replies View Related

Forms :: How To Link Combo Box To Tab Controls

Jul 9, 2014

On my data entry Form, I have a Combo Box [Condition] and five tab controls. Each tab has as many as 10 controls on it. The purpose of the Form is to populate a table. My questions are:

1) Do I still need to use a subform on each Tab or leave them as-is? i.e. the 10 controls are on each tab

2) How do I make the value of [Condition] transfer focus to the appropriate tab??

View 14 Replies View Related

Forms :: How To Hide All Form Controls At Once

Apr 21, 2013

how to hide all form controls at once like if i have many text box and labels how to make a loop to hide it all at once

View 1 Replies View Related

Forms :: 2 Lookup Controls On One Subform

Aug 13, 2013

I have a library database with a form called Author and a subform from a junction table. The junction table connects Title/Genre. It's many to many because I usually have a few genres for one book.

This is my problem. I want to add more information to the subtable that is in the junction table. For every record I would like to add also Book Group (I am a member of several groups and want to remember which one I read the book with) and Purchased From.

So I am assuming I have to have 2 lookup controls to be able to add Book Group and Purchased from since neither one is on the junction table (and they both come from tables). Or do I add them to the junction table?

View 3 Replies View Related

Forms :: Hiding And Moving Controls

Nov 6, 2013

I have created a form with some boxes on it which include in their body textboxes and labels and combos. I would like to know if it is possible (or if a control exist) to group this items which are inside the box and with a simple box.visible = false to make them all non visible without tagging them or adding code with their names statically to make them non visible. Any link that shows how to move controls in the form in runtime?

I would like to hide some controls and make smaller the form and if user selects a checkbox to show these controls that exist inside a box and grow the form.

View 1 Replies View Related







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