Modules & VBA :: Multiple Regression In Access 2013?

Nov 17, 2014

I want to do multiple regression in Access 2013. with the VB code?

View Replies


ADVERTISEMENT

Modules & VBA :: Multi Select List Boxes With Multiple Columns In Access 2013

Oct 22, 2014

I have a listbox set to Multiselect property of Simple. The listbox is populated by using a table. There are 4 columns in the listbox

Code:
1 3/23/2014 4/5/2014 2014
2 4/6/2014 4/19/2014 2014
3 4/20/2014 5/3/2014 2014

The columns are PayPeriod, StartDate, EndDate, FiscalYear

What I want to be able to do is highlight a chunk of dates and have the first selected StartDate and the last selected EndDate populate two hidden text boxes so I can use them for my queries/reports.

I've tried a couple different ways. Each time what happens is it only uses the last item I have selected in it's calculations.

Code:
Dim ItemIndex As Variant
For Each ItemIndex In Me.lstPayPeriods.ItemsSelected
If Me.lstPayPeriods.Selected(ItemIndex) And Me.lstPayPeriods.Selected(ItemIndex - 1) = False Then
Date1.SetFocus
Date1.Text = Me.lstPayPeriods.Column(2, Me.lstPayPeriods.ListIndex)
End If
Next

In this example I tried to have it go through each Item of the listbox. I wanted to check to see if the current row was selected and the row before it wasn't. That way I could determine it was the first item selected in the group of selected items. It would always only use the last item I had selected.

Code:
Dim CurrentRow As Integer
Dim FirstDate As Date
For CurrentRow = 0 To Me.lstPayPeriods.ListCount - 1
If Me.lstPayPeriods.Selected(CurrentRow) Then
Date2.SetFocus

[Code] ....

I tried to do something similar with this code. Again, it only uses the last item I have selected.

View 2 Replies View Related

General :: Effect Size In Multiple Linear Regression

Jul 4, 2012

I have (from SPSS) many multiple regression analyses, and each one of them has about 7-8 independent variables. I need to find the effect size-in particular I want to have effect size above 1% and statistical significance p<0.001. I am familiar with p, but I cannot understand whether effect size is b, beta or R square and how to interpret it.

View 1 Replies View Related

Simple Linear Regression On Multiple Data Fields

Mar 25, 2013

I have a Table that looks like the following:

A B C D E
10 12 8 4 14
9 10 7 5 12
12 13 10 3 17
10 11 6 6 15

I have figured out how to calculate the regression statistics for A vs B on a query. So it looks like this...

Predicted B Difference between
A B m b via regression Predicted and Actual
10 12 .9474 1.7895 11.263 -.737
9 10 .9474 1.7895 10.316 .316
12 13 .9474 1.7895 13.158 .158
10 11 .9474 1.7895 11.263 .263

Question: What I am looking to do is to duplicate this for A vs C, A vs D, A vs E, B vs C, B vs D, and so on until all of the pairs are calculated and put into one table/query. I know I can just create more fields to the right with the A vs C data and continue on that way, but this does not seem very efficient and I am limited in the number of fields that can be created. So it seems that "going down" rather than across makes more sense however I do not know how to move on to the next pair (A vs C and so on).

I thought of running the regression query over and over again and "recording" the data generated into a table. Once again I have the same problem. How do I tell the regression query to run the next pair? If my data is setup incorrectly, I am willing to change that as well.

View 1 Replies View Related

General :: How To Sum Multiple Columns In Access 2013

Nov 28, 2014

I made a new column in a table in access. The table is not linked and linking unfortunately is not an option. In the new column, I want to create a sum for 5 years of funding. There are multiple columns for a different fiscal year.

In excel, it is simply =sum(range), but I am drawing completely blank how to fill in the column with the sum data.

The end result is the data from 4 tables will be displayed in Forms and Reports.

Essentially what I need is an ability to bulk update a column in access table without a need to reupload the entire datasheet (over 100k rows with about 30 columns).

View 2 Replies View Related

Forms :: Access 2013 - Multiple Data Sets On Chart?

May 5, 2015

I have a simple line chart plotting price against date.

I would like to plot a secondary line on this chart from an array of data that I calculate. I've searched hi and low but can't seem to find a way of doing this.

The closest I've found is from this:-

[URL]

I can create my array of data but I can't seem to get it to work and think it may be for pivot charts....which access 2013 can't do anymore.

how to plot multiple data sets on the same graph in Access 2013.

View 9 Replies View Related

Forms :: Prevent Duplicates From Multiple Drop Downs In Access 2013

Jul 28, 2015

I'm in Access 2013 and I built a form with multiple drop downs. Here is what I have in the same order of which the user must choose from......

Document "Field Observation", "Monthly Inspection", "Safety Roster" (The user must first choose the document from this drop down he is recording)

Supervisor "First & Last Name" (The user then chooses the first & last name of the specific Supervisor name he is recording the document for from this drop down)

Manager - This field automatically populates based on Supervisor.
AOR - This field automatically populates based on Supervisor.
Org Unit - This field automatically populates based on Supervisor.

Month "January", "February", etc. (The user then chooses the Month of which the document will need to be applied to)

I would like the form to trigger an error with "This document is already recorded for this month" when the user chooses "Monthly Inspection" OR "Safety Roster" for a specific "Supervisor" for a specific "Month" that is already recorded in "TBL_DataTracker". The TBL_DataTracker is where all of my records are stored.

View 14 Replies View Related

Forms :: Input Data Into Multiple Tables Using Single Form - MS Access 2013

Jan 15, 2015

I have 5 tables that I would like to input data in. It can only be done with a single form. The fields I want to input in have the same names in all 5 tables, for example:

Table 1:
Name
Age
DOB

Table 2:
Name
Age
DOB

Table 3:
Name
Age
DOB

Table 4:
Name
Age
DOB

Table 5:
Name
Age
DOB

Is it possible to input data into all of these fields in each table using one textbox for each field?

Preferably without having to use code but if it cannot be done without it then that would be fine.

View 7 Replies View Related

Modules & VBA :: Integrating Sms Feature Into MS Access 2013?

Jun 18, 2013

I'm currently working on a project which requires integration of sms feature in ms access 2013.

The sms provider which i use for sending sms is smsglobal.

View 1 Replies View Related

Modules & VBA :: Access 2013 - How To Write Two Line Msgbox

Jan 20, 2014

how to write a vba msgbox with two lines i access 2013

i try to put chr(13) and alse i used & vbCrLf& but nothing is worked

they seems to be for an earlier version ...

View 6 Replies View Related

Modules & VBA :: Custom Menu Bar Won't Display In Access 2013

Apr 5, 2014

I have a program.mdb with a customized menu bar from Database Creations.When I open program.mdb in 2007 & 2010 the ribbon is disabled and the custom bar is displayed as it should be and all is OK.When I open the same program.mdb in 2013 the ribbon is displayed and the custom bar is missing

I have a clean compile and get no error messages.How do I disable the ribbon and get the custom EZ Menu Bar to display in 2013?.Following are the Options, Current Database, Ribbon and Tool Bar Option settings that is used in all Access 2007, 2010 & 2013 versions

Ribbon Name:
Menu Bar:EZ Menu Bar
Shortcut Menu Bar:(default)
CheckedAllow Full Menus
CheckedAllow Default Shortcut Menus
UncheckedAllow Built-in Toolbars

View 1 Replies View Related

Modules & VBA :: Access 2013 - Invalid Use Of Null Error 94

Jun 16, 2013

The following code works fine until it gets to last record, then it give me Error # 94 Invalid use of null. I have searched all of my code and null is not in the code.

Code:
'--------------------------------------------------------
' Goes to next record
'---------------------------------------------------------
Private Sub cmdNext_Click()
On Error GoTo err_handler
' DoCmd.GoToControl (txtNameL)
' DoCmd.GoToRecord , , acNext

[Code] .....

View 14 Replies View Related

Modules & VBA :: Using Access 2013 To Create Action Button In PowerPoint?

Nov 22, 2013

I am using VBA in Access 2013 to make a PowerPoint presentation using data from the access database. know if it is possible to use Access VBA to create a button in the presentation that runs a procedure itself?

View 1 Replies View Related

Modules & VBA :: Saving Single Record In Form As PDF In Access 2013?

Jul 3, 2013

I need to save a single record (preferably the current record) as a PDF. I have created a form for my boss to calculate bids. He wants to save each record individually as a PDF to upload into our service software program to attach to client files. I can save a selected record as a PDF if I print the selected record first. We need to eliminate having to print it first as it is just a waste of paper and an unnecessary step. I am kind of thinking that VBA and attaching that to a control button on the form is the way to go, but I am new to writing code and I am completely confused!

View 7 Replies View Related

Modules & VBA :: Access 2013 - Make Copy Of PDF Document In Specified Folder?

Apr 25, 2014

I need to make a copy of a pdf document that the user identifies in a "hidden" folder that is associated with my backend database. how to code this. I am using Access 2013.

View 6 Replies View Related

Modules & VBA :: Send Email From Access 2013 Through External SMTP Server?

Jun 5, 2015

I have Access 2013, Win 7, Outlook 2010 (32-bit).I want to send an email from Access, but not through Outlook. Instead I want to connect to an external SMTP server. I've found a few examples that doesn't work for me. With code including for example

Code:
Set ObjMessage = CreateObject("CDO.Message")

I get an "Error 429: Object can't be created in Active X-component" (My translation from Swedish).With code including this:

Code:
Dim oEMail As New CDONTS.EMail

I get "user defined type has not been defined" (my translation again).I have working code for sending email through Outlook, which works fine. But, Outlook adds a lot of span tags, making it impossible to read for certain screen readers used by visually impaired people, therefore I can't use Outlook.

I've tried to read up on the matter (CDO), and think that maybe the CDO library etc is not included on my computer?can I download it?

View 10 Replies View Related

Modules & VBA :: Insert Rich Text (HTML Format) From Access To Word 2013

Jul 24, 2014

I'm about to connect my DB to word. So I made a form where the user has to choose what entry to export. The data is inserted in a word file in different bookmarks. But there is one special task to insert the rich text so in this case the html formatted text is displayed like this:

Code:
<html><div>asdf</div></html>

My Text is inserted like this:

Code:
wdApp.ActiveDocument.Bookmarks("-Bookmarkname-").Range.Text = Lrs("-ColumnName-")

Lrs is a Recordset.

So how is it possible to display the html code right in the Word doc?

View 1 Replies View Related

Modules & VBA :: Error 2391 Field F1 Doesn't Exist In Destination Table - Access 2013

May 3, 2014

I'm getting error 2391 field 'f1' doesn't exist in destination table

Code:
Dim FileBrowse As Office.FileDialog
Dim varFile As Variant
Dim sFile As String
Set FileBrowse = Application.FileDialog(msoFileDialogFilePicker)

[Code] ....

View 1 Replies View Related

Access 2013 - Hiding And Showing Access Window

Apr 6, 2015

I am trying to Hide or Show the Access Window by using two buttons on a Form. Running Access 2013 in Windows 7 64bit.

I have used code from the Internet as below but added the PtrSafe item to the Function Declaration as below:-

Option Compare Database
'Hide Access desktop screen and float Forms on pc desktop
Private Declare PtrSafe Function IsWindowVisible Lib "user32" (ByVal hwnd As Long) As Long

Dim dwReturn As Long
Const SW_HIDE = 0

[Code] ....

I then have two buttons on a form coded as below:-

Option Compare Database
Private Sub cmd_Hide_dbw_Click()
Call fSetAccessWindow("Minimize", False, False)
DoCmd.OpenForm "frm_Test", acNormal
End Sub

[Code] .....

I have attached a Test Database which demonstrates the problem I am experiencing.

Do the following sequence...............

Open the Test Database. DO NOT ENABLE CONTENT
The Access 'Ribbon'Test_Database.accdb is active and usable
Open frm_Test in Design View in order to inspect, all should be as shown above.
Now click the Enable Content warning
Switch frm_Test to Form View

Click button Hide dbw. Closes the Access Window
Click button Show dbw. Opens the Access Window...HOWEVER....

Attachment 20252The Access Ribbon is locked and usable !!!

I cannot find a way to re-activate the Ribbon

View 2 Replies View Related

Summing In Access 2013 Web App

May 5, 2015

I have created a database that is hosted on our company sharepoint. The database contains subcontracts with resource information by geographic location and status. I have built queries and added them as reports to the web app but I need to figure out a way to sum totals on the queries. For example, one report lists all resources of a particular type by 4 different zones and 3 different status. I need to have the bottom row show the total resources.

View 6 Replies View Related

Access 2013 / Can't Share Access Over The Network

Jul 4, 2014

I have problem sharing an Access 2013 file from one cumputer and then change the data in the file on another computer, or i can change it but the change wont be made one both computers.

I'm working so i need my secretary to be able to change information or add, but i also need to get the change.

View 2 Replies View Related

Different First Page Footer In MS Access 2013

Apr 7, 2015

Using MS Access 2013, part of Office 365, I am trying to construct a report that has a different first page footer than the rest of the document. Googling for answers has produced a few options, but none that seem to work. I have virtually no VBA knowledge. I was hoping that there might be some code that I could place in a label in the footer and have it work.

View 1 Replies View Related

How To Create If Field In Access 2013

Oct 26, 2013

I have an Access 2013 database file with many fields. One of them, I'll call it Field 3, is a box which I would like to either leave blank or put a check mark in it. I would like to be able to create an Iif field for Field 3 where a check mark is automatically inserted in Field 3 IF Field 1 - Field 2 <or= 0, otherwise I'd like Field 3 to remain empty.

View 9 Replies View Related

General :: Access 2013 - Compact Database To New Name

Jan 30, 2015

Access 2013 ... Is it possible to compact a database to a new name?

(In previous incarnations of Access I regularly 'compacted and repaired' databases to USB sticks rather than simply copy the file in the (mistaken??) belief that this was a more reliable approach)...

I can't see where to do this in Access 2013!

View 1 Replies View Related

Reports :: Merge PDFs In Access 2013

Mar 11, 2014

we are moving from Access 2003 to 2013 using Windows 8.1 64bits. We used Leban's code and library to create and merge pdfs. C

Creating pdfs can be done with built-in functionality in Access 2013. But I can't find a way of merging pdfs. I've tried Leban's Dlls files but I am getting run-time error: "File not found:StrStorage.dll" do I need to do something extra to make Leban's code work on Windows 8 64bits ?

View 8 Replies View Related

Transferring Data From MS Excel To MS Access 2013

Mar 27, 2014

I am setting up a database using Access 2013, and am trying to test downloading files from Excel. For some reason it is not allowing me to have more then 4 columns in the excel file, it gives the error "Subscript out of range". I thought it was the type of variable at first, but when I tried deleting different columns on both files, the transfer always worked with 4 columns. How do I allow more columns to be transferred?Also, is there a way to not include the row numbers of the excel file as an ID column and only include the ID given in the first column?

View 4 Replies View Related







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