Modules & VBA :: Getting Extra Characters In Column
			Aug 16, 2014
				Copying a column from one record to another.  Code is:
Code:
                Set fld = Records.Fields("violationLocalOrdinanceNumber")
                If Len(fld & "") > 0 Then
                    rst!LOR_NB = Nz(Records!violationLocalOrdinanceNumber, "")
                    Debug.Print ("LOR NB:" & rst!LOR_NB & "." & " len:" & Len(Nz(Records!violationLocalOrdinanceNumber, "")) & " len new:" & Len(rst!LOR_NB))
                End If
Some of the output I'm getting is:
LOR NB:8.08(5)                  . len:7 len new:25
LOR NB:7.08(5)(a)               . len:10 len new:25
LOR NB:7.08(5)(a)               . len:10 len new:25
LOR NB:7.08(5)(A)               . len:10 len new:25
LOR NB:7.08(5)(A)               . len:10 len new:25
LOR NB:7.08(5)(a)               . len:10 len new:25
LOR NB:8.08(5)                  . len:7 len new:25
No matter what the original string length is, something is adding extra spaces and forcing it to 25 in the new record.  This is the only field I've been able to identify with this issue.  Column definition is char(25), no indexes or anything special that I can tell.
Tried adding a left() function call after the assignment but that didn't work either.
	
	View Replies
  
    
		
ADVERTISEMENT
    	
    	Oct 24, 2005
        
        Hi guys,
Im using Access
i got this problem:
I have a list of street numbers, eg 1, 4, 8, 33, 44, and also some that contain some alphanumeric characters: eg: 21A, 21B, 21C.
I need to find out how to determine if a string has an alphanumeric character or not. I have used the access help but it is very vague and also Ive googled. One answer I found was to write a module, but Im not sure if thats the best way.
Please help as Im really stuck.
thanks in advance.
	View 1 Replies
    View Related
  
    
	
    	
    	Aug 20, 2015
        
        I am trying to add extra validation in a sample db (done in A97 (converted to A2003)see attached.
 
I am attempting the following: Please not that the db has existing validation which I would like to keep (or change if advised) ...
Conditions:
1. Input into field "ID" must start with the letter P or p or R or r
2. If field  "ID" starts with the letter P or p and field "Code" starts with the letter R or r, then a message stating that this combination is invalid should appear
3. If field  "ID" starts with the letter R or r and field "Code" starts with the letter P or p, then a message stating that this combination is invalid should appear.
	View 3 Replies
    View Related
  
    
	
    	
    	Nov 30, 2014
        
        I need to input a string into a column named "EventType". The code should first check if the column "Agent Name" contains any strings. If there is none, it will input "IBM Director" into the EventType column.
Once it has looped through the agent names, the code will then loop through the Details column and input into EventTypes based on what is displayed within the string.
These are the codes that I am using to achieve this, however nothing is being input into the EventType column.
Code:
Private Sub Command11_Click()
    Dim dbs As DAO.Database
    Dim rst As DAO.Recordset
 
    Set dbs = CurrentDb
    Set rst = dbs.OpenRecordset("Final")
[Code] ....
I think the problem lies with the code that checks the agent name. When I removed it, it managed to populate the EventType column based on the details. But I still need to find out how to check the agent name too.
	View 4 Replies
    View Related
  
    
	
    	
    	Jan 2, 2014
        
        I have created listbox with one column (contains one column only), now i would like to display all the characters of list item (want scroll bar to listbox).
How do i display all text of list item, I have already fixed  Column Widths to max length (22";0.1"). However when scrolling to right, it is going to next blank column of list box, which is created only to change Column Widths property.
	View 12 Replies
    View Related
  
    
	
    	
    	Feb 28, 2014
        
        I want to convert a number column into a  text column.
Number Column is called Customer.
Below I can't match to the other table containing the text column Customer No.
How can I convert columns in vba?
Code:
strSQL = "SELECT CALCULATED_Forecast_TNS.*, USEFUL.TRP_in_EUR " & _
         " FROM USEFUL INNER JOIN CALCULATED_Forecast_TNS ON (CALCULATED_Forecast_TNS.[Reference No] = USEFUL.[Reference No]) AND (USEFUL.[Customer] = CALCULATED_Forecast_TNS.[Customer NO])"
Set qdf = CurrentDb.CreateQueryDef("REPLACABLES", strSQL)
DoCmd.RunSQL "UPDATE REPLACABLES SET CALCULATED_Forecast_TNS.TRP_in_EUR = USEFUL.TRP_in_EUR"
	View 1 Replies
    View Related
  
    
	
    	
    	Apr 16, 2015
        
        DoCmd.RunSQL (" update tbl_userinformation SET [05-Henrichpiramid] = Yes where Username= Text146.value  AND actualdate=Text148.value ;")
DoCmd.RunSQL (" update tbl_userinformation SET [combination] = [05-Henrichpiramid] where Username= Text146.value  AND actualdate=Text148.value ;")
 
i want to update the column combination to its last value with concatanation to the value of current column.
	View 11 Replies
    View Related
  
    
	
    	
    	Sep 18, 2013
        
        I have a table that contains:
item | quantity
123 | 1
456 | 10
789 | 4
I need to get this data listed into a table that just has item and for it to look like this:
123
456
456
456
456
456
456
456
456
456
456
789
789
789
789
I understand and have accounted for the obvious primary key issue.how to get the data to display out like this.
	View 1 Replies
    View Related
  
    
	
    	
    	Mar 24, 2014
        
        I would like to cut off the first 6 and last 2 Charaters in an after update event but not sure how, I cannot use mid as the length of the string may change but never the first 6 or last 2, can some one show me how it's done ...
	View 4 Replies
    View Related
  
    
	
    	
    	Jun 26, 2014
        
        I'm working on an eBay uploader access program for Ebay's File Manager
Our description contains line feeds and carriage returns. I have very little knowledge of Vba, and I can t find any tutorials on how to replace the characters with spaces on how to program this.
The table is called tblCustomer
The field is called *Description
I'm using access 2007
	View 9 Replies
    View Related
  
    
	
    	
    	Feb 25, 2015
        
        I have a Memo field that is used to be a description of a document. I don't know what the user will put in (could be anything), but it is eventually passed in a string to a query, etc.I discovered during testing that if an apostrophe is entered (Ex: This document explains how to deal with Joe's pleasant disposition.), it breaks my code. I then realized that all reserved words and characters would cause this problem.
I can get around this one just by using Replace(str, "'", "''"). However, I know there are others that will cause problems, and I don't want to end up with a string of replace statements just to fix them. 
	View 2 Replies
    View Related
  
    
	
    	
    	Oct 28, 2013
        
        I am currently using 
 
Code:
Private Sub Form_Open(Cancel As Integer)
    Const cstrPassWord As String = "open"
    Dim strPassWord As String
    strPassWord = InputBox("Password:")
    If Not strPassWord = cstrPassWord Then
        Cancel = True
    End If
End Sub
to password protect a form within my database. it is working great however i was wondering if there is any way to make the characters appear as **** when entering the password? 
	View 9 Replies
    View Related
  
    
	
    	
    	Dec 18, 2013
        
        I have a table called: "tb_special_characters" with a field name [character]. In this table are values that I would like to remove from fields in another table ("tb_data", field name [Title]
The values in the "tb_special_characters" are thinks like 
.
@
}
I'd like to run a query on tb_data.title that would replace any matching characters in tb_special_characters.character with nothing (I remove and close any spaces).
	View 2 Replies
    View Related
  
    
	
    	
    	Nov 7, 2013
        
        Is there an easy way in VBA to loop through a recordset and determine if the text string in a text field includes numeric characters?
I'm trying to do something like this:
Code:
Do Until rst.EOF
rst.Edit
If Left(rst!FldText,10) contains any numeric characters Then
rst!FldType = "Mixed"
ElseIF Left(rst!FldText,10) contains "PO" Then
rst!FldType = "PO"
Else
rst!FldType = "Std"
End If
rst.Update
	View 2 Replies
    View Related
  
    
	
    	
    	May 6, 2014
        
        I'm using Access to create some web page templates. To Do this I have a memo field called "Description" into which I'm entering text. Example:
This is an obvious description example
What I need to be able to do is put a "<p>" before each sentence and a "</p>" at the end of each sentence. Examle
<p>This is an obvious description example</p>
The information is stored in a form page, and the text have paragraphs.
	View 1 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
  
    
	
    	
    	Feb 20, 2014
        
        I use the below code as part of a database which creates documents and then saves them using data from the form fields. 
 
Every now and again one of the form fields contains a "special" character such as /,@,& and this prevents the file from saving. 
 
Is there a simple addition to the below code to remove special characters from the file name if there is one present? 
It causes all sorts of issues as many people don't realise that there has been a problem until it is too late.
Code:
        objWord.ActiveDocument.SaveAs2 FileName:="C:UsersPublic" & Forms![Front Page]![Site 2 Name] _
         & " " & Forms![Front Page]![Combo79] & " " & "O2" & ".doc"
         objWord.ActiveDocument.Close
	View 9 Replies
    View Related
  
    
	
    	
    	Sep 25, 2013
        
        I would like to know how to limit a field on a form to only Alpha Numeric characters. 
Example: ~AAUZNTO
This would be scanned by a bar code and I want the field to show only this when scanned: AAUZNTO
	View 14 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
  
    
	
    	
    	Dec 9, 2013
        
        I have a textbox with about 400 characters, I also have 5 textboxes next to it. I want to click a button and I want to transfer the characters to the other textboxes 208 characters at a time.
	View 3 Replies
    View Related
  
    
	
    	
    	Jul 29, 2013
        
        I have an asset database I am designing to manage our computer inventory and assets.
I am trying to get a DLookup to work with one of my forms that will auto-populate some of the fields depending on what is entered in to the ProductID field.  For instance, Make, Model, Asset type...
My problem is that the string that returns contains special characters, specifically "#"  and gives me the error message -
Run-time error '3075':
Syntax error in date in query expression 'productID=EN371UA#ABA'.
My expression is definitely working, it just looks like it things it has something to do with date/time which it does not.  Unfortunately, most HP equipment contains a # in the Product ID number.
Here is my expression - 
Private Sub ProductIDCombo_AfterUpdate()
    Make = DLookup("Make", "productlist", "productID=" & [ProductIDCombo])
End Sub
Make is the field I am looking up from the ProductList table.  The Product ID is the ID I'm looking up from the ProductList table to find the make.  My problem is actually getting it to return the correct value of "HP or Dell or Lenovo".  etc.
	View 12 Replies
    View Related
  
    
	
    	
    	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 5 Replies
    View Related
  
    
	
    	
    	Jan 1, 2006
        
        Hi All,
For some strange reason, a replica db is being created along side the original. I don't believe it's a back up since the name back_up usually appears in the file name.  I've seen it happen once when the proper mdb file was opened and then noticed the new db was created (always called db1.mdb).  It's a permanent file mdb file and not the record locking icon.  I remember over the summer someone posted a similar problem but I haven't been able to locate that thread.  Any suggestions?
Thanks
	View 2 Replies
    View Related
  
    
	
    	
    	Mar 8, 2008
        
        Although I have been using access for a year or two (self taught) I have only recently noticed that the form toolbox (the one with combo boxes and buttons etc on it) appears to have a library of procedure calls for calendars and all sorts of things sitting there waiting to be used.  Is there a list somewhere of what all this lot does?  I have been playing with a couple of date pickers but I don't particularly want to go through all of the rest to see what they do or if they would be useful.
Thanks
	View 2 Replies
    View Related
  
    
	
    	
    	May 28, 2006
        
        Hi 
Does anyone know how to delete the extra  blank fields you get at the end of a query. I am converting the query to a handheld database with a field limit and the extra fields push my field count over the limit. i have tried just 'deleting' them but they reapear when I reopen the query. they definitely count as fields because if I delete some real fields i can do the conversion. i dont want to alter the structure of the original database as it has been in use some time and works well. any ideas  advice 
Thanks 
supateach
Hi again
I am still having problems with too many fields in my query so it will not convert to a handheld database. I have tried making a test query (with the wizard)from the same table and sure enough there are extra fields at the end, which do not come from the table, which reappear after they have been deleted, when you reopen the query. I have attatched the query to illustrate that I have deleted the fields and then they reappear. It does appear to be impossible to get rid of them, in which case I shall have to decrease the number of 'real' fields to get below the max the handheld can convert. Any advice gratefully received
Thanks 
supateach
	View 1 Replies
    View Related
  
    
	
    	
    	Jan 9, 2007
        
        I have a table t1 which contain many records, the field look like:
id f1 f2 f3 ---fn
Id is the primary key
I have some records which have different id but exact the same other fields.
like
id f1 f2 f3 ---fn
87 1 4   6 ---9
12 1 4   6 ---9
18 1 4   6 ---9
116 1 4   6 ---9
1287 1 4   6 ---9
98787 1 4   6 ---9
for those records, I only want to keep one record (any one) and remove all others. How can I do that?
Thanks.
Jeff
	View 1 Replies
    View Related