Modules & VBA :: OutputTo Hangs On Error 52
			Nov 10, 2014
				Some of my users do not have access to all of our servers. In trying to automate I've hit one user whose system hangs up when Access tries to write to a server folder she does not have write (or even read) permissions for (Error 52, Bad file name or number). See the "Me.CitationType > 500" line below.
Code:
Private Sub comboStatus_AfterUpdate()
Dim hDate As String
Dim sFile As String
[Code]....
It gets as far as "If Len(Dir(hDate, vbDirectory)) = 0" and then hangs with Error 52. Testing for Dir() sooner doesn't work either.
how to either test for read-write permissions or trap Error 52. "On Error GoTo ErrorHandler" never fires to even test for 52, unless I'm missing something.
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Mar 23, 2006
        
        Hi all,
To export a file to MS excel from my form, i used the command 
DoCmd.OutputTo acOutputQuery, langName & partName, acFormatXLS, exportPath, False
however, i realised that the format of the excel spreadsheet (excel version 5.0/95) that i have exported is slightly different from the format of the spreadsheet if i had exported by clikcing on FILE, EXPORT... 
how can i specify the excel version for the exported file? i wan it to be in the latest excel version else i am unable to perform some of the marcos i have written in the latest excel format?
Thks FT
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 7, 2005
        
        Hi guys,
I’m working on a report that I want to show on the web as a Snapshot file. I created a Macro using OutputTo method to export the report. If I type the file name and location on the Output File it works perfectly, but the problem is that I want Macros to read the file name from a combo box since  the file name will change every day. Here is the code I got so far. 
C:Test””&FORMS!frm_FORM2!cbo_Name&”.snp”
Every time I run this Macro I got the following message: 
 “The report snapshot was not created because you don’t have enough free disk space for temporary work files.” 
Now!, when I type the file name to that specific location Macro does the job perfectly.
Is there any way I can get the File name from a combo box located in FORM2.
Thank you so very much in advanced. Your help is always a blessing.
 
 
Mosquetero
	View 2 Replies
    View Related
  
    
	
    	
    	Aug 18, 2005
        
        Hi,
I am having trouble with the OutputTo function. I woul like to Output a report in html format but I would like Access not to record the file under the same name each time. So if my file is named 1_report.html I would like the second time I run the OutputTo function that it is name 2_report.html. Or as an alternative have the name include data from a form/table (In my case an order number).
I have a sample of the code from the converted macro:
Code:'------------------------------------------------------------' Output order to file''------------------------------------------------------------Function EnvoyerCommande_EnvoyerCommande()On Error GoTo EnvoyerCommande_EnvoyerCommande_Err    ' Envoi la commande    DoCmd.OutputTo acReport, "EnvoiCommande", "HTML(*.html)", SaveAs, False, ""EnvoyerCommande_EnvoyerCommande_Exit:    Exit FunctionEnvoyerCommande_EnvoyerCommande_Err:    MsgBox Error$    Resume EnvoyerCommande_EnvoyerCommande_ExitEnd Function
Note: here I have used the 'SaveAs' instead of specifying a location. This is not really what I want as I would prefer no user interraction...
Thanx for any help you can provide 
See ya
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 1, 2007
        
        Hi guys & gals,
I recently came across this really strange behaviour and was wondering if anyone else knows this bug or knows a better workaround than mine.
I've attached a little Events DB, which has a search interface. I've included an export button, which runs a macro that does an OutputTo (xls) of the search query. 
Now if you do an export once, everthing is fine. The bug (at least I think it's a bug) occurs if you export a *second* time and *overwrite* the file you created earlier. The search query (which sits under the "Queries") tab is now empty and you get an error message.
My workaround idea was to dump the query to a new table every time you export and then do an OutputTo with this table. Not very elegant and you also have to do the whole error handling (e.g. user presses cancel) manually.
Does anyone have a better idea? Or am I doing somethng completely wrong and this is actually "by design"?!
Thanks in advance for any ideas!
	View 2 Replies
    View Related
  
    
	
    	
    	Apr 2, 2013
        
        I am trying to export the data from a form to a textfile by using the following simple piece of code:
Private Sub Command188_Click()
DoCmd.OutputTo acOutputForm, "CC_MAIN_PROJ"
End Sub
it works, but gives me the data like this:
|       SPEC        | SIZE_1  | SIZE_2  | C1_s | C2_s | APS1 | APS2 | BPS1 | 
what I really want is for the data to be without all the bars "|" and dashes etc. and even without headers.  I just want a straight text output, maybe delineated by spaces or commas only.
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 21, 2005
        
        I'm having an application which is developed in access. It's running quite well, some times when I made changes to forms or reports it hangs for a while and exits without saving, it happens sometimes not always... what could be the problem? how can I rectify this..
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 12, 2014
        
        I am facing a recent problem in my access 2002 and access 2010 on my computer. I am not able to run new queries even simple ones because when I try to execute it , it starts to hangs and access stop responding.
	View 1 Replies
    View Related
  
    
	
    	
    	Sep 19, 2004
        
        I want to run a report, I need to provide an option to export the output to an excel file or provide a print view. Where would I put the DoCmd.OutputTo command in the report to acheive this?? 
 
thanks
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 4, 2007
        
        hello.. 
I have this problem that when I update the value in one of my tables, MS Access hangs up. I don't know why. I dont know if it's because of the updating or because of something else.. Any help would be greatly appreciated.. Thanks in advance! ;)
here the code that's executed when the approve button is clicked..
Private Sub Command43_Click()
    Answer = MsgBox("Are you sure you want to approve this timesheet? Note that only projects approved by respective project managers will be approved.", vbYesNo)
    'if cancelled
    If Answer = vbNo Then
    Else
        Dim rs As Object
        Dim x As Integer 'will be used as a flag for do while loop
        x = 1 'initialize flag
        Set rs = Me.Recordset.Clone
    
        rs.FindFirst "[weekending] = #" & Format(Me![weekending], "mm/dd/yyyy") & "#"
      
    'finding the first record wich matches the weekending doesn't give the right record
    'right away. it may give a record with the right weekending but different eno. that is
    'not supposed to happen. so once a weekending match is found, check if the eno also
    'matches. this do..while loop will do the trick =)
        Do While x < 18
            If rs!eno = Forms!TimesheetDetailsFrm!eno And rs!statusPM = "approved" Then
                rs.Edit
                rs!status = "approved"
                rs.Update
                x = x + 1
            End If
              rs.FindNext "[weekending] = #" & Format(Me![weekending], "mm/dd/yyyy") & "#"
        Loop
        
        'close this form and refresh the 'timesheets for approval' form
        Answer = MsgBox("You have successfully approved the timesheet. Close this window to continue viewing other submitted timesheets.")
        Forms!SupervisorFrm.Requery
    End If
End Sub
Thanks again..
ps. How do I mark a post as 'resolved'? Coz I have a previous post which has already been solved.. Thanks to all of you guys. ;)
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 28, 2014
        
        I have a series of reports that are built to replicate the order forms of our suppliers. On each I have a text box for Air Freight that I only want visible when the airfreight ID is ticked. 
I have this working fine using an if statement on the Load Event of the reports. However when I use the OutputTo command in VBA it seems to bypass the Load Event. Any event that is triggered using OutputTo.
I have also tried setting the .visible in VBA but can't get the coding to work as I am using a variable report name depending on the SupplierName and when I try to use the Reports! nomenclature it will not accept the Report name being a variable (ie. Reports!ReportName![Airfreight].Visible where ReportName is a variable).
	View 9 Replies
    View Related
  
    
	
    	
    	Jan 14, 2008
        
        I have hyperlinks from within Access forms that link to Adobe PDF documents; these are the new PDF Package documents created with Acrobat 8 - and give the message "Multiple files are bound together in this PDF Package."
The problem I am having is that when ever I click on the hyperlink the computer hangs (from the task manager, I believe that it is Acrobat Reader that is hanging).  This problem only occurs with multi-file PDF packages and does not occur with regular PDF's.  It also only occur with MS Access, as linking to theses files from MS Word encounters no problems.
Is anyone aware of a fix for this?
	View 6 Replies
    View Related
  
    
	
    	
    	Feb 24, 2006
        
        My Access app hangs when running the following code on Form_Load:
   VB Code:                                                        Original                - VB Code                                                               Private Sub Form_Load()On Error GoTo listbox_errorDim strSQL As String, strList As StringDim listrs As New ADODB.RecordsetSet listrs = New ADODB.RecordsetstrSQL = "SELECT * FROM sections"listrs.LockType = adLockPessimistic         With listrs         .ActiveConnection = open_conn()         .Open (strSQL)         End WithDo Until listrs.EOFstrList = strList & listrs("id").Value & ";" & listrs("section").Value & ";"LoopstrList = Left(strList, Len(strList) - 1)Me.cmbSection.RowSource = strListMe.cmbSection.RowSourceType = "Value List"listrs.CloseSet listrs = Nothinglistbox_error:MsgBox Err.DescriptionExit SubEnd Sub                                               Private Sub Form_Load()On Error GoTo listbox_errorDim strSQL As String, strList As StringDim listrs As New ADODB.RecordsetSet listrs = New ADODB.RecordsetstrSQL = "SELECT * FROM sections"listrs.LockType = adLockPessimistic         With listrs         .ActiveConnection = open_conn()         .Open (strSQL)         End WithDo Until listrs.EOFstrList = strList & listrs("id").Value & ";" & listrs("section").Value & ";"LoopstrList = Left(strList, Len(strList) - 1)Me.cmbSection.RowSource = strListMe.cmbSection.RowSourceType = "Value List"listrs.CloseSet listrs = Nothinglistbox_error:MsgBox Err.DescriptionExit SubEnd Sub  
The connection is in a module named publicfunction:
   VB Code:                                                        Original                - VB Code                                                               Public Function open_conn() As ADODB.Connection     'Opens connections to database     Dim sPath As String     sPath = CurrentProject.Path & "endjftocbe.mdb"     Set open_conn = New ADODB.Connection     With open_conn     .Provider = "Microsoft.Jet.OLEDB.4.0"     .ConnectionString = "Data Source=" & sPath & "; Jet OLEDB:Database Password=*****"     .Open     End WithEnd Function                                               Public Function open_conn() As ADODB.Connection     'Opens connections to database     Dim sPath As String     sPath = CurrentProject.Path & "endjftocbe.mdb"     Set open_conn = New ADODB.Connection     With open_conn     .Provider = "Microsoft.Jet.OLEDB.4.0"     .ConnectionString = "Data Source=" & sPath & "; Jet OLEDB:Database Password=*****"     .Open     End WithEnd Function  
Any ideas why it is hanging? The conn to the database is successful when I use it for the login procedure, but after that, I can't seem to get back in.
thanks
	View 1 Replies
    View Related
  
    
	
    	
    	May 29, 2015
        
        Access 2007 has hung up while I scrolled from left to right through the columns in a linked ODBC table in datasheet view. I understand why it "hangs" while scrolling through rows, but I've never heard of it doing this for columns and I am talking about a complete freeze up here.
	View 3 Replies
    View Related
  
    
	
    	
    	May 4, 2013
        
        When converting the Front End of my database to an MDE, Access just hangs and says (Not Responding). I've left it our an hour and there's no sign of stirring.The Back End converts in just a second or so.
	View 5 Replies
    View Related
  
    
	
    	
    	Dec 18, 2005
        
        OK, sorted out that last problem I had.... Heres a new one.
This query runs fine: 
SELECT [Piping Models by Area].AREA_NAME, [Piping Models by Area].MODEL_NO, [All Pipes].LINE_ID, [All Pipes].PIPING_MATER_CLASS, [All Pipes].PIPE_LENGTH
FROM [Piping Models by Area] LEFT JOIN [All Pipes] ON [Piping Models by Area].PARTITION_NO = [All Pipes].PARTITION_NO
WHERE [Piping Models by Area].AREA_NAME like "545*"
ORDER BY [Piping Models by Area].AREA_NAME, [Piping Models by Area].MODEL_NO, [All Pipes].LINE_ID, [All Pipes].PIPING_MATER_CLASS;
Add one WHERE criteria, and it no longer runs, under Access or TOAD for Oracle, or SQL*Plus, or anything:
SELECT [Piping Models by Area].AREA_NAME, [Piping Models by Area].MODEL_NO, [All Pipes].LINE_ID, [All Pipes].PIPING_MATER_CLASS, [All Pipes].PIPE_LENGTH
FROM [Piping Models by Area] LEFT JOIN [All Pipes] ON [Piping Models by Area].PARTITION_NO = [All Pipes].PARTITION_NO
WHERE [Piping Models by Area].AREA_NAME like "545*"  and [All Pipes].PIPING_MATER_CLASS = "F13B"
ORDER BY [Piping Models by Area].AREA_NAME, [Piping Models by Area].MODEL_NO, [All Pipes].LINE_ID, [All Pipes].PIPING_MATER_CLASS;
It works fine, and is nice and fast, until I add the second "WHERE" criteria.
[Piping Models by Area] and [All Pipes] are both queries and run fine on their own. This query also runs fine without the WHERE clause.
Any ideas? Is there some small syntactical error causing some kind of infinite loop or something?
Edit: formatted for easier viewing
	View 1 Replies
    View Related
  
    
	
    	
    	Oct 6, 2004
        
        And yes I now that's the title of a Knowledge base article, I stole it because it put into words what I can only say in expletives right now.
Basically, well it's all a bit odd.
I got users on the network who, until yesterday, could access some networked databases. Other files from the same source are ok, just Access files.
Today the moment they click (and I mean a single-click) on the icon to open the database...explorer hangs.
You can't open the database from within MS Access either, that hangs too. But you CAN open them up and use them if you can get them copied locally.
Oh yeah, some people (in the same room, on the same VLAN) can access the database, but can't perform any tasks within it.
Databases are a mix of 97 and 2000.
And to make matters worse, it's happening on another server.
I know you're gonna shout virus, but that looks to be a non-starter since I know of no such virus which would affect ONLY Access files and do it on a single click, and secondly The systems check out fine with both Sophos (and our good luck charm AVG) run against them.
Holy Moley! Has anyone ever come accross such a palarva?
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 20, 2006
        
        Hi there
Strange problem, i'm using XP Pro and Access from Office 2003 (both real full versions from work) - and in general use, when the mouse hovers over the 'print' icon (at the top left, undernear file, edit, view, insert, near 'save', 'new', etc), then access will hang for about 20 seconds then snap back into action.
Now, i don't even want to print anything! But every now and again i accidentally hover over it and it's bugging the hell out of me. Everything is updated (but i will check again now).
Anyone know how to make this stop? I tried a quick search but didn't get far.
Cheers!
Edd
	View 3 Replies
    View Related
  
    
	
    	
    	Aug 24, 2007
        
        Hi all,
I have been using this command in VB to export Access tables to Excel. Everything works fine except when the table contains a large Character/Text field- it  gets truncated to around 200 chars. Is this a known limitation or I am doing something wrong? DoCmd.TransferSpreadsheet command works correctly but there are some limitations to this command.
Can please somebody help
Thanks 
Claude
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 1, 2014
        
        Code:
 
Private Sub Consolidate_Click()
Dim temp As Variant
Excel.Application.Visible = True
temp = Dir(CurrentProject.Path & "Inputs")
Do While temp <> vbNullString
[Code] ....
From the second iteration its not picking the error. 
	View 5 Replies
    View Related
  
    
	
    	
    	Jun 6, 2014
        
        I have the below code that seemed to work until I tried to add the Loop to it.  Now, every time it gets to the piece of the loop with the words Cells.Find, I get an error stating "With Block or Variable not set".  I don't understand what the problem is.  There is no "With Block" and the variable is set.  How can I get this to work?
Code:
Function ClearColumns(xlWS As Object, ColumnRangeToClear As String)
        xlWS.Range(ColumnRangeToClear).ClearContents
End Function
Public Function SendTQ2XLWbSheet(strTQName As String, strSheetName As String, Col As Integer, strFilePath As String, FirstCellStr As String)
[Code] .....
	View 7 Replies
    View Related
  
    
	
    	
    	Jan 23, 2014
        
        I have a small database with several forms. One of them has a command button to open a new form (which also contains a continuous subform) and go to a new record in the form. This is the code behind it:
Code:
    stDocName = "Main Data Entry"
    DoCmd.OpenForm stDocName, , , stLinkCriteria
    DoCmd.RunCommand acCmdRecordsGoToNew
This database has been in use for quite without problems a while but now I am doing a few small changes and cleaning it up of data to start over.The code above gives the error "The command or action "RecordsGoToNew" isn't available now" yet it opens the form just fine and data can be entered. This error only happens when the first record is entered; it does not show up when entering the second or subsequent records.
	View 8 Replies
    View Related
  
    
	
    	
    	Jul 15, 2015
        
        I am getting a "type mismatch 13" error on this line
Code:
PrinterSel = Nz(DLookup("Device", "tblPrinterSelection", "Doc='" & DocumentType & "'" And "Computer='" & sHostName & "'"), "No Printer")
All vba variables are defined as strings. All fields in the table are text.
mafhobb
	View 2 Replies
    View Related
  
    
	
    	
    	Dec 9, 2014
        
         sort this error out:
 
Code:
If Nz(DCount("*", "[Tblupdate]")) = 0 Then   ' The count is zero
i = 1
Else
    i = DMax("ID", "tblupdate")
End If
Dim ssql As String
Dim j, k As String
j = "P" & i
k = Environ("username")
ssql = "Insert into tblUpdate(Update_ID,Date,Username) values('" & j & "',#" & Format(Date, "dd/mm/yyyy") & "#,'" & k & "')"
CurrentDb.Execute ssql, dbFailOnError
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 1, 2014
        
        Previously my snapshot file was displaying thur this code but as 2010 Access, it produded subjected error and halt at below red color line.
Public Function LoadSnapshotFile(snpCtl As Object, strFilePath As String) As Boolean
Const conSnpFinishedDownload As Integer = 4
With snpCtl    
.SnapshotPath = strFilePath
[Code]....
And it was runing well. But not now due to the produced error. I tried to make it pdf extension of the report file. It is updating the file at the path (where I kept the report) but problem is not displaying after click event on the form.
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 10, 2013
        
        I have got a problem on one of our computers. 
 
We use Microsoft Access databases to enter test data and eventually generate reports.
 
On 1 computers i get the following error when opening the report:
 
"Function is not available in expressions in query expression 'Left(.....)"
 
I figured this is a reference problem so the next thing i did was to pinpoint what reference was causing this error.
 
It turns out it is the Microsoft DAO 3.6 Object Library. Simply removing the reference and adding it again fixes it and allows you to open reports just fine.
 
The problem is though, this message comes back every now and then. Which is getting annoying and the person who is making the reports is about to throw his computer out of the window.
	View 2 Replies
    View Related