Modules & VBA :: Operation Is Not Allowed When The Object Is Closed

Feb 25, 2014

I keep on getting this error. The weird part is that I have exactly the same stored procedure but insted of FinancialYear it has a calendar year. So instead of of having something like '2013', it has 'FY2012 - 2013'. The calendar year SP works perfectly, but this does not.

Option Compare Database
Dim objConn As ADODB.Connection
'Use this code to run the SP and extract all the records
Public Sub LoadVRData()
Dim rsData As ADODB.Recordset

[code]....

View Replies


ADVERTISEMENT

Closed Records - Archive Or Label As Closed?

Oct 17, 2006

Evening All! (Old enough to remember Dixon of Dock Green (stupid enough to mention it!))

I'm working on a small database for a small team of support workers with a
client base of 60 clients at anyone time, although the turnover is quite
substantial.

I have done some searches on archiving records but am concerned that once
archived a record would be difficult to re-integrate in to the live database,
particularly if there have been changes to it?

I have considered that I may be just as well slapping a big label over every
record that has a date in the [CloseDate] field and if a closed case is
re-opened, the closed date is removed and the label disappears.

I'm still open to being convinced that the archiving is the way to go, but
in the mean time I hope someone will be able to help with the expression
needed in the form on_current procedure to make the label visible. If it was
just a tick box I'd be flying by now, but I can't get my head around getting
a populated [CloseDate] field to initiate the CloseRecordLabel.

Thanks in advance
Doug

View 9 Replies View Related

Modules & VBA :: Check If All Forms Are Closed

Apr 9, 2015

I am creating a few forms one of which is the MAIN FORM that closes upon opening another form.

What I am looking for is when another form closes, if no other forms are open, then open the MAIN FORM again.

Can I use this : If CurrentProject.AllForms("BUT KEEP THIS EMPTY").IsLoaded Then ???

View 14 Replies View Related

Modules & VBA :: Save Value Of Field And Use It Once Form Closed

Apr 22, 2015

I have a MainForm. Using a button on the MainForm i open an PopUp form which I enter values.

I want to save the value of a field (text), close the PopUp form. Then use the Saved value in the MainForm to find a record.

So far I have this but not working:

Code:
TempVars.Add "company", Me.CompanyName.Value
If Me.Dirty = True Then
Me.Undo
End If
DoCmd.Close
DoCmd.OpenForm "MainForm"
DoCmd.Requery
DoCmd.FindRecord Forms![MainForm]![CompanyName] = TempVars("company")
DoCmd.GoToControl "Combo48"

View 5 Replies View Related

Modules & VBA :: Saving Combobox After Form Is Closed And Re-opened

Sep 26, 2013

I have a main form called frmAF54. In this main form I have a subform named frmPassdown. The subform record source is from a table called tblCards. This table contains many different cards. I have a combobox called lstOpCard in the main form as well. The combobox lists all of the different cards in "tblCards". I have a button called "buttonFilter".

A user opens the form and clicks (or selects) the different cards in the combo box "lstOpCard" that they want to filter for. Once their selections are made, they can click the "buttonFilter" button and the subform "frmPassdown" will be filtered based off of their selections.

The filter is applied using the IN() function as shown below:
Me.AF54PassDown.Form.Filter = "[OpCardID] IN ( " & sTemp & " )" --sTemp is a string containing the keyIDs of the cards selected.

My problem is that people will be opening and closing the form throughout the day / week. When the form closes, it loses the applied filter. How can I have my filter on the subform be saved after the form is closed and the filter is still applied when the form is opened later?

View 1 Replies View Related

Modules & VBA :: Command To Execute When Form Is Closed Or Quit

Feb 5, 2015

There is a form where whenever the form is closed, the below code needs to execute:

If IsNull(Me.CostPerPiece1.Value) = True And IsNull(Me.CostPerPiece2.Value) = True And IsNull(Me.CostPerPiece3.Value) = True And IsNull(Me.CostPerPiece4.Value) = True And IsNull(Me.CostPerPiece5.Value) = True Then
Me.AllowAdditions = False
DoCmd.SetWarnings (0)
DoCmd.RunCommand acCmdDeleteRecord
DoCmd.SetWarnings (-1)
Else
Call AppendQuoteCharges
End If

The If Then just looks at if certain fields are all null and if so, it deletes the current record. If at least one field is not null, the AppendQuoteCharges routine is called.

The form has 4 or 5 navigation buttons that close this form and send you to a different one. I've added the above code to each of those buttons before it runs the DoCmd.Close Form. I also have a Exit button that runs a DoCmd.Quit. I developed this months back but I'm pretty sure I added the above code under each button's click event rather than a Form On Close event because Form On Close does not execute after a DoCmd.Quit command

In rare cases, the form is being closed without the routine being ran. I think if a user clicks the Close button in the top right of Access (the X), it might be running a DoCmd.Quit which is doesn't run this code.

How can I be sure that whenever the form is closed or exited, the code is ran? Is there a way to tie this code to the user clicking the X in the top right?

View 2 Replies View Related

Modules & VBA :: Check If Data In A Closed Workbook Is Present In Access Table

Oct 15, 2014

I am using the following line of excel vba code to extract the name of excel file that I would like to compare with Access table data.

Code:
strFile = Application.GetOpenFilename("Excel Files,*.xls*")
textbox1=strfile

Now i want to write VBA code to check sheet name "Summary" in that workbook and check if any of column D value matches with Access table tblmain field "Reference" values. If yes then change the status field of tblmain to "Yes".

View 1 Replies View Related

Modules & VBA :: Object Variable Not Set

Nov 6, 2013

I am just in the middle of writting a little bit of code that will go through each record in a query and export it into a word table. It's in the early stages but all was working yesterday. I've come to it this morning and ran it and now I get an error message;Run Time error 91: Object Variable or With Block Variable not set.

Code:

Private Sub Command15_Click()
Dim MyDb As DAO.Database
Dim rsLogin As DAO.Recordset
Dim ObjHead As String
Set MyDb = CurrentDb()
Set rsLogin = MyDb.OpenRecordset("query here")

[code]....

View 2 Replies View Related

Modules & VBA :: Cannot Find Object

Nov 27, 2013

message "cannot find the object "." ". I have looked in the VBA for the Report I am working with and the form that has the underlying data and cannot find the rouge period! I am creating a label for payment envelopes that is gets its data from the form that indicates payments made

View 1 Replies View Related

Modules & VBA :: Can't Assign A Value To Object

Nov 15, 2013

I am trying to use Access 2007 popup calendar to populate a combo box with a selected date. When I select the date on the calendar the above error appears.

Code:

Private Sub Calendar9_Click()
'Set Date to the selected date and hide the clalendar.
MAssBDate.Value = Calendar9.Value
MAssBDate.SetFocus
Calendar9.Visible = False
End Sub

[code]....

View 2 Replies View Related

Modules & VBA :: Customize Object Name

Mar 17, 2015

When we use DoCmd.SendObject, the object name is always the same name of table, query or report.Can we customize object name to something else more descriptive? For example:

If I send the report "SalesPerSalesman" about John Smith,
the object name now is "SalesPerSalesman.pdf"
If i send the report "SalesPerSalesman" about Maryann Johns,
the object name would be again "SalesPerSalesman.pdf"

However , the object name I would like "SPS_JohnSmith.pdf"and the report for Maryann Johns, I would like as object name "SPS_MaryannJohns.pdf"

Syntax
DoCmd.SendObject ObjectType, ObjectName, OutputFormat, To, Cc, Bcc, Subject, MessageText, EditMessage, TemplateFile
ObjectName � Name of table, query, Report etc.

View 1 Replies View Related

Modules & VBA :: Cannot Assign A Value To This Object (Textbox)

Mar 27, 2014

Not sure whats going on here, nothing on the table that stops this from working. I just get Run-time error "2448 You can't assign a value to this object" When the code runs.

Code:
Private Sub Form_Open(Cancel As Integer)
Dim rst As DAO.Recordset
MySQL = " Select max(ID) from TblUserQry"
Set rst = CurrentDb.OpenRecordset(MySQL)
Myid = rst.Fields(0) + Int(Rnd(1) * 10)
Me.txtMyID.Value = Myid

End Sub

View 6 Replies View Related

Modules & VBA :: Query Object To Recordset

Oct 14, 2013

I am in the middle of creating a function that populates two unbound text boxes on a form and then uses those unbound textboxes in a query (Total of 3 unbound text boxes - 2 are populated from this function). The saved query object is working fine when I manually execute it (after the unbound text boxes have been populated). However, when I go to set the same query to a recordset I am getting the "Too Few Parameters. Expected 3." error message.

In the saved query I used the build function to use the unbound text boxes as part of the where clause. Below is the code I am trying to execute:

PHP Code:

Public Function Test()Dim db As DAO.DatabaseSet db = CurrentDbDim rst As DAO.Recordset
Dim DtBegin As String''FInd the Begin dtstBegin = DateAdd("q", -1, DateSerial(Year(Date), (DatePart("q", Date) - 1) * 3 + 1, 1))
Dim DtEnd As String''find the end dateDtEnd = DateAdd("Q", DateDiff("Q", 0, Date) - 1, 0)

[Code] ......

The unbound text boxes are populated before the query is set to the recordset.

View 5 Replies View Related

Modules & VBA :: Object Invalid Or No Longer Set

Feb 24, 2015

I have been using this export function for the longest time and today it is giving me an error:Object invalid or no longer set.

Code:
On Error GoTo Err_cmdTest_Click
'Must 1st set a Reference to the Microsoft Office XX.X Object Library
Dim dlgOpen As FileDialog
Dim strExportPath As String
Const conOBJECT_TO_EXPORT As String = "EXPORT"

[code]....

View 5 Replies View Related

Modules & VBA :: Display OLE Object In Message Box

Aug 8, 2013

I'm trying to display an image which is saved in the table as an OLE Object in a message box. The field with the object is "PowerCurve". This is what I'm trying to do. It allows me to get as far as clicking yes to view the second message box but then it results in an error when it tries to display the image.

Code:

Dim strDetails As String
strDetails = DLookup("Details", "ExistingDeviceDetailsQ")
Dim strCurve As String
strCurve = DLookup("PCurve", "DeviceT", "DeveloperProduct = '" & Forms!DeviceF!D_ExistingDeviceCmb & "'")
If strCurve = "No" Then
MsgBox strDetails, , "Device Details"

[code]....

I get the error "Object variable or With block variable not set" on the line

image = DLookup("PowerCurve", "DeviceT", "DeveloperProduct = '" & Forms!DeviceF!D_ExistingDeviceCmb & "'")

View 2 Replies View Related

Modules & VBA :: Object Invalid Or No Long Set

Jul 17, 2015

Access 2013...Code that has been working is suddenly causing the error "Object invalid or no longer set". Line causing the error is marked.

Code:
Private Sub CreateTable()
Dim dbsDb As dao.Database
Dim tblTemp As dao.TableDef
Dim fldTemp As dao.Field
Dim rst As dao.Recordset
Dim rstRsF As dao.Recordset

[code]...

View 9 Replies View Related

Modules & VBA :: How To Refer Object By Its Name When Name Is A Number

Sep 12, 2014

Actually in a powerpoint slide, I am having a set of 31 shapes having their names as numbers from 1 to 31.

How to refer by its name?

By hardcoding I refer it like this:

activepresentation.slides(1).shapes("1").someprope rty = somevalue

How to do it in a loop?

Code:

for i = 1 to 31
activepresentation.slides(1).shapes(i).someproperty = somevalue
next i

The above code will refer the shapes only by the index. But the shapes are not having index and name as same.

View 9 Replies View Related

Modules & VBA :: Hyperlink To Another Database Object

Sep 26, 2013

I have 2 databases (accdb). Both databases have a loading pop form. Also both databases include the following line of code when the loading form opens:

Code:
docmd.runcommand acCmdAppMinimize

This code works great when I open the databases individually. but my problem is that I have a label on the pop form in accdb 1 with its hyperlink address set to accdb 2 and the subaddress set to the macro name.The hyperlink opens the database 2 just fine and it opens the loading form but it doesn't minimize the application window.

View 1 Replies View Related

How Many Fields Are Allowed

Jan 12, 2005

I have a cvs excel file with 8000 lines, I would like to try to input these fields into 1 table is this possible?

View 2 Replies View Related

Modules & VBA :: Office 14.0 Object Library Causes Freezes

Oct 23, 2014

I have VBA code that makes use of the Microsoft Office 14.0 Object Library, but if I have this selected whenever I try to do anything in the Form Design view it is constantly freezing. It will literally say not responding" for a minute or so then I will have control again.

View 7 Replies View Related

Modules & VBA :: FileSearch Object Replacement Code

Aug 7, 2015

I am in the midst of migrating an Access 2003 database to Access 2007 and one of its most important module uses the filesearch object to transfer table data from word files into a table in the databse.

Code:

Option Compare Database
Option Explicit
Public Function ImportPathTableData()
Dim objWord As Object
Dim objDoc As Word.Document
Dim db As Database
Dim data As Recordset
Dim bWord As Boolean
Dim strFolderName, strNPID, strTemp As String
Dim tablenb, table, row, column, i As Integer

[code]....

View 1 Replies View Related

Modules & VBA :: ActiveX Component Can't Create Object

Jan 12, 2015

I am trying to connect to MS Access from MS word using the following code but getting the above error message:

Code:
Sub GetDataFromDataBase()
'allocate memory for the database object as a whole and for the active record
Dim myDataBase As Database
Dim myActiveRecord As Recordset

[Code] .....

View 2 Replies View Related

Modules & VBA :: Object Or Class Does Not Support Set Of Events

Mar 19, 2014

I have this below which some people cant run and some people can. All are using 2010 runtime version. Apart from the one guy who can run the macro who has full 2010 version. I have 2010 runtime installed and i can also run the macro fine.

Private Sub Option12_Click()
On Error GoTo Option12_Click_err
Dim CntlPay As String
Dim Lable As String
CntlPay = "D"

[code]....

View 1 Replies View Related

Modules & VBA :: RunTime Error 424 - Object Required

Aug 21, 2013

Basically I have a form where a user has selected a couple values from a dropdown element, and entered a few other text values into the form. I am then trying to grab the values and append them to a table.

Code:
Private Sub btnSubmitInputVendorPerformanceForm_Click() 'Button Is part of frmInputVendorPerformance
Dim ValueCheck As Integer 'Increments to make sure no errors in entry
Dim ErrorShow As String
Dim YesorNoAnswerToMessageBox As String
Dim QuestionToMessageBox As String
Dim DeliveryRate As String

[code]....

View 4 Replies View Related

Modules & VBA :: Sending Object With Null Field

Mar 11, 2015

I'm sending out an e-mail (see below). I want to add a cc addressee. However, sometimes the cc addressee will be blank. The e-mail works if the cc addressee field has data. It doesn't work if there isn't data. I tried an IIF statement but that didn't work. How do I can the object to work if the field is blank (null) or has data?

DoCmd.SendObject acSendNoObject, , acFormatTXT, Me.POCEmail, , Me.Email, , "Decoration Issue - Resolution Assistance", "Sir/Ma'am," & vbCr & vbCr & _
"We need your assistance in resolving the following decoration issue:" & vbCr & vbCr & _
"Issue/Necessary Correction: " & Me.Issue & vbCr & vbCr & _
"Member Information " & vbCr & vbCr & _

[Code] ....

View 1 Replies View Related

Modules & VBA :: Object Or Class Does Not Support Set Of Events

Oct 21, 2013

I have wrote a database in access 2010 and the database works fine for me (I am the db admin with full control).I gave the database to a group in which most of them also have no issue with the file. They are able to use the database with no issues..One of those members gets an error message when completing the initial step in the database: (select a drop down item from a combo box)

Code:
The expression After Update you entered as the event propoerty setting produced the following error: Object or class does not support the set of events

Something I cant seem to understand is why is this happoening on 5 machines but not on the 6th, they all have the same PC set up so there should be no error on one particular machine.

View 6 Replies View Related







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