Modules & VBA :: Blank Out Password Characters?

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 Replies


ADVERTISEMENT

General :: Return Based On Criteria - Records With Less Than 5 Characters Or Blank

Aug 28, 2013

I have a table with Zip CODE field. I uploaded my information to this table form an excel file. There were over 120K rows of data so no way i could do this in excel.

So I found that some of the ZIP codes are either blank or have less than 5 digits.

Can I build a a query with the ZIP code field that will return all zip code records with less than 5 characters or blank. I'd like to repair these zip codes and a update query will be my next step.

I repeat excel is not an option because when I try to sort by the Zip Code column my computer explodes (okay not literally) ....

View 3 Replies View Related

Modules & VBA :: Cut Off First 6 And Last 2 Characters Of String

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

Modules & VBA :: How To Replace Characters With Spaces

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

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 4 Replies View Related

Modules & VBA :: Remove Special Characters

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

Modules & VBA :: Find And Replace Special Characters

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

Modules & VBA :: Check If String Contains Numeric Characters?

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

Modules & VBA :: Web Page Template - Adding Characters Before And After Sentence

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

Modules & VBA :: SQL To Copy Field Contents With Reserved Characters

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

Modules & VBA :: Remove Special Characters From File Name (when Saving)

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

Modules & VBA :: Limit A Field To Only Alpha Numeric Characters

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

Modules & VBA :: Preserving Characters From Excel Import To Access

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

Modules & VBA :: Transfer Characters To Textbox On Button Click

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

Modules & VBA :: Asset Database - Special Characters In DLOOKUP Expression

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

Modules & VBA :: Open Another Database With Password

Aug 26, 2014

I am trying to open a database with a password (I know the password) from another database however I cannot work out how to do it. I have been using this code to do this to open databases without passwords for a while.

I am using Access 2007.

Code:
Private Sub Command36_Click()
Const cstrClientFEPath = "G:Templates"
Const cstrFEFile = "db.accdb"
Dim intX As Integer 'Utility var

[Code] ....

View 3 Replies View Related

Modules & VBA :: User Change Password

Jun 22, 2015

So I have a login system established with loginID, passwords, and different user types. I also have a User Change Password form. However, this form only allows the user to change their password to something new. Also, for some reason the form only allows the first user in the table (ID#1) to be changed regardless of who is logged in. I was using an embedded Macro. I need to be able to have the old password entered and verified before the password can be changed to something new.

View 4 Replies View Related

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 5 Replies View Related

Modules & VBA :: Validate Username And Password In A Button?

Jan 20, 2014

I would like to ask how can i validate the username and password in a textbox? I have a frmLogin and frmMain.

I have also a table called 'tblUsers' with column fields 'username and password'.

If username is not found in database then a msgbox will prompt 'Username is not yet created'.

If username is okay and password is incorrect then msgbox will prompt 'Incorrect password'

If username and password is okay, then a msgbox will prompt 'Successfully login' and will continue to frmMain.

View 3 Replies View Related

Modules & VBA :: Transferring A Form To Password Protected DB

Feb 10, 2014

I have a mdb file that does not have database or user level security, but it does have a VBA password.I want to transfer (overwrite) a new form to this database from another Access database. The form I'm exporting has VBA code. When I try using docmd.TransferDatabase I get an error. The error is:

"The TransferDatabase action was canceled."The line is:

DoCmd.TransferDatabase acExport, "Microsoft Access", txtCheckInFile, acForm, "SubformLineSummaryContractor", "SubformLineSummaryContractor", False, False

where txtCheckInFile is the location and mdb file name I'm trying to send the export.It might be because the form already exists. So, if I go into the database and delete form, and repeat the export I get the message:

"Microsoft protect this Visual Basic for Applications Project with a password. You must supply the password in the Visual Basic Editor before you can perform this operation."My question is it possible to transfer a form to a MDB that has a passworded VBA? I know the VBA password.If not, perhaps it is possible to remove the VBA password in the database (using VBA), make my export, and then add the password back in?

View 2 Replies View Related

Modules & VBA :: How To Handle User Forgot Password

Apr 16, 2015

code for the "Forgot Password?" button on a login screen? I want an email notification sent to me if someone has forgotten their password, and/or automatically reset their password to a default value based on their user name.

View 4 Replies View Related

Modules & VBA :: Validate Password Case Sensitive

Jan 20, 2014

I'm new to access vba and I'm trying to create a login form. I have already my code to login but i want to validate the password in 'case sensitive' basis. Below is only what I've got so far.

Code:
Private Sub cmdLogin_Click() Dim login_validation As Variant login_validation = DLookup("Password", "tblLogin", "Username='" & Nz(txtUsername.Value, "") & "'") If Nz(login_validation, "") <> Nz([txtPassword].Value, "") Then MsgBox "Incorrect Password. Please try again." txtUsername.Value = "" txtPassword.Value = "" txtUsername.SetFocus Else MsgBox "Hi " & txtUsername.Value & "," & vbNewLine & vbNewLine & "you have successfully login!" DoCmd.OpenForm "frmMain" End If End Sub

View 5 Replies View Related

Modules & VBA :: Assign Password To Buttons In Forms

Feb 26, 2015

I have a form called departments . one that form i have 5 buttons. I want this form only to open when some logs onto the database . The buttons represent each department ...

1. sales
2 purchasing
etc etc

Is it possible to assign a password to those buttons so each department has security to their own form ...

View 8 Replies View Related

Modules & VBA :: Linking Back End Database With Password?

Apr 28, 2014

I have a Back end (with password) which resides in a netdrive while the front end is installed in each individual users desktop, the problem is, some of the users netdrive was mapped in a different way (different letters..some are J others are G). I'm looking for code that I can relink the database to the front end in runtime, I did try to look in the net but I can't find anything that I can put the password as parameter.

this sample code from Dev is good, but i got an error because the database requires a password.where i can put the password?

Code:

Function fRefreshLinks(NewDbName As String) As Boolean
Dim strMsg As String, collTbls As Collection
Dim i As Integer, strDBPath As String, strTbl As String
Dim dbCurr As Database, dbLink As Database
Dim tdfLocal As TableDef

[code].....

View 8 Replies View Related

Modules & VBA :: Map Drive On Server Which Is Password Protected

May 7, 2014

I need to map drive on server which is password protected..so i used this:

Code:
persistent = false
set objNetwork = WScript.CreateObject("WScript.Network")
objNetwork.MapNetworkDrive "driveletter:", "serversharename", persistent, "username", "password"

but I get an Error 424 'object required'
in this:
set objNetwork = WScript.CreateObject("WScript.Network")

some other method to map password protected drive

View 3 Replies View Related

Modules & VBA :: Adding Password To A Document Before Emailing

Jul 2, 2015

I have built a simple database (by no means complete) but I am after adding some further code into it. Basically on the form [FrmMain] I have a button that allows me to send a document to a relevant CSU contact. It finds the file name based on the info in the table TblResident. What I want to do is open the word document before sending and add a password to it using vba.

View 1 Replies View Related







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