Modules & VBA :: Transfer Company Name From One Form To Another Form

Jan 17, 2014

i have a customer form and on the form i got a button to add equipment which opens another form, my question is how can i get the same company name from the customer form to be in the equipment form once i press the button?

i have done this so far

docmd.openform "EquipmentF",,,(not sure what to put here....i've tried "company = '" & company & "'" but this just seems to open the first company)

View Replies


ADVERTISEMENT

Modules & VBA :: Transfer Data From One Form To Another

Aug 28, 2014

I would like to display a text entered in form1 (text box) to another combo box which is appearing in form2.

View 14 Replies View Related

How To Autofill Company Info In Employee Form By Pressing Button

Oct 6, 2005

Hi there,

I am stuck for over a week now, and tried just about everything I am capable off ...

I have two forms: COMP (where I fill in fields for Company Table) and PERS (where I fill in fields for Person Table).
On the COMP-Form I have a button, named: 'Add Person/Employee to Current Company'.

The two tables (Company and Person) are linked by PK - FK (PK_CompanyID & FK_EmployedAtID).

I can't get it to work properly.
The PERS-form must be filled with the company info I filled in the form COMP, after I press the button.
But the PERS-form also must be filled out normally (not via COMP, but seperately), choosing the company in the comboboxfield 'Company Name' on the PERS-form. Do you stick with me?

So I want to start the PERS-form with the filled in company Info by pressing the button.
And I want to be able to start the Form seperately (which I can off course) and choose the company myself , by selecting the right company in the combobox.

I have a attachment sent with this.

Can someone look at this for me, and explain what I am doing wrong.

I tried to do it with a autofill macro, and with some code ...

I just don't seem to get it right.

Thanx in advance for all the help,

Quinten

View 1 Replies View Related

Transfer Data From One Form To Another?

Mar 23, 2007

I have a form with Driver details ie: Fields with Drivers Name, Payrole No,Vehicle Reg and Fleet No. When this form is filled in the form will be closed, the next forms in my db are vehicle defects which I want the vehicle reg and Fleet No: automaticly entered from the drivers detail form also a running sheet which I want the drivers name and fleet No: transfered to Automaticly. Is this possible??
Please Help

View 1 Replies View Related

Transfer From Form To Table

Jul 11, 2006

Hi All,

Im trying to make up a vb command to send date from a query based from to a table i have no clue how to even start.

The database is to record when a item is inspected so a user would type the date in to a unbound box and then at a click of a button the date along with the id code will transfer in to a table so that i can compair the difference between the dates of any one item

is this possible and how???


Many thanks in advance

View 3 Replies View Related

Transfer Value Before Form Closes

Dec 12, 2006

i want to send an id from 'job' to 'job1'.

the job form needs to be closed before the job1 form opens..

i want to do something like this..

job form
Private Sub Form_BeforeUpdate(Cancel As Integer)
DoCmd.RunCommand acCmdSaveRecord
DoCmd.Close
DoCmd.OpenForm "job1"
End Sub

and then on job1 open event use

Me.txtjobref = Format(Forms!job.jobref, "00000000")

the problem is that the job form will be closed so how can i transfer it?

View 14 Replies View Related

Transfer Text Values To Another Form

Apr 12, 2005

I have a main data entry form (frmpartquote). From this form I would like to open a new form (products) to create a sub set of records.

When I open the new form to add products to a main quote I would like to transfer the quotenumber on the quote form to the quotenumberfield in the products form.

I use the following code in the on open event in the product

Private Sub Form_Open(Cancel As Integer)
If IsOpen("frmpartquote") Then
partquotenumber.DefaultValue = Forms!FrmPartQuote!partquoteid
End If
End Sub


Now this works fine as long as the field is a number.

However I would like to use tartquotenumber as a text field

any ideas how I will do that....

thanks

:confused:

View 4 Replies View Related

Data Transfer By Filling A Form

Mar 3, 2006

Dear All!

I'd like to ask you to help me in the following. The issue is basic I think, but not for me...

I'd like to transfer the data entered in the fields of a form into the fields of a table (that uses the same values). This table is connected with one to one relation to the table which the form bases on.

(An automatic data-transfer would be desirable. If it is difficult a button will do as well.)

Please write if you have got any good idea or solution.

Thanks in advance.

BR
xxyy

View 2 Replies View Related

Transfer Control Value From A Form To Subform

Mar 15, 2006

Hello everyone...

I have a form that I want to copy selected field values to another form & subform.
I have no problem copying some field values to frmEndorsement... but I can't figure out how
to copy the other field values to the frmEndorsementSubform. I tried several ways but I'm still
on a dead end...

Here's the actual example...

I want to transfer some selected fields from "frmEncounter" to "frmEndorsement" & "frmEndorsementSubform"

In my frmEncounter, I have these fields...
mdsunit, patientID, lastname, firstname, pcp, & encountID ( EncountID is autonumber-PK)

In my frmEndorsement, I have...
patientID, lastname, firstname

& in my frmEndorsementSubform, I have...
pcp, msdunit, & encountID ( encountID is numeric-long integer )

There is a link master-child field between frmEndorsement & frmEndorsementSubform which is patientID.

and below is my code that I got from Ms. Candace Tripp...
Thanks in advance... Jim



Private Sub cmdcopy_Click()
On Error Resume Next
Dim bOpen As Boolean
Dim ctl As Control
Dim frm2 As Form
Dim ctl2 As Control

' check to see Endorsement Data Entry is open
bOpen = IsOpen("frmEndorsement")
If Not bOpen Then

' open form
DoCmd.OpenForm "frmEndorsement"
End If
Set frm2 = Forms!frmEndorsement
' send data to frmEndorsement
' look at each control on frmlEncounter

For Each ctl In Me.Controls
' only look at combo boxes and text boxes
If TypeOf ctl Is TextBox Or TypeOf ctl Is ComboBox Then

' now look at each control on frmEndorsement
For Each ctl2 In frm2
If TypeOf ctl2 Is TextBox Or TypeOf ctl2 Is ComboBox Then
' if the control names are the same,
' set the value to that control on frmEndorsement
If ctl.name = ctl2.name Then
ctl2.Value = ctl.Value
End If
End If
Next ctl2
End If
Next ctl

Me.PCP = Forms!frmEndorsement!frmEndorsementSubform!PCP
Me.EncountID = Forms!frmEndorsement!frmEndorsementSubform!Encount ID
Me.mdsunit = Forms!frmEndorsement!frmEndorsementSubform!mdsunit

End Sub

View 1 Replies View Related

Form Data Transfer Problem

May 14, 2006

I have an on-going project and I am starting to have a problem with the DB. When open the form and search through the database I notice my total text box is not counting the options chosen.
I have radio buttons on my form that are suppose to enter an amount of money into a text box, if the radio button is clicked, and I have total text box that I set up, in a query, to add all the amounts of the various text boxes with cost informtion in them. As I scroll through the records on some of the records these text boxes are not showing, or adding values for the options chosen. Why would that happen on only a couple of records and not the whole database?

View 1 Replies View Related

Forms :: Transfer Data - How To Get Value From Another Form

Jan 17, 2014

Below is the formula that I'm trying to get a value from an other Form (Pump Settings). But I keep getting an error message .

=IIf([Result1]<4.1,0,IIf([Result1]>6.5,([Result1]-[Pump Settings]![Target ]),IIf([Result1]>4<6.5,1,"")))

View 6 Replies View Related

Transfer Information From A Form To A Report Then Print

Mar 16, 2005

Hi there

This im sure is an easyone to most of you but for me I cant find away around my problem!!

I have a form I use to enter infomation and I have also made a report that I am trying to get the infomation from the form onto the report.

I would like to have a command button on the form that once I click it, it then prints out the report.
How do I get the information from a form to a report as when I have tried doing this myself it only allows me to use information from a query or table.


Any suggestions would be great for this newbie!!!


Thank you

View 2 Replies View Related

Refernece Number Missing Digit During Form Transfer

Dec 6, 2006

i have a jobref (pk) as text at the moment because i tried it as Number data type and had a problem..a reference number is made and when the date loses focus the refno is displayed in its textboxthis makes that refnoPrivate Sub cbojobdate_LostFocus()Dim maxRef As Variant, maxID As IntegerDim codeDate As String, maxDate As String codeDate = Format(cbojobdate, "MMYY") maxRef = DMax("jobref", "job", "jobref like '" & codeDate & "*'") If (IsNull(maxRef)) Then 'test for new month maxID = 0 'reset id to 0 Else maxDate = Left(maxRef, 4) 'get date code maxID = CInt(Right(maxRef, 4)) 'convert to int End If Me.cbojobref = codeDate & Format(maxID + 1, "0000")End Sub8 digits.. so a job on september 6th 2006 will have a ref no of 09060001a job on february 1st 2006 will have ref no of 02060001when i send the jobref to another form using this..Private Sub cbojobfrom_AfterUpdate()If Me.cbojobfrom = "t1" ThenMe.cbojobfrom = "LHR - T1"End IfIf Me.cbojobfrom = "t2" ThenMe.cbojobfrom = "LHR - T2"End IfIf Me.cbojobfrom = "t3" ThenMe.cbojobfrom = "LHR - T3"End IfIf Me.cbojobfrom = "t4" ThenMe.cbojobfrom = "LHR - T4"End IfIf Me.cbojobfrom = "h" ThenMe.cbojobfrom = "LHR"End IfIf Me.cbojobfrom = "ga" ThenMe.cbojobfrom = "Gatwick Airport"End IfIf Me.cbojobfrom = "gn" ThenMe.cbojobfrom = "Gatwick North"End IfIf Me.cbojobfrom = "gs" ThenMe.cbojobfrom = "Gatwick South"End IfIf Me.cbojobfrom = "st" ThenMe.cbojobfrom = "Stansted"End IfIf Me.cbojobfrom = "lc" ThenMe.cbojobfrom = "London City Airport"End IfIf Me.cbojobfrom = "lu" ThenMe.cbojobfrom = "Luton Airport"End IfDoCmd.OpenForm "job_cash_inflight", , , "[jobref]='" & [jobref] & "'"End Suband the job_cash_inflight form loads it with this..Private Sub Form_Open(Cancel As Integer)Me.[jobref].DefaultValue = Forms!job_cash_single![jobref]End Subthe problem is when i choose february the first for example02060001.. when the reference number transfers to the incoming flight form.. it displays as 2060001can anyone see why because before it transfers the refno.. the original job record has already been saved.. maybe when the id is being created it is not the best way.. or it doesnt match the text datatype.. if that is the case what number datatype shall i use in each of the tables jobref appears in?

View 14 Replies View Related

General :: Transfer Data On Textboxes From A Form To Report For Printing

Feb 6, 2013

I've written an application in VB.Net and now I need to transfer the data on textboxes on a form to a report for printing. Only the data on the form is what I want to preview and print.

View 1 Replies View Related

Modules & VBA :: Text Box Transfer

Nov 12, 2013

so i have MainForm and PopUp (which is also a form). on the MainForm there is a command button that brings up the PopUp form. on this PopUp form, some data will be entered then the PopUp form will be closed via a command button.

whats the code i would need to take a value from a control on PopUp and place it in a control on MainForm, ideally when the command button closes the PopUp form.so i know it has to go on the command button's on click event, probably before the close form code lol... but i cant figure out how to get the value to transfer over..

View 3 Replies View Related

Modules & VBA :: Transfer Text - CSV Format

Jan 27, 2015

I have a simple query and I want to export it in excel, Comma Separated Value., .CSV

I tried to run DoCmd.TransferText but all of my attempts were futile.

I found it, I must export it as TXT and file suffix insert .csv instead of .txt and it works

Now can I execute this "Saved Exports" through a macro or docmd ?

I insert a picture just to make it more clear.

[URL]] ......

View 4 Replies View Related

Modules & VBA :: Transfer Spreadsheet To New Instance Of Excel

Dec 30, 2014

I just want to run a series of DoCmd.TransferSpreadsheet commands to export several queries to one Excel Workbook with seperate sheet names for each query.

However my problem is I want this to be a new instance of Excel that the user will then SaveAs after it is complete. I don't want to save it to a specific path first because the Db is on a shared drive and My Documents will have a different path for each user based on their user name. (corporate environment)

There must be some way to just have it open a new workbook without saving isn't there??

View 3 Replies View Related

Modules & VBA :: Open CSV With FileDialog Then Transfer Spreadsheet

Jan 26, 2015

From Here I want it to open the ".csv" that I chose (for some reason it doesn't now), Import to a table (I can do this part). Then export to the same location on the server with a different file name of my choosing and covert to .xlsx.

Dim fdlg As FileDialog: Set fdlg = Application.FileDialog(msoFileDialogFilePicker)
Do
With fdlg
.AllowMultiSelect = False
.Title = "Select File to Import"
.Filters.Clear
.Filters.Add "All Files", "*.*", 1

[Code] ....

View 3 Replies View Related

Modules & VBA :: How To Properly Set Range In Transfer Spreadsheet

Sep 18, 2014

DoCmd.TransferSpreadsheet Range parameter.

I want to import from an xls-File just the second page, titled "Harte". How do tell this the compiler?

Code is:

DoCmd.TransferSpreadsheet acLink, acSpreadsheetTypeExcel8, "Harte", file, True, "Harte"

View 1 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 :: Transfer Spreadsheet Won't Work If Excel Is Already Open

Sep 17, 2013

I am extremely new to writing code, but was able to successfully write code that transfers the data in my form to and excel spreadsheet template and saves it with a different name. The code works perfect and without issue as long as Excel is not running. However if Excel is already open the template remains blank and a warning message appears saying that the form is locked for editing. Below is the code I used.

Private Sub ExcelClear_Click()
Dim xlApp As Excel.Application
Dim xlwrkBk As Excel.Workbook
Dim xlSheet As Excel.Worksheet

Set xlApp = New Excel.Application

[Code] .....

View 2 Replies View Related

Modules & VBA :: Transfer Data From Excel To MS Access Database

Oct 24, 2013

Everyday I have to generate a report in excel format and I need it to be added to ms access database. I was hoping to do this on a click of a button. Basically, since i have a new data everyday it should be added to the table.

View 1 Replies View Related

Modules & VBA :: Transfer Database From Oracle Into External Access Db

Oct 26, 2013

i'm running a module from an access db. how do i import a table from oracle into a closed access db, not the one where the code is running from?

View 1 Replies View Related

Modules & VBA :: Transfer Spreadsheet And Append Additional Fields

Jun 1, 2015

I am trying to use transferspreadsheet to import access worksheet and then I want to append additional fields. I am able to import the excel sheet into access, but need appending the other fields.

Code:

Dim fd2 As FileDialog
Dim xlapp As New Excel.Application
Dim xlsht As Excel.Worksheet
Dim xlWrkBk As Excel.Workbook
Dim db As DAO.Database
Dim tb2 As TableDef
Dim fdx, fld As DAO.Field

[code]...

View 4 Replies View Related

Modules & VBA :: Call A Preimport Function Whenever Transfer-spreadsheet Is Called?

Oct 16, 2014

I know its not possible. But Just wanted to confirm. Not at all possible?

Code:

Function PreImport(BookToImport As Workbook)
For Each cell In BookToImport.Sheets(1).Rows(1).Cells
cell.Value = Trim(cell.Value)
Next cell
BookToImport.Sheets(1).UsedRange.Rows(1).Replace ".", "_"
End Function

View 1 Replies View Related

Modules & VBA :: Retrieve / Validate Data On 2nd Form Based On Record Selected On 1st Form

Jul 29, 2013

Can I look up and verify data on a "second" form based on a selected record from first (still open) form.

I am trying to allow users to select a User Name from a combo box list and then open "Change Password" form when they select "Change Password" for that selected user name.

My problem is that I can't figure out how to associate and verify the data tied to the user name selected on the previous (Login) form ( I am trying to validate the old password tied to that selected record).

I have the first login form created, and it's working just fine. I also have the change password form created (and it's displaying the user name selected from the first form using:

Code:
Private Sub Form_Load()
With Forms![frmLogin]![cboUserName]
Me.txtPwdChgUserID = .Column(2, .ListIndex)
End With
EndSub

I also have the code written to validate and confirm old password, new password and validate new password (when the save button is clicked). I have yet to update the password with the new password (still trying to figure that out).

Attached zip file has screen shots of the two forms.

View 3 Replies View Related







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