Modules & VBA :: List Printers Installed On Computer In A Listbox

Jun 24, 2015

How can I list the printers installed on the computer in a listbox? The following code list them in a message box, but I need the user to be able to select one to save it in a table. The listbox is called lstListPrinters and the table tblPrinterSelection

Code:
If Printers.Count > 0 Then
' Get count of installed printers.
strMsg = "Printers installed: " & Printers.Count & vbCrLf & vbCrLf
' Enumerate printer system properties.
For Each prtLoop In Application.Printers

[Code] .....

View Replies


ADVERTISEMENT

Modules & VBA :: Populate Combo Box With Names Of Installed Fonts On Computer

Jan 22, 2014

I need to give users the ability to change the font of a field in a report. The field shows a barcode.

I thought of using the CommonDlg class to show the Windows font-selecting dialog box, but installed barcode fonts show as a barcode. I need to show the font name.

So I need to populate a combo box with the names of all fonts installed on a computer.
The fonts reside in C:windowsfonts

I have searched Google for a solution but cannot find one.

How do I populate a combo box with the names of all fonts installed on a computer?

View 4 Replies View Related

Modules & VBA :: ListBox Identify Selected Item Without Looping In Whole List

May 9, 2014

Show me the selected item in a Listbox without looping in the whole list, because my Listbox is multiselect and I want only the item that selected recently.

View 8 Replies View Related

Modules & VBA :: Sending Email Without Outlook Being Installed

Aug 16, 2014

I have this VBA code:

Option Compare Database
Option Explicit
Private Const URL_CDOCONFIG As String = ""
Public Function SendEmail(ByVal sTo As String, ByVal sFrom As String, _
Optional ByVal sCC As String = "", Optional ByVal sBCC As String = "", _
Optional ByVal sSubject As String = "", Optional ByVal sBody As String = "", _

[Code] ....

It is being called with the following macro:

SendEmail("gregory.west@dbwsys.mb.ca","vba@dbwsys. mb.ca","","","Subject line","Body of eMail here")

But I get this error message.

The "SendUsing" configuration value is invalid.

View 1 Replies View Related

Printing Graphs On Inkjet Printers

Jan 5, 2005

i have a graph in access, and when i print it on a laserjet printer, all of the data and text prints. When i print the graph on a inkjet, only the text prints...not the graph. How do i solve this?

View 1 Replies View Related

Printing Labels And Reports On Different Printers Than Designed

Oct 18, 2011

I have a small receiving inspection database that prints lables for each item received. However when they use the program on a different computer the lables do not print on the lable printer at that location.

View 1 Replies View Related

Listbox/combobox List Alltables

Jun 14, 2006

Hi guys

Just wondering how could a make a listbox or combobox to have the names of all or some of the tables that are currently in my database

I only know how to get the values from a table or query in RowSource using SQL language... but how can I display the names of the tables

Thanks in advance for the help.. I really appreciate it

View 4 Replies View Related

Forms :: List Box Updating Using Another Listbox Value As Header?

Sep 14, 2013

I need to construct a very complex student/coach/time/day Database.

Every student can attend a lesson twice a week, on a particular day and time with a particular coach.

Every coach has his/her own time table (Days available, times available on those days).

So I want this effect on a form:

Day: Monday
Coach: Jack
Time: 10:00

So Coach is dependent on Day, Time is dependent on BOTH Coach and Day.

I got the first one working but I am stuck on the second.

I created a Table for every day of the week (Mon through Friday) and have each coach's name as the "header" of a column, in that column I have the times they are available:

Code:

Jack - Roy
08:00 - 09:00
08:20 - 09:20
08:40 - 09:40

In my form, in the event procedure of the second list box I have the following:

Code:
Select Case [Swimming_Day_1]
Case "Tuesday"
[Time_1].RowSource = "SELECT [Coach_1].Value " & _
"FROM [Tuesday Times] "
End Select

But now when I select for example "Jack" in the "Coach_1" List box, the "Time_1" list box lists 3 entries of "Jack", not "08:00, 08:20, 08:40" respectively.

How can I accomplish the above without having to create a separate Day/Times Table For each and every coach (There are 8 coaches and 5 days, and I want things as easy as possible to update coaches should there come extra or some leave maybe).

View 5 Replies View Related

Updating An Already Installed Db

Oct 8, 2005

Hi,

I have a database that has been in use for sometime but it needs some amendments.

I have burnt the db to cd and plan to make the updates and then take it back and import the tables from the one in use to the newly updated database.

I remember trying this before and it wouldn't let me import the tables as it said they had relationships.

Surely there is an easy way to do this? I don't have to delete the relationships, import the tables and then re-do the relationships?

Many thanks,
Housey

View 4 Replies View Related

Provider Not Installed

Mar 14, 2006

Hi,

I have developed a MS Access tool to be used in multiuser environ. In some computers, the tool is working while in some, there is an error message-"Provider not found. May not installed properly". Is it problem with the script or is it that the provider was not installed with MS Office. I have used ADODB connection.

View 1 Replies View Related

Just Installed Access 2007 - Ick!

Feb 17, 2008

Ok, I know change isn't always easy, I remember going to 2003 and I didn't think I'd stick with it.
I'm now using 2007 and it's quite different in it's layout. I'm having trouble finding many things that I'm used to having "at my fingertips" but I'm muddling through it. The one thing that I'm totally lost on, has to do with form display.

Have a simple DB that a main form opens on start up. It's relatively small, auto centered, no resize and set to dialog. However, in 2007 it opens up occupying all available workspace space and I have to click the "Size to fit form" button. Then it's not centered.

Where the heck is the flag or setting to tell it to stop doing this?


Secondly, what's everyone else's thoughts on 2007?

View 5 Replies View Related

Making A Listbox Display A List From A Single Field (cell)

Sep 29, 2005

:confused: :confused: :confused:
Hello, I am new here to the forum.

I have a list box on a form that i want to display a list from a single cell or a table in my access database. The list in this cell is a list seperated by commas such as.....

Field 1 Field 2
example a, b, c, d

I want my listbox to display the list from the first cell in field 2.

Anybody have any ideas?

Thanks,

Kevin :)

PS I know something similar can be done in visual basic. For example, a simple program can be written to take a list (seperated by commas (,) ) and then display this list in a listbox on the form. Is there a way that the simple code such as that can be altered to work in access?

View 3 Replies View Related

Data Access Pages Without Office Installed

Oct 2, 2006

I am building a database for users to input escalations in. The users that are actually keying the information in, do not have MS office. When they try to access the DAP html file, a message appears at the top of the page that states "The page requires the Microsoft Office Web Components.
See the Microsoft Office Web site for more information."
Can data access pages be used without office being installed? I have heard that it could also be the users internet explorer security settings.

Any help would be greatly appreciated.

View 3 Replies View Related

General :: Can Users Without Access Installed Update

Nov 22, 2013

We have an access database stored in a shared location. One of the tables in the database is used to record transactions made in an excel spreadsheet-this is done programatically using VBA and SQL.

So here is my silly question; If users don't have access installed locally will the code be able to write to the shared access database?

View 4 Replies View Related

General :: ACCDE To Open / Need To Have MS Access Installed

Sep 24, 2013

do I need to have MS Access installed, in order to open an ACCDE file.there is no need, as I see ACCDE as an exe file.

View 2 Replies View Related

General :: Can't Change Listbox Column Header Name When Data Source Is A Share-point List

Jul 30, 2013

The following code works to change the column header name for a listbox in form view when the data source is a local table, but not when the data comes from a sharepoint list.

Code:
sqlstatement = "SELECT ID, PONum as [PO Number], ActDate as [Date], VendorName as [Vendor Name], Service, BuildingNumber as [Building Number], ReservationDescription as [Description], POAmount as [Amount], QuoteType as [Type of Quote], Comments" & _
" FROM ActivityLog" & _
" WHERE (Activity = 'AcceptReservation') AND (PSCName = '" & Me.PSCCombo4.Column(0) & "')" & _
" ORDER BY ActDate;"
'MsgBox sqlstatement
Me.EditPOListBox.RowSource = sqlstatement
sqlstatement = ""

Also it appears that there is no such thing as a caption property for a sharepoint list column.

View 3 Replies View Related

Viewing Page That Have *mdb File On PC Without Microsoft Access Installed

Nov 5, 2007

if let say i create a page that have database (*.mdb file) and for my client side, the PC don't have Microsoft Access, can they view the page that have *mdb file?

View 3 Replies View Related

General :: Reports Not Formatting After Access Installed On New Laptop?

Mar 24, 2014

My new and previous laptops are both 64 bit and installed MA 2010 on both of the computers running win 8.

When I run reports on my new laptop the reports are not formatting. They are reflecting on 4 pages and not on 1 page like on my previous laptop running the same programs.

On my new laptop I installed Office 2013 and old one office 2010 but I used the same Access 2010 on both laptops which is a separate disk as office was not the professional one.

View 3 Replies View Related

Modules & VBA :: Cannot Populate Listbox

Jan 8, 2014

I want to fill my 2-column listbox on a form with the following VBA code:

Option Compare Database

Private Sub Form_Load()
Dim proefsel As Integer
Dim nproducts As Integer

[Code]...

When i run the code i get a compile error on the code in bolt. I am using access 2010.

View 3 Replies View Related

Modules & VBA :: Using A Listbox For New Records?

Jun 11, 2013

I need the following code to take data from a form and input it into two tables linked by the item ProjectID. My Code is as follows:

Code:
Dim pDate As Date
Dim fid, jan As Integer
Dim leng As Double
Dim strSQL As String
Dim varItem As Variant
pDate = Date

[Code] ....

I take the items that I'm putting into DailyT to track the date, foreman, Job Number, and how long they spent on the job. I got the DailyT part figured out.

What I don't know how to do is use the items in the list box lstSel and put them into the table ProjectT so that each record in ProjectT has the ProjectID from DailyT and the ActivityID that comes from the items in the listbox.

I know I'll need a loop but I don't know how to get the autonumber ProjectID (or define it) from the entry that I made in DailyT to put into ProjectT.

View 3 Replies View Related

Modules & VBA :: Add Textbox Value To Listbox

Aug 5, 2013

I would like to type a value into a list box and then press a command button and have that value transfer to a list box for later use. I've been playing with the onclick event of my command button and this is what I have so far:

Code:

Option Compare Database
Private Sub Command4_Click()
List0.AddItem Text2.Text
List0.ListIndex = List0.ListCount - 1
End Sub

When I click the button I get an error:

2185 - You can't reference a property or method for a control unless the control has the focus.

View 5 Replies View Related

Modules & VBA :: How To Remove ADO RecordSet From ListBox

Aug 6, 2013

How does one go about removing a recordset from a ListBox?

I have a list box that I want to toggle between using a query and an ADO RecordSet to populate the values.

Once I set the listbox .RecordSet property to the ADO.Recordset, I can't remove the values displayed in the listbox when I assign a query to the .RowSource property.

I suppose I can turn the .RowSource query to an ADO Query but I am being lazy and don't want to rewrite the query as a T-SQL query.

I previously thought the list box was pulling data from the .RowSource query but I realize I was wrong.

View 1 Replies View Related

Modules & VBA :: Listbox To Open PDF File?

Aug 1, 2013

I have a query that opens a listbox in a form. In the listbox I want to add a doubleclick event that opens a pdf document with the selected record in it. The record is in column 1 of the listbox.

I can't use the FollowHyperlink method of the colecction application due the record in the column is a Key. I am not sure if FollowHyperlink method can be used in a listbox

I have been checking codes in the web and I found this:

Private Declare Function ShellExecute Lib "shell32.dll" Alias "ShellExecuteA" (ByVal hwnd As Long, ByVal lpOperation As String, ByVal lpFile As String, ByVal lpParameters As String, ByVal lpDirectory As String, ByVal nShowCmd As Long) As Long
ShellExecute Me.hwnd, "open", "D:SebDesktopGA-BDpdf est.pdf, "", "", 4"

However, I don't know how to organize the code in a logic way in Sub End Sub. Neither I don't know if the code is for the doubleclic event in the list box or a Module. If is for a module I don't know how to write the code in it.

View 7 Replies View Related

Modules & VBA :: Listbox - No Given Value For One Or More Required Parameters

Jul 14, 2014

I'm populating my listbox from access but it doesn't like my SQL statement, where am I going wrong

sSQL = "SELECT * from Process where ParentName = '[cboCategory]'"

Process is a table and cboCategory is the excel form control.

The error is "No given value for one or more required parameters.

View 3 Replies View Related

Modules & VBA :: Using Array To Populate ListBox

Apr 7, 2014

I have some code that successfully gathers some items and adds these items to a listbox, one item at a time using .AddItem.And it works ok.The problem is, when there are a bunch of items to add, everytime the .AddItem runs, the form redraws.there are a bunch and this leads to a lot of flicking while the form redraws however many times .AddItem adds an item.

I've had the idea of building an array and then assigning the array to the listbox.I can build the arrray no problem but i have not been able to assign the array to the listbox all at once.how to do is add items to the listbox from the array one specific item ListArray(i) at a time.

Obviously this would work, but gains me nothing in terms of the visual effect in the form becuase it is still adding to the listbox one item at a time.Is there some way to assign an array to a list box all at once, without doing it one item at a time?

View 3 Replies View Related

Modules & VBA :: Moving Items Between Listbox

Sep 9, 2014

I have two listbox (SearchResults5 has two columns) and list_asset_add (one column) both have Extended multi-selection active. I have this code that automatically moves the items between the two listbox (it runs after pushing a button):

Code:
Sub CopiTo_Click()
Dim Msg As String
Dim i As Variant
If SearchResults5.ListIndex = -1 Then
Msg = "Nothing"

[Code] ....

This works quite well if I manually select the items that I want to move. Most of the times SearchResults5 has lots of elements so I have decided to create a "Select All" button to speed up the process, here the code:

Private Sub Command271_Click()
Dim n As Integer
With Me.SearchResults5
For n = 0 To .ListCount - 1
.Selected(n) = True
Next n
End With
End Sub

When I use the "Select All" button and I try to move the items between the two listbox, the function does NOT work.

BUT if I manually select one or more items in the first listbox, then I clear the selection and finally I use the subroutine to move the items between the two listbox, then the it works well again. How to make it work properly.

View 5 Replies View Related







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