Modules & VBA :: Access Memo Field Copy To Excel Truncates At 255 Characters
			Nov 25, 2013
				Two Solutions to address moving an Access Memo field into Excel when string has > 255 characters. All my 'reports' use Excel VBA (Access Reports are not used). The Excel reports can have 40,000 records. Speed to create the report can be an issue. 
 
Describing 2 Solutions below to address moving Access memo fields with > 255 characters into Excel.After running this code
Code:
720         ObjXL.DisplayAlerts = False      
                ObjXL.Columns("X:X").Select
                ObjXL.Selection.NumberFormat = "@" ' set column to Text
730         ObjXL.Worksheets(intWorksheetNum).Cells(intRowPos, 1).CopyFromRecordset rsNutsAndBolts
The Comments column are limited to 255 characters. So, the CopyFromRecordset (recordsetvariable) creates the 255 character limitation.
 
The reason? The 255 character limit is because CopyFromRecordset sutomatically uses the Characters property of the Range object. The 255 limit would not be there if the Cell Value property is used to assign the string to that cell.
Dim sRx as String ' String Prescription 
sRx = "String with > 255 characters ... you fill in the rest ...."
Cells(1, 1).Value = sRx ' Cell's Value property assignment can be very large
Solution 1:
The record set is still in memory. By using a loop, a cursor can start with record 1 (memo column) and assign that value to the Excel row / column using the .value as shown above. Basically, this moves one memo field at a time, record by record. e.g. Read First recordset in Access, copy to variable, assign value to Excel row/column Then move next on each Access and Excel. 
 
Solution 2: 
An Access Memo filed [RxNotes] can have up to 750 characters. Cut it apart into three new fields that end up out in the very right Excel columns AA, AB, AC.
Note1=Mid([RxNotes],1,250)
Note2=Mid([RxNotes],251,250)
Note3=Mid([RxNotes],501,250)
Then using Excel Object - Concat the cells back cell by cell...
X2=CONCATENATE(AA2,AB2,AC2)) 
Then delete the columns AA, AB, AC to hide the evidence..Neither solution is all that elequent. Read about this and by golly, it made a difference
ConcatComments = "'" & CommentString 
Before using the CopyFromRecordset be sure to add a single quote in front of the large string.
Turns out the interface between Access and Excel look for this to prepare Excel immediately for the string to be a string, not something else. Some of my strings had weird print characters that kind of looked like Japenese characters. It seemed random, it always happened if the string was 255 or more characters (ramdonly, not always). The single quote doesn't show up in Excel, but got rid of all the noise.
	
	View Replies
  
    
	ADVERTISEMENT
    	
    	Nov 16, 2007
        
        I haven't seen anyone run into this particular problem on this forum... 
I'm importing data from an excel spreadsheet to an MS Access (2007) table.  One of the fields in the table is a text memo field able to support more than 255 characters...
Issue:
The issue is that any cell in Excel that is greater than 255 characters is truncated when imported to MS Access even though the field is a memo field.  There isn't any documentation on Microsoft's website about this and I don't see any way to work around it other than manually copying the data from excel to MS Access.  
Anyone have any input on this matter?
Thanks in advance!
	View 3 Replies
    View Related
  
    
	
    	
    	Jan 10, 2005
        
        When I export a report to Excel, a memmo field is truncated to 256 characters. If I export the query behind the report, the memmo field is exported correctly. Is there a way to export an Access 2003 report to Excel and maintain all of the data and report formating in memmo fields?
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 4, 2005
        
        I created a Union Query for several linked Excel tables.  Certain fields in the Excel table exceed 256 characters and Access (rightfully so) assigns these fields as "Memo".  I have create a report based upon the Union Query; however, it will truncate the "Memo" fields to 255 (or 256 characters).  
 
As a side note, if I create a report based upon a simple query using only one of the linked tables, it does not truncate the field.
 
Any suggestions on what maybe causing this truncation issue?
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 11, 2013
        
        I've got some code that loops through a record and copies the non-null fields to another record. This is the partial code:
For Each fld In tdf.Fields
    If Not IsNull(Forms!contact_lookup![Contact_sub subform1].Form(fld.NAME)) Then
        strSql = "UPDATE tbl1 SET tbl1.[" & fld.NAME & "] = '" & Forms!contact_lookup![Contact_sub subform1].Form(fld.NAME) & "' " & _
                 "WHERE tbl1.[FC_APN] = '" & Me.txtApn & "';"
        DoCmd.RunSQL strSql
    End If
Next fld
This works fine until it encounters a field whose contents has a reserved character, like a single quote (" ' ") in it, for example, "What's the what." At that point the SQL thinks there's a " ' " missing in the statement, and I get an error 3075 (syntax error: missing operator).
	View 2 Replies
    View Related
  
    
	
    	
    	Jun 13, 2014
        
        I'm having an issue where when I attempt to export data from an Access database to an excel spreadsheet using VBA it truncates any field longer than 255 characters to the 255 limit. I'm using 
Code:
DoCmd.TransferSpreadsheet acExport, acSpreadsheetTypeExcel12, "tableName", "FilePath", True, ""
 to export it (obviously with the table name and filepath filled in) but for some reason I cannot get it to export the entirety of the field to excel. I've been doing some digging on various forums around the internet and it seems as though it may be possible to split it into various excel cells then use automation to concatenate the cells. But considering this field I am trying to get not truncated can be up to 40,000 characters theoretically, it doesn't make sense to do it that way.Do you need more information from me? I'm somewhat new to both Access and VBA.
	View 2 Replies
    View Related
  
    
	
    	
    	Feb 26, 2015
        
        The excel worksheet that I am importing into my database has some formula's, for an example =2+2. I am importing this worksheets, then checking fields against the main table, then exporting back to Excel. But I want to be able to keep the "=" signs when I import to remain so that when I export back into Excel the columns with the formulas will already be there.
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 31, 2015
        
        All I need to do is copy an excel file from a location (while coping the file, the location of the source file remains same all the time)and paste that excel file where ever I want (Browser Option) from an Access VBA.
	View 4 Replies
    View Related
  
    
	
    	
    	Dec 20, 2003
        
        Hi
I'm new to forum and can't find an answer to this problem. I am using Access 2002 and have a memo field in a form that I want people to be able to type in as much text as they want. This is then displayed in a report. The form accepts the text with no problems however when I view it in the report it has been cut to 255 characters as if it is a text box. I have set the properties to 'can grow' to no avail. I have searched the MS Knowledge base for a solution with no luck. I admit I'm not an expert in Access and would really appreciate some help as I have been trying to overcome this problem for days.
	View 2 Replies
    View Related
  
    
	
    	
    	May 28, 2015
        
        I am copying a range from excel (multiple rows) and paste it directly to access table using:
Code  :  DoCmd.RunCommand acCmdPasteAppend
Sometimes it does not work and I need to use paste special as text.
Is there any way to paste special as text using VBA ?
	View 3 Replies
    View Related
  
    
	
    	
    	Jan 15, 2008
        
        Hello,
I have an unbound form where the user enters feedback, usually > 255 chars.  When they hit the "Submit" button, an append query adds this to a memo field on a table.  A memo field should be able to hold 65,000 some characters however everything after 255 turns into a special character, mostly boxes.  Any ideas on how to retain the text?
Thanks for any suggestions!
Stone
	View 2 Replies
    View Related
  
    
	
    	
    	Sep 17, 2013
        
        I have been trying to figure out this issue concerning the memo field in the database will only send about 255 characters. I am using the cmdEmail AssignedTo : On Click macro and the Message text and have two memo fields and only one will display and the one that does only displays about 255 characters
 
The message text ="Issue" & ":" & Chr(13) & [COMMENT] & Chr(10) & "Resolution" & ":" & [RESOLUTION] & Chr(10).
	View 1 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
  
    
	
    	
    	Jun 20, 2015
        
        How to open a pre filled excel template in read and write mode from msaccess vba and insert data from msaccess tables into specific columns in excel. 
Rename the tabs in excel sheet based on a specific column in the access data.
Each row in the table will go to a seperate tab in excel.
Save the excel template after populating the necessary data into different tabs.
	View 3 Replies
    View Related
  
    
	
    	
    	Dec 2, 2014
        
        I have a form where when the user clicks on the browse button then excel workbook filepath gets stored in the textbox as below:
Code:
Private Sub CommandButton1_Click()
ChooseFile
End Sub
Sub ChooseFile()
 Dim fd As FileDialog
Set fd = Application.FileDialog(msoFileDialogFilePicker)
 
[Code] .....
Please see attached the excel workbook. Everytime the user will select Excel workbook using Browse button. Now in that file , the first sheetname will always be "Summary". I want to perform the following steps:
 
1. So now I want VBA code to copy the data from columns "Withdrawn","Obsolete","Updated","LitRef" from Summary sheet to the Access table named tblSummary. 
 
2. When the data gets copied in Access table then write So VBA code that will check if the data in field LitRef in table "tblSummary" is present in field "Reference" of Access table "tblliterature" . if its present then check in the tblSummary , which corresponding fields out of "Withdrawn","Obsolete" and "Updated" stores "Y" .
3. If "Withdrawn" field value is "Y" then change the status of corresponding record of tblliteraure to "Withdrawn" 
4. If "Obsolete" field value is "Y" then change the status of corresponding record of tblliteraure to "Obsolete" 
5. If "Updated" field value is "Y" then change the status of corresponding record of tblliteraure to "Updated" .
	View 14 Replies
    View Related
  
    
	
    	
    	Jul 11, 2013
        
        I need some simple code that will copy an Excel file or a table in Access to a specific location on an FTP server.  I would think this would be a very simple task, but I have yet to find any sample code that is *simple*.  I have seen lots of code that requires downloading this dll or that mda, but the examples don't work.  There must be something built into MS Access 2010 that will allow a file to be uploaded to an FTP site.  
All the variables are known:
The FTP location (it never changes)
The FTP Username and Password (they never change)
The destination folder on the FTP site (it never changes)
The File type  (it never changes)
The File name (available from the form in Access from which this will be executed)
I can either produce an output file, then copy it to the FTP site, or I can export the table directly to the FTP site with the file name for that day.
This seems to be a very simple task with no simple solution.  Currently I am using an FTP app to get the file to the FTP site, but I would like to automate this.  The process that creates the output file is already automated, so I would just like to add this to the existing code as its own module.
I'm looking for a simple command on the idea of:
DoCmd.FTPFile, acExel, TableName, FTPFilePath, FTPFileName, Username, Password, acUpload
 just made all that above up and none of it is a real function/command in VBA, but is just the kind of thing I'm looking for.
I would think that since I can download and XML file from an FTP site that it should be child's play to upload a simple file to an FTP site, but I can't figure it out.
	View 8 Replies
    View Related
  
    
	
    	
    	Jul 1, 2013
        
        I am using Access 2010.Most of the time a tenant pays his exact rent.  When that happens, I currently type in the payment (taken form the Rent field) and date of payment (current date) into a form.  The date should not change.
 
I would like to place a checkbox into the form.  If checked, the rent would be entered into the payment field and payment date (current date) would be entered automatically.  Otherwise, I would just enter in the payment and date manually.
 
FIELDS
Rent
 
Payment
PaymentDate
 
on form chkPayment
	View 4 Replies
    View Related
  
    
	
    	
    	Sep 28, 2005
        
        Hi,
I've read a bit on exporting Access fields longer than 255 characters (Memo) into Excel, and the general concensus is that it cannot be done.
All I need to do is run a report, right click the report, and select Export from the menu.
However, if it can be done using a query, any assistance or pointing in the right direction will be greatly appreciated.
Thanks..
Chris
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 18, 2013
        
        I have a strange issue where im importing an excel using docmd.transferspreadsheet. I have a memo field which is importing fine and is not being truncated but I have another which is being truncated every time. The destination field is set to memo and the top cell in the excel is over 255 chars yet it still truncates. The other column does not truncate for some reason. 
	View 2 Replies
    View Related
  
    
	
    	
    	Nov 30, 2004
        
        In importing data from Excel 2002 to Access 2000, I have several columns of text data that has more than 255 characters; however, importing into Access does not give me the option to redefine those data fields from "Text" to "Memo". As a result, Access truncates the data to 255 characters.
 
Is there anyway to work around this issue by still using the Excel file? I have saved the Excel file as an HTML file and this seems to work, but it is an extra step that I would like to avoid.
 
Thanks for any help.
	View 1 Replies
    View Related
  
    
	
    	
    	Jul 24, 2015
        
        We need to move rich text from an Access memo field to a Word text box.  So far the best Ive been able to come up with is in the code below.  In this code pprs!What is a record set field of a table memo field that is bound to a text box enabled for rich text.  The rich text seems to be stored as html as so I can get word to convert it by enclosing it in html tags.
Dim What As Word.Shape
Set What = doc.Shapes.AddTextbox(msoTextOrientationHorizontal  , doc.PageSetup.LeftMargin, 225, 534, 0)
Dim sPath As String
sPath = "G:Temp.html"
Open sPath For Output As 1
Print #1, "<HTML>" & pprs!What & " </HTML>"
Close #1
What.TextFrame.TextRange.InsertFile (sPath)
	View 2 Replies
    View Related
  
    
	
    	
    	Jul 13, 2014
        
        Its been a few years since I used Access, and despite searches I cant find what I'm looking for. I have a VERY simple form, with only one record on it - "address". I have some print buttons which will print that address to different size labels, and some navigation items, but only one actual record - which is "address" (in the table, this address is a MEMO)
I would like to have a command button that when clicked copies the current record, and opens an existing Excel Spreadsheet and pastes that address into  (for example) cell C8
Can it be done easily? Is there a DoCmd.TransferSpreadsheet kind of secnario that works with current record only?
	View 8 Replies
    View Related
  
    
	
    	
    	Mar 18, 2014
        
        Some vba code which is able to get the last updated or last modified value of an excel file stored in a folder in a shared drive  and update a field on a form in ms access.
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 7, 2014
        
        I have spent the day using Access 2010 and attempting to move information from a parameterized query into specific cells in an excel template. It runs smoothly until I attempt to reference the query at which point I run into th error "Too few parameters. Expected 1." Currently my reference code looks like this:
 
Dim T As Recordset
Set T = CurrentDb.OpenRecordset("SELECT [8D Data].ID, [8D Data].[Customer Closed], [8D Data].[Days Open], " & _
      "[8D Data].[Open Date] , [8D Data].[QN #], [8D Data].[Last Report Date], " & _
      "Leaders.[Leader Name] , Leaders.[Leader Title], Leaders.[Leader Phone #], " & _
      "Leaders.[Leader Email], [8D Data].[Part Description], [8D Data].[Customer P/N], " & _
      "[8D Data].Customer , [8D Data].[Vehicle Year], [8D Data].[Problem Description]" & _
      "FROM [8D Data] INNER JOIN Leaders ON ([8D Data].Lead = Leaders.ID)" & _
      "WHERE ((([8D Data].ID)=[Enter QCR #]));")
	View 4 Replies
    View Related
  
    
	
    	
    	Oct 11, 2005
        
        Hello, I am here back in the forum because would like some help to define a code.
Meloncolly has already helped me but I think that I have mixed up two pieces of code and cannot find the solution.
I need to export my access data to a document in excel.
I will select the recorset of the data to export, using a combo box on a form named MENU.
The excel file is a template named MASTER. Before the recorset is copied, I need to make a copy of the template via code. The copy will be the document into which copy the data. Once the data is copies, I would like an input box asking users if they would like to save the new excel file and be able to name it with the name they will type in the input box.
My last problem is that the database is used by 20 users and what happens if are all exporting to the template? Will this automatically name itselft, MASTER1, MASTER 2, etc?
This is the code that I am using and tried to put together. It does copy the data into master 1 but leaves the template opened. It also tells me that there is something missing.
THanks:
Private Sub ExportToExcel_Click()
Dim myid
Dim obj As Object
Set obj = GetObject("C:	estMaster.xls")
'Dim mypath
obj.Application.Visible = True
obj.Windows(1).Visible = True
obj.Application.ScreenUpdating = False
myid = Me.[MyCombo]
'grab the three field values from the table
Dim mySSN, myFirstname, myLname
mySSN = DLookup("[WESSN]", "[MASTER]", "[id]=" & myid)
myFirstname = DLookup("[WEFN]", "[MASTER]", "[ID]=" & myid)
myLname = DLookup("[WELN]", "[MASTER]", "[ID]=" & myid)
'open excel and the required file
Dim appXL3 As Excel.Application
Dim blnStartXL3 As Boolean
On Error Resume Next
' Check if Excel is already running
Set appXL3 = GetObject(, "Excel.Application")
If appXL3 Is Nothing Then
blnStartXL3 = True
'Else
' We have to start Excel ourselves
Set appXL3 = CreateObject("Excel.Application")
If appXL3 Is Nothing Then
MsgBox "Can't start Excel", vbExclamation
GoTo exit_handler
End If
End If
With appXL3
'.Visible = True
On Error GoTo Err_Handler
'open the excel file
 'mypath = "C:	estMaster.xls"
'.Workbooks.Open mypath
.ActiveWorkbook.SaveAs "c:	estMaster1.xls"
.Sheets("Data").Select
'enter variable values into cells
.Range("B6") = mySSN
.Range("B3") = myFirstname
 .Range("B5") = myLname
'do some other stuff
'save the workbook
.ActiveWorkbook.Save
'close it too
.ActiveWorkbook.Close
.ActiveWorkbook.Close
'exit and tidy up
exit_handler:
On Error Resume Next
If blnStartXL3 = True Then
'We must quit Excel
appXL3.Quit
End If
Set appXL3 = Nothing
Exit Sub
Err_Handler:
MsgBox Err.Description, vbExclamation
DoCmd.SetWarnings True
Resume exit_handler
MsgBox "The tables have been successfully exported to " & txtExportFile & "."
Exit Sub
End With
End Sub
 
	View 3 Replies
    View Related
  
    
	
    	
    	Sep 9, 2013
        
        I am trying to do a select query in excel vba like the below and would like to put the result in one of the macro variable in excel vba. 
lngAMT = accdb.execute "SELECT Sum(Summary.NQ) AS SumOfNQ FROM Summary HAVING (((Sum(Summary.NQ))<>0));"
	View 6 Replies
    View Related